Modules & VBA :: Procedure Declaration Does Not Match Description Of Event Or Procedure
			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 Replies
  
    
	ADVERTISEMENT
    	
    	Aug 15, 2015
        
        I have  3 event procedure with  3 buttons to make them run.I  would like to create another button that can run all  procedures togehter. if I copy one of the procedures  how do I tell it to run the other 2.
	View 2 Replies
    View Related
  
    
	
    	
    	Jun 27, 2014
        
        I have a form with a field called duration.
The user selects AM,PM or All Day from a list
If the user chooses All Day I want to create a duplicate record
 
DoCmd.RunCommand acCmdSelectRecord
    DoCmd.RunCommand acCmdCopy
    DoCmd.RunCommand acCmdRecordsGoToNew
    DoCmd.RunCommand acCmdSelectRecord
    DoCmd.RunCommand acCmdPaste
 
However I would like the duration in the first record to be AM and the Second record to be PM
 
So something like Iif [Duration], "All Day" run procedure.
Else IIF do nothing.
	View 2 Replies
    View Related
  
    
	
    	
    	Apr 11, 2014
        
        I have two forms:
 
frmOpeartions
frmManagers
 
frmOperations allows the user to assign a manager to an operation by selecting the manager record from a combobox. Occasionally the user may need to setup a new Manager record if one hasn't been setup already. In this case there is a "New" "button" (it's actually a label with an on click event) that the user can click to open frmManagers and add the new manager record. 
 
The code to open frmManagers is: 
 
Private Sub lblNewManager_Click()
    DoCmd.OpenForm "frmManagers", acNormal, , , acFormAdd, acDialog
    Forms!frmManagers!cboMoveTo.Visible = False
    Forms!frmManagers!lblManagers.Visible = True
End Sub
 
Once frmManagers is open the user creates the new Manager record and then closes the form using a similar label with an on click event: 
Code:
 Private Sub lblClose_Click() 
DoCmd.Close acForm, "frmManagers", acSaveNo
End Sub
frmMangers also has an OnClose event that will refresh any comboboxes on other forms that refer to tblManagers to make sure that new Manager records will be available immediately for the user to choose from: 
 
Code:
Private Sub Form_Close()
    If CurrentProject.AllForms("frmPlants").IsLoaded Then
        Forms!frmPlants!cboPlantManager.Requery
        Forms!frmPlants!cboQCManager.Requery
[Code] .....
 
So the problem comes when the user clicks the Close label (acting like a button) on the frmManagers. The code successfully closes the form and the on close event successfully refreshes any comboboxes on forms that may be open, but then for some reason it attempts to run again or perhaps continue running the onClick event that opens frmManagers. Since the form is already closed it gets hung up on trying to change the visible properties of the controls and the code fails. 
	View 6 Replies
    View Related
  
    
	
    	
    	Feb 5, 2014
        
        I tried to dynamically set image OnClick property to function with couple of attributes. Everything works well, but... it launches the function automatically without any mouse click! What is causing this? I want to execute the function only on the result of mouse click. 
Piece of code:
Forms!Form1.Controls("Image" & i).OnClick = fclick(PiltID)
Private Function fclick(u)
    DoCmd.OpenForm "Form2"
    Forms!Form2.Image0.Picture = u
End Function
	View 6 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
  
    
	
    	
    	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 5 Replies
    View Related
  
    
	
    	
    	Jun 13, 2005
        
        hi,
I placed 64 color boxes in form.
instead of assigning event procedure for each and every boxes (for example, onclick event), I wish to assign it programmatically by using a loop.
How to do this?
thanks.
	View 6 Replies
    View Related
  
    
	
    	
    	Jun 29, 2006
        
        Hi All,
