Firing Off The AfterUpdate Event Procedure From VBA
			Jan 29, 2005
				Hello,
I have an "After Update" event procedure for a field on a form that calls a VBA sub. When I use a different VBA sub to input a value in the above mentioned field, the "After Update" event does not occur, even thought the data in the field has been changed.  (Of course if I manually enter the data, the field "After Update" event works.)
Is there a flag or condition that needs to be set in my VBA sub to let the field realize that it has been changed?  Or possible a way to call the fields AfterUpdate Sub?
I tried having a my sub call the AfterUpdate sub to see what would happen, but didn't get it to work.  I got a bunch of error and didn't feel like this was really the way to go.
I also could just duplicate all the code in the AfterUpdate sub for the field, but we all know that that is not a good idea.
Thank you for any help.
	
	View Replies
  
    
	ADVERTISEMENT
    	
    	Aug 9, 2006
        
        I have structured a subform as a datasheet to allow users to copy and paste from Excel into the database. Datasheet has numerous fields and 18 rows. I have set up recalculations of other data in the AfterUpdate event of the fields in the datasheet. This works perfectly until the user copies multiple rows from Excel and pastes them (one column at a time) into the datasheet.
Is there an event I can capture when the user copies and pastes a column?
Muchas-Grasias for any assistance.
	View 6 Replies
    View Related
  
    
	
    	
    	May 26, 2005
        
        Hello all:
I have a split, shared database in which the Before and AfterUpdate events on my forms are not working at all.  I tried setting a breakpoint to verify this and, sure enough, they are not firing.
Does anyone have any clue as to why this may be occurring?
Thanks so much for the help.  I have tried searching the forum with no luck.
	View 2 Replies
    View Related
  
    
	
    	
    	Jul 31, 2014
        
        I have just made a change to one of the forms by adding a button (by copying the only other button on the form) to cancel any changes and close the form.  However, as soon as I added it I started getting the error message in the title.  Please attachment LA Err1 for the full message.  I also changed the caption on the other button on the form from "Close Form" to "Save && Close Form" this button is now giving the same error.
  
 I have Compacted and repaired the DB on several occasions to no avail. I have deleted the procedures from the module and recreated them using the properties window - still get the error. I have deleted the buttons from the form and recreated the both via the object wizard and without it. Nothing I have tried has made any effect.
	View 5 Replies
    View Related
  
    
	
    	
    	Jan 10, 2006
        
        i have 15 text boxes named Qty1, Qty, Qty3, etc...
and another 15 text boxes named Comment1, Comment2, Comment3, etc...
i'd like to write an AfterUpdate event code that will apply to all of the Qty controls..instead of write 15 individual AfterUpdate events..
is this possible at all?!
	View 6 Replies
    View Related
  
    
	
    	
    	Jul 4, 2014
        
        On a form I have a pair of controls, Price and PriceInUSD.  If the user enters a new value into the Price field, then its AfterUpdate event fires, which looks up the relevant exchange rate and updates the PriceInUSD control accordingly.  That all works fine.
Now in some circumstances (if a checkbox elsewhere on the form is checked), I generate a modal dialog box asking the user to confirm that the Price value is correct, or enter a new value.  
That modal dialogue box's Enter button's On Click event then updates the Price control before closing the dialog. That bit works fine, too - but I had thought that this update of the Price control would fire its AfterUpdate event - but it doesn't.
So, my basic question is : do Control events only fire in response to user input, and not to programmed changes ?
	View 12 Replies
    View Related
  
    
	
    	
    	Jul 25, 2014
        
        I have an issue with the dblclick event not firing immediately from my listbox. It does eventually fire if i mash the mouse button for long enough but obviously that is not an acceptable solution.The listbox also has an afterupdate event which is what fires when i double click.
I have also tried calling the code from an onclick command button which works fine but if i try and call that from the dblclick event it does not.
I have used the dblclick event in other projects with afterupdate and it has worked without problem.
Code:
  Private Sub lstFileList_AfterUpdate()   
  strPDF = Me.lstFileList.Column(0)
  Me.PDFViewer.LoadFile (strPDF)
  Dim fso As New FileSystemObject
  strFileName = fso.GetFileName(strPDF)
   
