Modules & VBA :: How To Check If Field Value Exists Using Open Recordset
			Nov 25, 2014
				I am storing values of pictures and the location of them in a table, this works fine!... using OpenRecordset. The problem is that when the function is called to store the information, it just keeps adding the same values of each file in the folder over and over again in a word "Duplicating" the information.
I have tried various methods using the OpenRecordset, but cannot seem to find the correct manor of applying the code.
Below is the function I have for storing the data...
Code:
Public Sub GetFilesNamesFromFolder(strFolderPath As String)
On Error GoTo ErrorHandler
   Dim objFSO As Scripting.FileSystemObject
   Dim objFolder As Scripting.folder
   Dim objFile As Scripting.File
[Code] .....
	
	View Replies
  
    
	ADVERTISEMENT
    	
    	Sep 8, 2014
        
        I have a module that I am using to verify that file paths in my table point to valid jpg files.  The table has grown quite a bit since I first created the module and it has gotten to the point where it's taking too long for the module to execute.  I'm in the process of trying to change the record set for the module from the table to a stored query procedure but it's turning out to be a little tricky for me.  When I execute the following module, I'm not getting any error code, it just doesn't seem to do anything at all.  The bits in red are the parts I've changed.  Before that the module executed as I expected it would.  
Code:
 
Sub TestIt2()
    Dim strFileName As String
    Dim db As DAO.Database
    Dim rs As DAO.Recordset
    Set db = CurrentDb()
    Set rs = db.OpenRecordset("QryUpdateRevisionHistory")
[code]....
	View 1 Replies
    View Related
  
    
	
    	
    	May 27, 2014
        
        I have a table in Access that I have a form saving new records to. Before this save occurs, I would like Access to check if the account number already exists and if the account does exist if it is outstanding. If both of those conditions are met I would like a message box to display and cancel the save as it is a duplicate. I can't seem to get it to work though. 
I was thinking to use a filtered recordset based on one of the conditions and then perform a find on that recordset to see if it is null. 
Code:
 
dim acct as long 
dim rstfiltered as DAO.Recordset 
Set rstfiltered = CurrentDb.OpenRecordset("SELECT * FROM tblclstrack WHERE [Request Status] <> 'Completed'") 
acct = Me.cd_number.Value 
[code]...
	View 9 Replies
    View Related
  
    
	
    	
    	Jul 4, 2007
        
        hey guys
having a corruption issue with my database, it happens when a user updates a record and a second user has that record open elsewhere. then when the second user closes they save their changes over the top, corrupting the whole record.
so i need to know with a recordset if there is a way to check if a second user is currently looking at the same record?
thanks
	View 4 Replies
    View Related
  
    
	
    	
    	Jan 2, 2014
        
        I have created a form which enbles users to enter data into the fields which will add a new record to my table. What I am trying to do now is to create some kind of validation rule that will check whether the record already exists.
  
 I need it to work this way; there are four input fields- 3 text and 1 is a date filed. When the user enters a new record they are not allowed to create a record that conatins the same combination of values. So if one record has for example filed 1 = 1 field 2 = abc field 3 = def; then no other record can have the same combination of values.
  
 If the user enters an already existing combination there would be an error message saying which field is incorrect. If the combination doesn't exist it would add the record and display a message that the record was successfully added.
  
How can I do this?
	View 11 Replies
    View Related
  
    
	
    	
    	Nov 24, 2014
        
        I have an application that I have automatically checking to see if tables are valid and connected, etc.  If the app finds that the tables aren't connected or aren't working, it automatically tries to re-connect those tables in the background without the user's knowledge.  The time I'm having trouble is if the SQL Server doesn't exists (the back-end tables are on a SQL Server).  I would like to check to see if the SQL Server exists before I try to re-connect tables so that no SQL Errors pop up but I'm not sure how to figure that out with VBA. 
	View 3 Replies
    View Related
  
    
	
    	
    	Sep 10, 2014
        
        I have a form, which has a combo box which a user can select an employee - the combo has three columns (Employee_Number, Surname, Initials) although the Employee_Number column is set at a 0 width, so not visible.
 
The form is bound to a query which only shows records that are 'Active'
 
