Modules & VBA :: SQL Update Query To Set A Record Field To Null?
			Jul 11, 2013
				On a push of a button from a form, I want to locate specific records within the table and update a field to Null if it matches a name 
Dim strSQL As String
strSQL = "UPDATE tblmaster SET Score = "" WHERE [AdvocateName] = 'Anna Maria'"
DoCmd.RunSQL (strSQL)
I'm certain I don't have the syntax correct between the Set to Null and WHERE clauses..
	
	View Replies
  
    
	ADVERTISEMENT
    	
    	Jan 26, 2015
        
        i want to be able to create an On Click Event when pushing a command button that will run an Update query to update a record and after it has been updated that specific record will pop up on a Form and be displayed. i know a different way is to run the Update query and then have it displayed in a Select query but i want it to be displayed on a Form instead. is it possible?
	View 4 Replies
    View Related
  
    
	
    	
    	Jul 11, 2013
        
        I need to update a field with the contents of 2 other fields when exiting a record. The fields (ItemNo) and (LotID) need to create or update the field (LotCode).
i.e.: ItemID (GM-235), LotID (26) will result in LotCode (GM-235-26). 
I currectly use a Update Query that uses the expression: 
[products].[MasterPN] & "-" & [lotid] in the lotCode Field - "Update to". 
Unfortunatly, I am using a button on my form that executes the query, but it updates all the records and although it runs very fast, I would rather have it perform this task automatically when I leave the record.
	View 1 Replies
    View Related
  
    
	
    	
    	Dec 4, 2013
        
        How to do an UPDATE using VBA on a form to update a specific record on the table using an unbound field on the form to filter the update.
Every time the code runs, it tells me:  Run-time error '3144': Syntax error in UPDATE statement and takes me to the "CurrentDb.Execute strSQL, dbFailOnError" line at the end of my sample below.
Here's my code:
Dim strSQL As String
Dim strCriteria As String
strSQL = ""
strSQL = strSQL & " UPDATE [tblTicket] SET"
strSQL = strSQL & " ([UpdatedBy], [AssignedTo], [Requestor], [Dept])"
strSQL = strSQL & " Values"
strSQL = strSQL & " ('" & unbEnteredBy & "','" & cmbAssignedTo & "','" & cmbRequestor & "','" & cmbDepartment & "')"
strSQL = strSQL & "Where [tblTicket]![DateTimeOpened] = #" & FORMS!frmTicketTracker.unbDateTimeOpened & "#;"
CurrentDb.Execute strSQL, dbFailOnError
	View 9 Replies
    View Related
  
    
	
    	
    	Nov 16, 2013
        
        I have a table 'table1' which has various field including an ID field and a yes/no field. I then have a form based on a query originally derived from data in the original table. The form provides a list with some ID's with a yes and some with a no.
 
I'm trying to write a button code to convert all the no's into yes' for those ID's picked out by the query.
 
I've searched lots of sites and get that I need to set recordsets for both table1 and the forms' query but all my efforts crash or give an error. 
 
I am looking for the right way to say .." for each ID in form set the yes/no field corresponding to the same ID in table1 to yes"
 
I'd attach my version ....
	View 2 Replies
    View Related
  
    
	
    	
    	Aug 19, 2014
        
        I am new to Access. I am after a vba script to run an update query.
I have a table named MYOB_Invent.
I have a Query Named MYOB_Update.
The query is showing records where my field named Test1 is null.
I want to update records with null in the field to today's date (the date of the day that it is run) formatted as 18/08/2014 and the field next to it is named Updated (which is yes/no) from un-ticked to ticked for the updated values. 
I would like a vba script to automate the process as I want to automate it via a commandbutton for users.
	View 3 Replies
    View Related
  
    
	
    	
    	Nov 24, 2005
        
        Lock field for a record if another field is null:
I would like to stop users from entering a date in "Ctrl Closed" unless they have populated "Ctrl Reason" for any given record.
Not sure how to do this.
Any ideas would be greatly appreciated.
	View 6 Replies
    View Related
  
    
	
    	
    	May 11, 2015
        
        Nutshell: My user DB has one menu with 4 tabs (2 for adding records, and 2 for searching/editing records). Since the form opens up in the acFormAdd mode, Access already creates a new record (blank) before they type anything. It is resulting in blank false new records that are getting added to the table and they are getting annoying. My audit table is full of "user X created new record at this time" when it's just a blank record.
 
There must be a way to prevent this using VBA, but I cannot find it. 
 
I've seen ways to disable "add new record" buttons and such, but nothing that disables Access from being smarter than me and creating a new record before I decide to. 
	View 2 Replies
    View Related
  
    
	
    	
    	Oct 2, 2014
        
        If a new record is created, insert date only if customerID is not null