I created an Event Procedure on the After Update event for a control in a continuous form.  Basically, if certain conditions are met, I want it to disable another control.  It works perfectly, except it is disabling the controls for all the records instead of just that record. 
Does anyone know how to get it to just update that record?  I've been researching and cannot figure it out!
Thanks in advance for any and all help :) 
Krysti
	View 3 Replies
    View Related
  
    
	
    	
    	Mar 24, 2014
        
        I am having a problem in my access database.  I have a a form called Compliance Register.  When this window opens it lists all of the requirements of a particular department.  There is an ID and Source ID(this field can contain the same number such as multiple 17's).  The descriptions match up to what is supposed to be shown.  However when I double click on the item, it brings up a Compliance Status window.  This is where things go wrong.
It shows the status listed as the first Source ID that matches the number, but does not seem to also be matching up the ID as well  It must match both ID and Source ID since Source ID can have the same number multiple times down the list..
Here is what is under the Event Procedure for the double click.
Private Sub ListRequirements_DblClick(Cancel As Integer)
On Error GoTo Err_ListRequirements_DblClick
    Dim stDocName As String
    Dim stLinkCriteria As String
        stDocName = "Compliance Status"
[Code] ......
Under stlink criteria, i need it to not only pull the ID, but it has to have a "AND" Source ID.  I need it to pull the record that matches BOTH numbers.
	View 9 Replies
    View Related
  
    
	
    	
    	Aug 16, 2013
        
        when the Form Property "selectionchange" kicks in?I am trying to use this to run an event procedure. I have a sub form datasheet which contains a date, and when the selection is changed from one record to another in the sub form, I would like to run an event procedure that updates certain fields on the main form, according to the date.I have put msgbox in the event procedure, but it doesn't trigger when the selection is changed? or am I misunderstanding the property?I have also tried got focus, lostfocus, beforeupdate, but they only trigger when the record is changed, not just when the selection is changed.
	View 4 Replies
    View Related
  
    
	
    	
    	May 8, 2013
        
        I'm trying to create a security measure that would prevent a user from accidentally paging down in a form and moving to the next record.  I want to create an event macro that would fire if the user accidentally paged down into the next record.  The macro would simply move back to the previous record.  
 
What event would I use to build the macro ?  What action would return to previous record ?
	View 10 Replies
    View Related
  
    
	
    	
    	Oct 30, 2013
        
        I made an On Change Procedure on a textbox, so everytime I input a character, it will trigger the Me.Requery. 
However, after that the event, the mouse cursor moved to the beginning of other field. I want it to stay at the end of the textbox so I can enter a full word, how do I do that?
Code:
Private Sub Text73_Change()
     ProjectSearch = Me.Text73
     Me.Filter = "[Project Name] Like " & Chr(34) & ProjectSearch & "*" & Chr(34)
     Me.FilterOn=True
     Me.Requery
End Sub
	View 3 Replies
    View Related
  
    
	
    	
    	Sep 2, 2013
        
        I have encountered several times, and now, that after using any "cut and paste" or "copy and paste" on VBA code in the event sub, even for a few words, Access does not allow me to exit when I answer 'Yes' to save the changes.  It forces me to respond "No" to exit and re-enter any changes again without using copy or cut and paste.
This is very troublesome and error-prone in program development that the program statements cannot be moved or copies to another location of the program module.
I have over 30 TextBoxes and ComboBoxes on the form and about 20 pages of program code, using Access 2010 (same situation for Access 2013) on Windows7 PC with 4GB of RAM.
	View 4 Replies
    View Related
  
    
	
    	
    	Sep 25, 2012
        
        I have a form that has several sub forms and what I want is that if the user chooses Plan Name in the main form "No Fault" or 'Workers Comp". I want message to pop and go to the field in the subform to enter data but I keep on getting an error.
 
Private Sub Plan_Name_AfterUpdate()
    If ([Plan Name] = "No Fault") Then
        MsgBox "Enter additional information in No Fault form before continuing."
    DoCmd.GoToControl ([NoFaultWCompsubForm]![Attorney Name])
    End If
End Sub
 
It says the action or method requires a control name argument?
 
What am I missing?
	View 1 Replies
    View Related
  
    
	
    	
    	Apr 28, 2014
        
        I have a form with about 100 labels and would like something to happen when I mouseover. So I have a following code:
Code:
Private Sub Label1_MouseMove(Button As Integer, Shift As Integer, X As Single, Y As Single)
Label1.BackColor = vbBlue
End Sub
[Code]....
	View 7 Replies
    View Related
  
    
	
    	
    	May 11, 2015
        
        I'm having an issue getting a return value from a stored procedure that I'm calling from VBA. This is what I have at the moment:
Code:
Dim strDate As String       
Dim strWOStatus As String   
Dim CurrentConnection As ADODB.Connection 
Dim adoCMD As ADODB.Command
Dim adoRS As ADODB.Recordset
Dim ParamReturn As ADODB.Parameter
[Code] .....
The problem I am having is this error: 
Error: 424
Description: Object Required
The line of code it errors on is:
Code:
Set .Parameters("@PartsUSedMTD").Value = ParamReturn
And the value of ParamReturn is always Null after it hits the line before it. 
So it seems like it's not really creating the parameter variable SQL Server needs to run 
	View 4 Replies
    View Related
  
    
	
    	
    	Mar 21, 2014
        
        This is a real conundrum. The following procedure works well the first time through but on subsequent times the database just goes into "Not Responding" mode and has to be restarted. I have tried putting delays in but with little success.
The idea of the procedure is to rename a query, "Daily Logs" to include a specific date "TransDate" so that when the query is sent via Outlook the Excel file name appears for example as Daily Logs 21-03-14. 
DoCmd.CopyObject "", "Daily Logs " & Format(Me![TransDate], "dd-mm-yy"), acQuery, "Daily Logs"
DoCmd.SendObject acQuery, "Daily Logs " & Format(Me![TransDate], "dd-mm-yy"), "Excel97-Excel2003Workbook(*.xls)", "someone@dorsetglidingclub.co.uk", "", "", "Daily Logs " & Format([TransDate], "dd-mm-yy"), "", True, ""
DoCmd.DeleteObject acQuery, "Daily Logs " & Format(Me![TransDate], "dd-mm-yy")
This procedure might seem clumsy but was the only way I could think of the achieve the objective.
	View 10 Replies
    View Related
  
    
	
    	
    	Aug 6, 2013
        
        I've been stumped for the past couple of days trying to discern a method for a form to determine that it's a new month and run a procedure and only run it on month change.
My initial thought is:
Open recordset
move to the last record
compare the month in a date field within the last record to the current month
and run the procedure if the month is different.
I can't get this to work however and I'm not sure what I'm doing wrong. To be honest I typically fumble my way through VBA when it comes to opening recordsets.  Here's what I got:
Code:
Dim rs As DAO.Recordset
Dim db as CurrentDB
Dim strSQL As String
Set rs = CurrentDB.OpenRecordset("FlightLog")
strSQL = SELECT [txtDate] FROM [FlightLog]
[Code] ....
txtReqNumb and txtFltNumb are the values to be reset at the beginning of each month.
Am I on the right track and just have the VBA wrong? 
	View 4 Replies
    View Related