When a user selects and employee in the combo box, I want the AfterUpdate event to check and see if there is already an active record - if there is, throw up an error message and then reveal a couple of buttons giving choices what to do next; if there isn't an active record, reveal three textboxes and then populate those textboxes with the values from the three columns from the combo.
 
The bit that is sticking me is the search - - I have tried DCount, but can't seem to get it to work
  
Here is the section of code that I am battling with:
 
Code:
Dim EmpNo As String 
EmpNo = cboEmp_Check.column(0) 
If DCount("Employee_Number", "Incomplete_Training", "Employee_Number=" & EmpNo) > 0 Then
MsgBox "Existing", vbOKOnly
	View 9 Replies
    View Related
  
    
	
    	
    	Jul 14, 2014
        
        I can already send emails out as PDF files when an email address exists, however, I'm trying to validate whether or not an email address does actually exist.  My problem is, there are four possible locations where an email address could be: MainEmail or Contact1Email or Contact2Email or Email (the last one - Email - is in a separate table).  
Four text boxes exist on the form that is being actioned (the form is based on a query to extract the relevant information) and are available to test for an email address being present. What I'm struggling with is ensuring that the 'To' box in Outlook always gets populated or Outlook chucks a hissy fit.  I have been trying various IF Then Else and Do Loop plus a myriad of other ways but none are reliable, especially if no email address is present which can be the case.
	View 14 Replies
    View Related
  
    
	
    	
    	Nov 4, 2013
        
        I have code working for some workers here ,who used to save excel files in a  folder and my databse upload those files into database and then do the rest.I am looking for a code in vba which,on upload button  matches the file in table and if the file already exists ,it should not upload again in the table and if it does not exists it should upload . I have attached my code below :
 
Private Sub Command0_Click()
 Dim strcPath As String
 strcPath = "O:QA FilesQC ReportingPending Review"
 Dim strcNewPath As String
 
 strcNewPath = "O:QA FilesQC ReportingMovedFiles" & Format(Now, "yyyy-mm-dd h-mm-ss") _
  & " Excel Files" & ""
  
[Code] .....
	View 1 Replies
    View Related
  
    
	
    	
    	Aug 19, 2013
        
        Actually what I am looking to do is have an Access application check some Web site for the presence of a number. This number could be the Serial number of the application and if this number exists to maybe show a message in the aplication or even terminate the application. 
 
A quick and dirty way is for User Serial number 254, to put on a specific page of a Web site say arbitrary file 254.jpg (invisible on the Web site). The application would check for the existence of this file and if it is there, it could take some action. Everything would have to be done in stealth mode.
 
The following code can tell me if a specific URL exists, in this case [URL]
 
Code:
 
Private Sub cmdArbitray_Click()
Dim blnDum As Boolean
blnDum = blnCheckURL("http://www.VisualDentist.com")
' If blnDum = True then it exists
End Sub
 Public Function blnCheckURL(ByVal strURL As String) As Boolean
Const FLAG_ICC_FORCE_CONNECTION As Long = &H1
blnCheckURL = (InternetCheckConnection(strURL, FLAG_ICC_FORCE_CONNECTION, 0&) <> 0&)
End Function
1) How can I check for file 254.jpg?
	View 1 Replies
    View Related
  
    
	
    	
    	Jun 25, 2014
        
        Heres what I need to do.
  
 --> open a recordset
    
      --> read through the records
        
          --> check to see if two fields matches e.g (qty=qty_completed)
            
              --> if all records in recordset meets the above condition then run update statement 
  
I want to put this code inside Form_Close. The code that I'm using checks the two fields for the condition and runs the update statement if condition is met. Problem is this a continuous form and I want all records need to meet the condition before it execute update statement.
  
Using Access 2010 btw.
	View 8 Replies
    View Related
  
    
	
    	
    	Apr 8, 2015
        
        How to open a Record Set For the combo-box? My Original Code as follows
Dim conn As New ADODB.Connection
Dim objMyRecordset As New ADODB.Recordset
Dim strSQL As String
Set conn = New ADODB.Connection
[Code] ....
After i use this code nothing come out on my combo-box...
	View 2 Replies
    View Related
  
    
	
    	
    	Dec 1, 2014
        
        The code below fails.