Private Sub Form_Current()
 If "CustomerID", "TblDietPlan" = <> 0 Then
 If Me.NewRecord Then Me.MealDate = DMax("MealDate", "TblDietPlan")
End Sub
	View 1 Replies
    View Related
  
    
	
    	
    	Mar 11, 2015
        
        I'm sending out an e-mail (see below).  I want to add a cc addressee.  However, sometimes the cc addressee will be blank.  The e-mail works if the cc addressee field has data.  It doesn't work if there isn't data.  I tried an IIF statement but that didn't work.  How do I can the object to work if the field is blank (null) or has data? 
    DoCmd.SendObject acSendNoObject, , acFormatTXT, Me.POCEmail, , Me.Email, , "Decoration Issue - Resolution Assistance", "Sir/Ma'am," & vbCr & vbCr & _
    "We need your assistance in resolving the following decoration issue:" & vbCr & vbCr & _
    "Issue/Necessary Correction: " & Me.Issue & vbCr & vbCr & _
    "Member Information " & vbCr & vbCr & _
[Code] ....
	View 1 Replies
    View Related
  
    
	
    	
    	Jul 10, 2014
        
        The following code doesn't check null condition in Scannedby field. The scannedby has text data type. The code gives me all the data where scandate=20130722 but doesn't check that scanned by can't be blank.
Code:
rs.Open "select count(*) from BatchTBL2 where scandate=20130722 and scannedby <> null", cn, adOpenKeyset, adLockOptimistic
j = rs.fields(0).Value
	View 5 Replies
    View Related
  
    
	
    	
    	Nov 16, 2007
        
        I think the title pretty much sums it up....
I have a query where data is first sorted by user input; first field's criteria: [fieldname], then by another field's criteria: Is Null.
I know there are records containing null values in the second field, as I have run a select query with the criteria: Like "*", to make sure they are null, and not zero-length-strings.
The query is refusing to return any results...
Any ideas?
	View 10 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
  
    
	
    	
    	Dec 18, 2014
        
        how to make this two fields in my form to say Y or N if the field is Not Null. Like if the field is not null = Y Else = N for the two fields. I have a picture to show what i'm talking about. 
	View 2 Replies
    View Related
  
    
	
    	
    	Aug 30, 2013
        
        I have a form with two list boxes on it: listAllBANANA and listActiveBANANA 
The listboxes are populated from tblBANANA. Active is defined by the tblBANANA field "ResponseDate" being Null.
Also on the form is a CloseBANANA command button. When pressed with no selection, it opens frmCloseBANANA to the first record. If a BANANA is selected in listActiveBANANA, the form opens to the selected record. 
Now comes the tricky part: if a BANANA is selected in listAllBANANA, I first need to verify they have an Active BANANA selected, before opening the form. I've poked and tested and searched and cut and pasted my little fingers off with no joy. What I've deduced is that I'm either messing up the syntax of the DLookup or I'm incorrectly referencing the selected record. There's also the third option that I'm going about this in entirely the wrong way.
All other code below works. If I delete or comment out the line in red, I have no issues other than I may open up a blank form because I'm trying to close a BANANA that is already closed.
Code:
'If a BANANA is selected in Active BANANA or All BANANA, open Close BANANA to that record. If not, open form to most recent record
Private Sub cmdCloseBANANA_Click()
  If Not IsNull(Forms!frmGUI!listActiveBANANA) Then
[Code] .....
	View 8 Replies
    View Related
  
    
	
    	
    	Apr 30, 2007
        
        I need a way to dynamically store a particular value in "field_2" of the CURRENT record depending on whether or not the value of "field_1" of the CURRENT record is identical to the value of "field_1" of the PREVIOUS record within the same table.  The table is sorted on "field_1".
So, if the value of "field_1" in the CURRENT record is "ABC" and the value of "field_1" in the PREVIOUS record is also "ABC", then store a value of "PPP" in "field_2" of the current record.  IF on the other hand, the value of "field_1" in the CURRENT record is "ABC" and the value of "field_1" in the PREVIOUS record is "XYZ", then store a value of "WWW" in "field_2" of the current record.
I have a report that will use these results to count only the number of records that have a "WWW" in "field_2".
Is this doable, maybe in a query somehow?
I should add that whatever the solution, it needs to be compatible with Access 2000.
	View 1 Replies
    View Related
  
    
	
    	
    	Mar 12, 2014
        
        I have a form with Date of Death (DOD) field. I would like update DOD from a table dbo_patient into Z_Patients table.
 
I have set the datatype as Date/Time in the form for Date of Death.
 
Code:
Private Sub Update_DOD()
    Dim rcMain As New ADODB.Recordset, rcLocalDOD As New ADODB.Recordset
    Dim DOD As String
    rcMain.Open "select distinct PatientKey from Z_Patients", CurrentProject.Connection
 