[Code] ....
	View 7 Replies
    View Related
  
    
	
    	
    	Aug 7, 2014
        
        We use our CRM for entering client orders, which is done through our 'OrderEntry' form. On that form we have a subform that we use to enter order lines - as we have a range of products on offer, an order can be made up of one product or anything up to 100.We have an 'amount' textbox on the subform, that the users enter the cost of each line, and as they add more lines the total cost of the order is calculated using a textbox in the subform Footer, with the ControlSource set to =Sum([amount]).
On the main form, we have a Net textbox, that the user will add in the total cost of the order once they've added all the order lines, and providing the =Sum([amount]) textbox on the subform matches the figure in the Net textbox, a button to Proceed the order and go on to the next step appears.
The intermittent problem I have, is that the OnCurrent event I use to show the Proceed button does not seem to fire on its own - but when I stop the code and step through it, it will show the Proceed button without any problems.Here's the code:
(the Proceed button is referred to a 'Command80')
Code:
    Dim OS As String
    Dim UT As String
    OS = OrderStatus
    UT = fGetUserType
    
[code]....
I've made the part that refers to the Proceed button bold, but thought I'd add in the whole OnCurrent event in case there was anything in there that was blocking it.
I added in the MsgBox code at the bottom to make sure the OnCurrent was firing, and that works fine.I've searched through the rest of the code, and there's nothing else in there that references the Visible property of the button.I've been through the decompile process detailed here, and also been through this similar thread with a fine toothcomb and this still won't work.
I've saved the form out as a textfile and then imported it back in, both through the immediate window, and short of importing everything in to a new DB and starting again
	View 14 Replies
    View Related
  
    
	
    	
    	May 27, 2015
        
        I have to maintain an Access form which contain a linked subform (using Master and Child fields).
Basically, in the main form (Form1), the user choose a value in a combobox and the subform (Form2) is automatically updated.
My issue is that I have a BeforeUpdate event on one field of my subform which is preventing to update the field (Cancel=true) when it does not meet the criteria. The alert msgbox should appear once if there is any error in the field but the BeforeUpdate event is always fired 3 times for unknown reason.
What I don't understand is that if I open the subform (Form2) as a main form or if i remove the child/master link fields in the subform property sheet, it is working as expected with the BeforeUpdate event being fired only once.
	View 5 Replies
    View Related
  
    
	
    	
    	Aug 6, 2013
        
        I'm developing in Access 2007 and created a runtime version.
 
When the user clicks the X to close the runtime application, the main form's Load event fires.  Any clues as to why this might be?  Some of the code is based on other forms that do close, so of course errors start flying.  Note, this is only in the runtime version; the accdb file works just fine.
 
My current workaround is to put the offending code into the forms On Current event, which I'm able to do in this context.
 
Is it wrong to think that a forms On_Load event shouldn't be firing when the application is closing?
	View 1 Replies
    View Related
  
    
	
    	
    	Jun 14, 2006
        
        Hi. i am very thankful for all your help in my other queries for my database. i have one last question and i guess i will be done after that. i have a form which have 3 fields one is Number and the other is group and the next one is Account. all of them are combo boxes. I am trying to add this function in the Number field text box properties in afterupdate event which is as follow
Sub Number_Afterupdate()
If not isnull(Number) Then
Number=Format(Number, "000000")
Endif
End sub
The code is working fine. i debug it and run it no errors. i want to put this function in afterupdate. i copied this whole thing in the afterupdate box and when i go back to my control form try to enter numbers in the Number field it gives me this
Msaccess can't find the macro "private sub Mynumber" the macro or its macrogroup does not exist or the macro is new but has'nt been saved.
Can anyone help me out what i am doing wrong ? or can tell me steps what to do i really appreciate that and thanks alot FONZ :)
	View 10 Replies
    View Related
  
    
	
    	
    	Jun 11, 2013
        
        I have a form with (among others) a Y/N field and a multivalued field. The Y/N field indicates whether or not the resident is year-round or not (seasonal/snowbird). The multivalued field contains the months the resident it here. The user wants me to auto-select all months in the multivalued vield when the year-round field is set to yes in order to minimize data entry.
 
I have been trying to use an AfterUpdate Event using the following syntaxes as a test but Access doesn't like the format at all:
[Master Table].[Months Available].[Value] = "June" (this gives 2465 error)
Me ! [Months Available].[Value] = "June" (this gives a 424 error)
 