Code:
Dim ResultQy As String, qdf As QueryDef
    Dim ResultFm As String
    ResultQy = "ByFederationQy"
    Dim strSQL  As String               'sql statement to execute
[Code] ....
When I run the code it fails at the last line giving error message:
Code:
Runtime error 3061 - toofew parameters expected 1
	View 6 Replies
    View Related
  
    
	
    	
    	Feb 18, 2014
        
        I'm trying to open or unlock a recordset do do a simple calclation and then relock the record set. How this can be done with vba?
	View 7 Replies
    View Related
  
    
	
    	
    	Mar 14, 2014
        
        I am trying to achieve the following - I want to query a table to see if a record exists with a particular field blank. If so, I would like to prompt the user for data.
In real world terms, when assigning an item to a user I would like to first make sure that the item is not already assigned to somebody else. I have 4 fields, UserName, Item, IssueFrom, IssueTo. So when an item is assigned to a user, the first 3 fields are populated and the IssueTo remains blank, until that item is assigned to somebody else.
At the minute I have nothing in place to prevent a user from assigning the same item to multiple users and having multiple records for the same item in the table.
	View 7 Replies
    View Related
  
    
	
    	
    	Jul 19, 2006
        
        Hi, I have the following problem which I hope someone can help me with:
I have a form which is used to enter data into a table. One of the fields is 'Code'. I want the form to check when data is enetered into this field is it already exists, ie if the code is already present in the 'code' field in the table, and if it is it should give a warning message, if not then continue as normal.
Any help would be greatly appreciated, thanks in advance!
	View 2 Replies
    View Related
  
    
	
    	
    	Mar 21, 2013
        
        I have a form used to enter new contacts. I would like to insert a query or macro that would automatically to see if the name (first and last) already exists in the table to which this form is attached.  If the name exists, I want to open the existing record and add information to it.  If not, I want to enter the information as a new record.
	View 1 Replies
    View Related
  
    
	
    	
    	May 21, 2014
        
        My application relies on whether Outlook is open and more importantly, with the correct Exchange profile selected.  To ensure this I have the following code which, on the work PCs (Windows XP and Office 2003) works correctly.  
Code:
If Outlook_is_Running = True Then
    Set myOlApp = CreateObject("Outlook.Application", "localhost")
    Set myNameSpace = myOlApp.GetNamespace("MAPI")
    Set colFolders = myNameSpace.Folders
On Error Resume Next
[code]....
The work PCs are being upgraded soon to Windows 7 and Office 2007 so I have taken the application home and started to develop it on my home PC (Windows 8.1 64 and Office 2013 64).  I have used PtrSafe where necessary and have compiled with no errors, but this code always returns false even though Outlook 2013 is open.
On further investigation, if I comment out the 'On Error Resume Next line I get the error Active X component cannot create the object (or similar)  Error 429.  This is the same regardless of whether Outlook is open or not
	View 4 Replies
    View Related
  
    
	
    	
    	Aug 28, 2013
        
        I have some code that resides in a button on a report that allows me to save a PDF version of this report.  My problem is that if i have the destination directory open on windows explorer, i get a runtime 2501 "The output To action was cancelled" error.Is there any way to check if the directory is already open, and cancel the output to, or close the window to avoid this error?
Here is my code:
Code:
Private Sub CmdSavePDF_Click()
Dim MyFileName As String
Dim MyPath As String
'Dim CompanyName As String
[code]...
	View 1 Replies
    View Related
  
    
	
    	
    	Jun 29, 2015
        
        I'm trying to lock a checkbox when the forms open and depending if one has role as admin, it should unlock it.When I add the below code in the on open form I get error:
Code:
Me.lock_case_admin.Locked = True
Me.lock_case_admin.BackColor = 12632256
This is the part that should onlock if it is admin:
Code:
Me.lock_case_admin.Locked = False
Me.lock_case_admin.BackColor = 16777215
Maybe it is me, or the checkbox is giving the error that causes the dialogbox to open to to choose the ID nr.
	View 5 Replies
    View Related
  
    
	
    	
    	Nov 20, 2006
        
        Hi 