[Code] ....
However I am getting some error Run-time error '-2147217913 Date type mismatch in criteria expression in section below. 
 
Code:
CurrentProject.Connection.Execute "update Z_MAIN_Processed_Patients set DateOfDeath = '" & rcLocalDOD!date_of_death & "' where PatientKey = " & !PatientKey
	View 5 Replies
    View Related
  
    
	
    	
    	Sep 7, 2005
        
        What I need to accomplish is an alert if a query finds any records.  In other words, When the main page is loaded a query will run in the background.  This query is looking for any records that need to amended within the next 30 days.  What i would like to do is if the query finds any records that need amending an alert "form" or conditional formatting in a field with turn it red as an indicator that attention is needed.  
My problem is how do i write a code to see if the record set from the query is greater than null???
any ideas would be greatly appreciated.
Ricky
	View 2 Replies
    View Related
  
    
	
    	
    	Sep 23, 2014
        
        I'm new to programming with Access but am attempting to create a new field in a table with an new date based on existing fields in the table. 
The current fields are [Frequency], integer, [Risk], text, [Last Audit Date], date/time, and the new field is [Next Audit Date]. [Frequency] is a calculated field based only on [Risk] and is equal to "5" if [Risk] is "Low" and is "3" is [Risk] is "Medium" or "High", and [Frequency] is blank if [Risk] is (thus far it has never been empty). 
What I need the new calculated field to do is return "N/A" (or blank, or anything easily separated really) if [Frequency] is blank, or if [Risk] is "Low" or "Medium". If [Risk] is "High", [Next Audit Date] should be equal to [Last Audit Date] plus 3 years. When I try to save the code, I get this message: "The expression could not be saved because its result type, such as binary or NULL, is not supported by the server."
This is my code now:
IIf(IsNull([Frequency]),"",IIf([Risk]="Low","N/A",IIf([Risk]="Medium","N/A",IIf([Last Audit Date]="N/A","N/A",[Last Audit Date]+Year(3)))))
	View 4 Replies
    View Related
  
    
	
    	
    	Nov 16, 2014
        
        I do not understand what is happening here. I have foll0wing line in a calculated query field:
m: Switch([EmpID]<5,1) ' run Query 18 in attached example, A2007/2010
 
this produces 1 for all EmpID<5 and Null for all other EmpID's. All as expected.
But if I do this:
m: Switch([EmpID]<5,1,[EmpID]>=5,Null) ' run Query 19 in attached example
then the entire column is set to Null
	View 2 Replies
    View Related
  
    
	
    	
    	Jul 5, 2013
        
        It might be an easy one but I just wasted the past hour deciphering through my code in order to solve the run-time error '94' that I'm getting when trying to execute the following code: 
Code:
Private Sub cmdUpdateDates_Click()
'###################################
'This sub aims at combining the timesheet date and the start and end time into the fields [Start Time] and [End Time]. 
'###################################
Dim intCounter As Integer
intCounter = 0
Dim rs As ADODB.Recordset
[Code] ....
	View 1 Replies
    View Related
  
    
	
    	
    	Mar 1, 2008
        
        I have created a form to select criteria for a table query (which ultimately will be used in a report). If a field in the form is left blank, how can I cause the query to not filter on that field?
For example, the form contains fields for Customer, Date Range, Item Number, and Sales Rep. If the user wants the report to include all sales reps how can the query criteria for this field be omitted or nullified when the query is run? 
Thanks for any help.
Shap
	View 2 Replies
    View Related
  
    
	
    	
    	Mar 2, 2015
        
         I have a form in datasheet view   and on that form I have a yes/no tick box is it possible that when the tick box is ticked it locks the line from further entry.
	View 3 Replies
    View Related
  
    
	
    	
    	Oct 30, 2013
        
        Database query.  I need the query to count the records of a field and display a number for the records of the field.  For instance, one field is [Genre] and the other is [Show].  The query needs to list the Genres along with the number of shows for each genre.  I've been able to just use the query design and add the genre field and I can add the show field, use totals count which gives me the genre counts the number of shows.  My problem is the null.  Some genres don't have a show listed so the genre doesn't even show up in the result.  If I could get the the genres that have null shows to result a 0 it would be perfect.
	View 5 Replies
    View Related
  
    
	
    	
    	Jan 8, 2015
        
        I have an append query that needs to stop if nothing is entered in the date field. What criteria should I use. Will is stop the query and continue?
	View 4 Replies
    View Related
  
    
	
    	
    	Nov 12, 2014
        
        Any code that stops the vba from running if an 'output to' function is null. I've found some code using the DCount function but I'm struggling to adapt this to multiple excel outputs.
I'm sending 5 excel files via E mail to several addresses and I'm wanting to identify if the first file has records, currently using access 2010.
	View 5 Replies
    View Related