I'm not at all fluent with VBA but have been successful in populating form fields using data fields in another table so thought this would be similar.
 
Any way other than not to use multivalued fields? Because that isn't an option.
	View 4 Replies
    View Related
  
    
	
    	
    	Jul 15, 2014
        
        So I have a bound form with the following onload code:
Code:
'Add the percent completed to lblPercentCompleted by calling the function
    Dim Completed As Double
    
[code]...
This works fine and set the caption and color of a label on this form.On this form I have several (now only a few, but in the end probably 40 controls or so) which will get updated by the user. When any of these controls are updated, I want the label lblpercentCompleted to get updated with the propper caption and color, however I am having trouble doing this.
I have an afterupdate event on each control with the same code as the onload code, however the message box below appears but the label does not update. 
Code:
Private Sub TransferDieCutsOn_AfterUpdate()
MsgBox "Updating Label"
'Add the percent completed to lblPercentCompleted by calling the function
    Dim Completed As Double
    
[code]...
	View 6 Replies
    View Related
  
    
	
    	
    	Aug 17, 2006
        
        Hi, 
I'm new here and I thought I had already posted this but i couldn't find it so I am posting again... sorry if I've posted twice
When I pass a value from MyTextBox to MyComboBox using: 
Me.MyTextBox = Me.MyComboBox 
It does Not trigger the AfterUpdate Event of the ComboBox 
I need it to! Any Suggestions?? 
I have tried: copy and pasting by but that creates a problem 
    Me.MyTextBox = BarCodeData$ 'passes the variable value to MyTextBox 
    Me.MyTextBox .SetFocus 
    Me.MyTextBox .SelStart = 0 
    Me.MyTextBox .SelLength = Len(Me.MyTextBox ) + 1 
    SendKeys "^c" 'copies the value of of MyTextBox 
as soon as I add the below line, it no longer copies the value in 
MyTextBox 
    Me.MyComboBox.SetFocus 
The onEnter Event of MyComboBox has the following code that works fine. 
Private Sub cboLookupPart_Enter() 
   Me.MyComboBox.SetFocus 
    Me.MyComboBox.SelStart = 0 
    Me.MyComboBox.SelLength = Len(Me.MyComboBox.Text) 
    SendKeys "^v" 
End Sub 
If I ran all the code above, all works but the "Copy" and thus anything 
that may be in the clipboard is pasted into MyComboBox, and the 
AfterUpDate of MyComboBox triggers. 
I know that there are compelling reason NOT to use the SendKeys but I 
was just trying something 
What I'd really like to do is eliminate MyTextBox and pass the Variable 
directly to MyComboBox: 
 Me.MyComboBox= BarCodeData$ 
And have it force the AfterUpdate Event of MyComboBox 
Eagerly awaiting suggestions! 
Thank you, 
Robert Bloomfield
	View 6 Replies
    View Related
  
    
	
    	
    	Nov 13, 2014
        
        I'm trying to place an if statement in an afterupdate event on a form. The code I have is
Code:
If [Customer] Like "BRO001" And [Inv No] is null Then [Job_Price] = [Shots] * 27.5
this gives me a run time error, object required and highlights
Code:
If [Customer] Like "BRO001" And [Inv No] Is Null Then
I'd like the code to do nothing where the requirements to alter the job price are not met.
	View 5 Replies
    View Related
  
    
	
    	
    	Sep 4, 2013
        
        Can the result of a combo-box be used in text in an AfterUpdate event?
Example, the combo-box (Result) can be negative or positive. If it is negative a textbox is populated with the test is (combo-box here)? 
	View 3 Replies
    View Related
  
    
	
    	
    	Aug 24, 2013
        
        I have a form with 7 types of weights (7 textbox rows) showing 7 weights in kgs and the others in lbs.When the user update any weight-kgs textbox, the opposite weight-lbs textbox will be updated automatically, and viceversa.Now, I'd like a fast way to code this action without writing the After Update_event for every textbox (they're 14).I have already setup textbox tags differently with "WeightKGS" and "WeightLBS", thinking about using "for each ... next" statement, but I have some problems to resolve what I want.
	View 4 Replies
    View Related
  
    
	
    	
    	Jan 11, 2005
        
        ERR: The expression AfterUpdate you entered as event property setting produce the following error: Return without GoSub....
 