I have a problem where a user would enter a project code eg 113-099. I put in a list box that filters all the project codes for instance if the user enters 1 it will show all codes starting with a 1 and every additional number they enter it filters the list box to show which codes already exists! I hope this makes sense. 
The problem i have is i need to check when they enter the project code that it is a unique value. The Database developer we got in didnt index this field as no duplicates allowed and as result we have large amount of duplicate project codes. 
I have started to experiment with Dlookup but with no great success. 
If anyone can help it would be much appreciated as i dont have much experience with access. 
The field name on the form is 
[forms]![projects_frm].[project_job_number] and the table which stores this information is [projects]
	View 4 Replies
    View Related
  
    
	
    	
    	Aug 12, 2012
        
        Is there any way to check if a particular table already exist in MS Access Database using ACCESS VBA?
Actually I'm creating temp table on the file but I want to check if temp table already exits then need to delete before creating. 
e.g. I can check if query defniniton already exists using below code:
Code:
        If .DCount("[Name]", "MSysObjects", "Left([Name],1) <> '~' AND [Type] = 5 AND [Name] = '" & strTempQueryName & "' ") <> 0 Then
            .DoCmd.DeleteObject acQuery, strTempQueryName
            .CurrentDb.QueryDefs.Refresh
        End If
	View 1 Replies
    View Related
  
    
	
    	
    	Jul 16, 2015
        
        I would like to be able to check if a db is open and if it is to prevent the user from proceeding.
  
 I use the Access 2013 Runtime. I can check if a db is open by trying to open Exclusively, using something like  
Code: [URL] ....
 But if the db is already open Not exclusively and I try to open it exclusively it does not raise an error and it allows the user to open the db in Read Only mode.
  
 I would like to be able to prevent this, because careless and/or inexperienced users may open several instances of the db.
  
 Of course, if the db is already open exclusively it does not allow you to open it exclusively another time.
	View 5 Replies
    View Related
  
    
	
    	
    	Dec 4, 2006
        
        Hello all,
I have a form that looks at my "master table" where users put in general info about a sheet of material.
There are two combo boxes on this form, Batch# and Lot#. They will use the same Batch# and Lot# for many sheets. Every time a new batch and lot are entered, this will bring up a pop-up form where the user needs to take a measurement of that batch and lot for QA. This will go into a different table, where the batch and lot #'s are unique(many of the same batch#'s with different Lot#'s).
After the lot# is entered, I want to run a query in VB that looks for those unique identifiers, and if it doesn't find a record, my pop-up form will run.
This is probably something very easy....... It was a very long weekend and I'm tired of thinking.
Thanks
Scott
	View 2 Replies
    View Related
  
    
	
    	
    	Feb 29, 2008
        
        Hey all,
Tables
ProductsProductBrandSize
PurchaseDetailProductPriceQuantity
Forms
frmFoodSub
Combo BoxesiProductiBrand
TextboxsiSizeiQuantityiPrice
For a couple of days now I've been trying to devise a way to achieve what I want, but I just keep going in circles and hitting errors (thanks to forum members, I've been able to solve most of them.) So, here's what I want to be able to do:
Input a product using the iproduct combo box (which gets its list of values from the Products table); its brand, using the ibrand combo box; and its size using the isize textbox, all in the frmFoodSub form. I then want it to check to see if an exact record already exists (ie. the same product, same brand, same size.)
If it doesn't exist, I want to create it. If it does, I want to do nothing. Then I want the product - either the one I just created, or from a record that already exists matching the iProduct input - to be input into the product field of the PurchaseDetails table. I then want to use iQuantity and iPrice textboxs, already linked to the PurchaseDetails table, to input the newly added product's quantity and price. 
I hope my explanation was clear enough. I'd appreciate any help with this you may be able to offer.
	View 9 Replies
    View Related
  
    
	
    	
    	Sep 9, 2014
        
        I have the following vba to check if a table exists, but I can not find on the net how to check if a form exists, I tried to modify this script but there does not seem to be a formdef
 
Code:
 
 Sub table_Exists()
  Dim dbs As Database
 Dim tbl As TableDef
 Dim dbsExist As Object
 Dim tablename As String
 tablename = "Table2"   ' Your Table Name
 Dim exists As String
 
[code]....
	View 7 Replies
    View Related