can someone help me...why..b'coz b4 this i'm using the same coding but it can work for another several form....
	View 3 Replies
    View Related
  
    
	
    	
    	Apr 11, 2006
        
        Can someone help?  I am working on an event database (based on Microsoft 2003 event database template).  At present when I register attendees, I can preview an invoice which is generated based on the information I have entered.
I have set up another option to preview a Letter of Confirmation based on this same principal.  As I am "Visually Basic" challenged, I simply 'copied & pasted' the event procedure and made the changes as needed to ensure the correct report was opened (ie not the Invoice report but Confirmation Letter report).  
However, when I click the button to open preview the letter, the "Print Invoice" box also opens up (as it does when previewing the invoice).  I don't want this box to open as I don't need to enter any details.
Can someone please have a look at my VBA event below to see what I would need to delete to stop the "Print Invoice" box from popping up.
Private Sub LOC_Click()
On Error GoTo Err_ConfirmationLetter_Click
    If Me![Attendees Subform].Form.RecordsetClone.RecordCount = 0 Then
        MsgBox "Enter attendee and registration information before previewing the Confirmation Letter."
    Else
        DoCmd.OpenReport "ConfirmationLetter", acPreview, , "[RegistrationID]=" & Forms![Attendees]![Attendees Subform].Form![RegistrationID]
    End If
Exit_ConfirmationLetter_Click:
    Exit Sub
Err_ConfirmationLetter_Click:
    If Err <> 2501 Then
        MsgBox Err.Description
    End If
    Resume Exit_ConfirmationLetter_Click
End Sub
Many thanks for any help.
Kath Price
Auckland, New Zealand
PS - Below is the original 'Preview Invoice' event that I copied:
Private Sub PreviewInvoice_Click()
On Error GoTo Err_PreviewInvoice_Click
    If Me![Attendees Subform].Form.RecordsetClone.RecordCount = 0 Then
        MsgBox "Enter attendee and registration information before previewing the invoice."
    Else
        DoCmd.DoMenuItem acFormBar, acRecordsMenu, acSaveRecord, , acMenuVer70
        DoCmd.OpenReport "Invoice", acPreview, , "[RegistrationID]=" & Forms![Attendees]![Attendees Subform].Form![RegistrationID]
    End If
Exit_PreviewInvoice_Click:
    Exit Sub
Err_PreviewInvoice_Click:
    If Err <> 2501 Then
        MsgBox Err.Description
    End If
    Resume Exit_PreviewInvoice_Click
End Sub
	View 2 Replies
    View Related
  
    
	
    	
    	Oct 18, 2005
        
        In my database I track a program called Bridge. Once you open bridge you can have anywhere from 1 to 7 "Sessions". Each bridge is assigned a number IE LT175A. If there are mulitple sessions they are numbered LT175A, LT175B, LT175C etc. I have a check box in my database that shows if bridge is installed on that PC. If it is then my section for session numbers are visiable, if bridge is not checked then the session numbers section isn't visiable. I currently have my Event Procedure in the After Update section. My code works because if I unclick on bridge my sessions disappears. However when I go to the next record if bridge is checked then my sessions are visiable but on the next record where it isn't checked it still displays the session section. So it isn't adjusting itself from record to record. Does my code need to go someplace else or am I doing something else wrong?
Here is the code I have:(and it's under After Update)
Private Sub Bridge_AfterUpdate()
    If Me.Bridge = False Then
        Me.BridgeSession_1.Visible = False
        Me.BridgeSession_2.Visible = False
        Me.BridgeSession_3.Visible = False
        Me.BridgeSession_4.Visible = False
        Me.BridgeSession_5.Visible = False
        Me.BridgeSession_6.Visible = False
        Me.BridgeSession_7.Visible = False
    
    ElseIf Me.Bridge = True Then
        Me.BridgeSession_1.Visible = True
        Me.BridgeSession_2.Visible = True
        Me.BridgeSession_3.Visible = True
        'Me.BridgeSession_4.Visible = True
        'Me.BridgeSession_5.Visible = True
        'Me.BridgeSession_6.Visible = True
        'Me.BridgeSession_7.Visible = True
    End If
End Sub
Thanks,
Rick
	View 2 Replies
    View Related
  
    
	
    	
    	Oct 20, 2006
        
        In one of my forms, i have this event procedure:
Private Sub Gross_Com_LostFocus()
If Gross_Com.Value >= 1000 Then
Full_Com.Value = [Gross_Com] * 0.2
Else
Full_Com.Value = 0
End If
End Sub
Is it possible to put such code in a report and query? If so, how?
Thanks a million!
Cheers!
Sheila
	View 2 Replies
    View Related
  
    
	
    	
    	Apr 17, 2006
        
        Can you step into an Event Procedure line by line in Access?  I toggled the Breakpoint at the End Sub of the Event Procedure, clicked in the middle of the sub, and pressed F8.  Nothing!  I do this all the time in Excel.
	View 2 Replies
    View Related
  
    
	
    	
    	Jan 23, 2005
        
        Try this one guys,
I have a form based on a Query with Comboboxes reading a Table.
the Combo's populate Textboxes with code as:
Private Sub Combobox1_AfterUpdate()
Me.Textbox1=Combobox1.Column(1)
End Sub
Combo bound to column 1,Row source=table.
This was created in Access 2000 and works fine, but when tried in '97 Textboxes  are not populating.
I cannot figure out what is wrong.
(Need it in '97 for work purposes)
	View 7 Replies
    View Related
  
    
	
    	
    	Jun 7, 2006
        
        Does this happen on any key or can I specify the return key. If so how?
Thanks
	View 2 Replies
    View Related
  
    
	
    	
    	Jul 6, 2006
        
        I am trying to figure out how to manipulate the On Delte event of a subform.
I can delete the record but I need to have fields on the main form reflect the changes. Can any one help me?  
Error Message:
The expression On Delete you entered as the event property setting produced the following error: A problem occurred while Microsoft Access was communicating with the OLE server or ActiveX Control.
*The expression may not result in the name of a macro, thename of a user-defined function, or [Event Procedure].
*There may have been an error evaluating the function, event, or macro.
Basically I think this message is telling me that I can not modify the deleting procedure as I wish too.  If this is true can you tell me where I can do that.
here is the very basic code that i am using.
This is the subform code 
Option Compare Database
Dim main As Form_frmOrders
Private Sub Form_Delete(Cancel As Integer)
On Error GoTo err
    Dim wght As Double
    Dim pallet As Double
    wght = .Total_Weight.Value
    pallet = main.Total_Pallets.Value
    If Weight.Value <> 0 Then
        wght = wght - Weight.Value
        MsgBox wght
   Else
        pallet = pallet - Quantity.Value
        MsgBox pallet
    End If
err:
MsgBox err
Exit Sub
End Sub
Thank you,
Teri
	View 3 Replies
    View Related
  
    
	
    	
    	Jun 1, 2007
        
        I am trying to output the following code to a log file. What I am trying to do is when a user opens the database and the switchboard opens up it logs the user to a log file. The code works fine when run from the modules section providing I leave the DoCmd.Output command out. Any thoughts on what I am doing wrong here. This is my code.
Sub ShowUserRosterMultipleUsers()
    Dim cn As New ADODB.Connection
    Dim rs As New ADODB.Recordset
    Dim i, j As Long
    Set cn = CurrentProject.Connection
    ' The user roster is exposed as a provider-specific schema rowset
    ' in the Jet 4.0 OLE DB provider.  You have to use a GUID to
    ' reference the schema, as provider-specific schemas are not
    ' listed in ADO's type library for schema rowsets
    Set rs = cn.OpenSchema(adSchemaProviderSpecific, _
    , "{947bb102-5d43-11d1-bdbf-00c04fb92675}")
    'Output the list of all users in the current database.
    Debug.Print rs.Fields(0).Name, "", rs.Fields(1).Name, _
    "", rs.Fields(2).Name, rs.Fields(3).Name, "date & Time"
    
    DoCmd.OutputTo ([rs.Fields(0).Name], [""], [rs.Fields(1).Name],[ _
    ""], [rs.Fields(2).Name], [rs.Fields(3).Name], ["date & Time"]), cn.OpenSchema, acFormatTXT, "c:databaselog.txt", True
    While Not rs.EOF
        Debug.Print rs.Fields(0), rs.Fields(1), rs.Fields(2), rs.Fields(3), Now; rs.MoveNext,
    Wend
	View 3 Replies
    View Related