Modules & VBA :: Passing Variables To A Sub Routine
			Jan 13, 2014
				I have a public sub routine which requires parameters to be passed to it when I call it from an access form. When I try to enter the code to call the sub I get a compile error. I've also tried calling it from another sub in the same module but get the same compile error - see below.
 
Code:
 Sub EmailData(Datafile As String, To_mail As String, CC_mail As String, Subject_mail As String)
'code to use variables passed in
End Sub
[Code]....
	
	View Replies
  
    
	ADVERTISEMENT
    	
    	Jul 9, 2014
        
        I wrote this module
Option Compare Database
Option Explicit
Public Function OdometerInput(varodometer As Variant) As Long
Dim varKilometres As Variant
varKilometres = varodometer * 1.609344
OdometerInput = CLng(varKilometres)
End Function
It works fine in the immediate window (although I haven't just fathomed what to do with null values and such) But my question which I am sure will  be 'easy when you know' is how do I pass the variable to it from a text box on  a form and retrieve the data in  another text box on a form.
	View 4 Replies
    View Related
  
    
	
    	
    	May 29, 2015
        
        I have never tried passing variables while calling a function so I don't know what the heck I'm doing. I'll give a simplified example of what I'm trying to do. The second variable vRank is reporting properly but the first one vID gets "stuck" on whatever the first item in the listbox is. 
Code:
Dim vrt As Variant
Dim upSQL As String
For vrt = 0 To Me.List1.ListCount - 1
    If Me.List1.Selected(vrt) = True Then
        Call ChangeUp(Me.List1.Column(0, vrt), Me.List1.Column(1, vrt))
    
[Code] ....
	View 3 Replies
    View Related
  
    
	
    	
    	Feb 25, 2014
        
        My problem is as follows, i have created a report that calculates the total volume of FSC Materials. The user picks two dates from Calender controls that the report will range from. However the needs have now changed and i am required to make the report filter further based on user input, the problem i'm facing is that i cannot figure out a way to pass values from different variables to the report separate from another here is the code i would usually use to pass data to a query/report:
Code:
Private Sub MonthlyFSC_Click()
Msg = MsgBox("Select the Start and Finish Dates you wish to Query.", , "Start / Finish")
Start = adhDoCalendar()
Finish = adhDoCalendar()
[Code] ....
However i am now trying to do this, but it gives me an error as it is trying to pass the values to one field:
Code:
Msg = MsgBox("Select the Start and Finish Dates you wish to Query.", , "Start / Finish")
Start = adhDoCalendar()
Finish = adhDoCalendar()
sql1 = "[ORDER DATE]<#" & Format(Finish, "MM/DD/YY") & "#"
sql2 = "[ORDER DATE]>#" & Format(Start, "MM/DD/YY") & "#"
[code]....
It is performing incorrectly within the case select and passing the wrong criteria, as it will only display results that meet the default values' criteria. However the date criteria is not be passed either. 
	View 4 Replies
    View Related
  
    
	
    	
    	Sep 29, 2014
        
        Access 2010 vba - I'm trying to pass a start date and end date to a date field in a make table query, and use the 'between' operator on that date field.
So I have a criteria on the date field like this "Between [dtStart] and [dtEnd]" and if I run the query manually it asks for 2 values and then works fine. 
Here's the code I'm trying to run:-
Set qdef = db.QueryDefs("qryTest")
qdef.Parameters("dtStart") = StartDate1
qdef.Parameters("dtEnd") = EndDate1
Set rs1 = qdef.OpenRecordset(dbOpenDynaset, dbSeeChanges)
and I get the error "3219 Invalid Operation" on the last line.
	View 2 Replies
    View Related
  
    
	
    	
    	Apr 11, 2006
        
        Hi, I am writing a script which will retrieve all of the tracks relating to whichever cd the user has chosen. The script is being written in asp and the line which sends the variable to access looks a bit like this:
sqlQuery3 = "up_getAlbumTrackInfo " & productID
Set rs3 = dbConn.Execute(sqlQuery3)
If possible could you tell me how to retrieve this value from access as I have become lost.
At present the SQL code in the query looks like this
SELECT tblTracks.trackName, tblTracks.TrackNumber FROM tblTracks
WHERE tblTracks.productID = (** variable would go here **)
Many Thanks 
Tim
	View 1 Replies
    View Related
  
    
	
    	
    	Nov 20, 2007
        
        I'm into one of the subforms that will be using the public variable from the main form and am not having success passing the data from the main form over. on the subform, i created a textbox (txt_currentyear) w/ this in the control source field: =[WrkYear] & " Golf Outing"
WrkYear was the defined in a module as:
**********
Option Compare Database
Option Explicit
Public WrkYear As String
**********
I have created a listbox w/ a few years in it (current_year_listbox). this has =[WrkYear]=Me.Current_Year_listbox.Value in the after update field. i loaded the main form, selected the year, went into the subform to see if it passed the data along w/ no luck.
do i need to call or reference that module in every form or report before i can use the data from it? right now, i just get an empty field on the subform.
	View 5 Replies
    View Related
  
    
	
    	
    	Dec 8, 2005
        
        I can't seem to get the following code to work.
Any help would be appreciated:
Public Function NonConform(strProduct, strBatch As String)
On Error GoTo HandleErr
Dim stDocName As String
Dim stLinkCriteria As String
    stDocName = "frmProductNonConforming"
    stLinkCriteria = "[ProductName]=" & "'" & strProduct & "'"
    stLinkCriteria = stLinkCriteria & "AND [BatchNum]=" & "'" & strBatch & "'"
    DoCmd.OpenForm stDocName, , , (stLinkCriteria)    
HandleErr:
    MsgBox "Error in NonConform Function : " & Err.Description
    Resume Next
End Function
	View 1 Replies
    View Related
  
    
	
    	
    	Sep 28, 2006
        
        Before I go any further w/this current application, I want to make sure this will work.
 I have an access database w/a few forms that will sit on a shared drive on a network. Each user will also have their own username and password because each user will have a certain level of access to what they are allowed to see. The problem I am facing is that if I put the users ID into the global variables module, and two users log on at the same time, then access seems to somehow use both of the IDs when running queries. This makes sense that all uses can see it, since it's Global...  but I need a way for simultaneous users to have a persistant unique id so I can query data that's only meant for them.  I found this example of code that might remedy the situation by passing variables between the forms.
Call the code below in frmOne to pass the variable.
DoCmd.OpenForm "frmTwo", acNormal, , , , acWindowNormal, "Count=2"
Call the code below in frmTwo to get the variable.
 Dim i as Integer
i = CInt(GetTagFromArg(Me.OpenArgs, "Count" ))
Will I end up w/the same result? Will all users be able to see this variable as well?
	View 6 Replies
    View Related
  
    
	
    	
    	Aug 10, 2013
        
        I have 28 combo boxes on a form, which I want to insert data into the table as they are changed. Each one will pass the same sets of data just with different parameters which come from the form.
 
Rather than putting the same code to insert on each of the 28 combo boxes I thought it would be easier to create a function to do it and pass the parameters to it through a sub on the AfterUPdate event of the combo box.
 
I need to pass 4 parameters, if I only put 1 in there it works fine, but when I start putting more in it doesnt work and I get compile errors or syntax errors. 
 
Sub routine:
 
Code:
Private Sub cboMonday1_AfterUpdate()
If Me.cboMonday1 = 1 Then
    Me.cboMonday1.BackColor = vbGreen
    Me.cboMonday1.ForeColor = vbBlack
[Code] .....
	View 9 Replies
    View Related
  
    
	
    	
    	Jul 3, 2013
        
        I have a routine that outputs an MS Access report as a pdf file which works OK. It does not open the file which is what I want.
DoCmd.OutputTo acReport, "rptTransactionInvoiceExcVAT", acFormatPDF, "C:UsersJEFF1Documents
ptTransactionInvoiceExc  VAT.pdf", False
What I would like to do is output the pdf file with a Customer name and number from the field Me.txtAmazonBuyer. I have tried:
DoCmd.OutputTo acReport, "rptTransactionInvoiceExcVAT", acFormatPDF, "C:UsersJEFF1Documents" + ([Me.txtAmazonBuyer]) + ".pdf", False
But no joy. 
	View 7 Replies
    View Related
  
    
	
    	
    	Oct 10, 2013
        
        Access 2010. Can vba code be written to delete and insert data from a table in one routine.  
Something like Delete * Insert into select from where order by....
I tried it with a query but have to write two. 
	View 1 Replies
    View Related
  
    
	
    	
    	Oct 9, 2013
        
        I am using access 2010.  I use basic error handling in my routines:
Code:
On Error GoTo errHandler   ... exitHere:   ... errHandler:   MsgBox "Error " & Err.Number & ": " & Err.Description
The problem is lately; while testing I am running multiple queries in a routine.  When it fails; its hard to identify which query has the problem.  So I hit control break; debug and try to find it.  After I fix it; I debug and reset; i get this continuing hourglass thing in the form of a spinning circle until I close and reopen the database.  I think I need better error handling but not something really complicated because I need to put it in quite a few routines throughout the database.
	View 2 Replies
    View Related
  
    
	
    	
    	Jul 11, 2015
        
        Im a relative novice with access VBA, and I'm really struggling with using Dcount with date variable. All I want to do is count if a certain date appears in a table. Here is the extract from my code:
 
Dim WorkoutDate as Date
Dim datecount as integer
datecount = DCount("[WorkOut Date]", "tblworkoutlogs", "[workout date]= " & WorkoutDate)
Whatever dates are in tblworkoutlogs, datecount is still = 0...I've trawled the net and tried many variations of the code but no success!if I change all the date formats to strings in the code and the tables, it works so I know i'm looking in the correct place.
	View 5 Replies
    View Related
  
    
	
    	
    	Jan 30, 2015
        
        I am trying to set up some template emails using text someone has entered in a form with a variable indicated with a key word in brackets aka. [ChangeID] or [ChangeDate]. The field on the form is formatted as Rich Text so I am getting http code. (No problems yet) In the form the template is required, I lookup the template required and I get the string. I  replace the brackets with the following
 
Code:
    strleftB = Chr(34) & " & me."
    strRightB = " & " & Chr(34)
    strTemplate = Replace(strTemplate, "[", strleftB)
I then get a string but in need to convert part of the string into variables, before I capture the correct output for my email
Code:
"<div>RFC Submission: <strong>" & me.ChangeID & ", </strong> " & me.Details & "</div>"
My question is: what is the best way to split the string into strings and variables
	View 7 Replies
    View Related
  
    
	
    	
    	Jul 15, 2015
        
        Sometimes we need a one-line function to just get the database path or things like that we cannot do on a query or on a Macro Object.
  
 Like:
  
 Function GetDatabasePath() = currentproject.path
  
 possible?
	View 5 Replies
    View Related
  
    
	
    	
    	Sep 11, 2014
        
        How can I assign some type of index to the below variables (data representation) ? I'm using VBA to build a .RFT file for MS Word.   
"Line # 1 data"
"Line #2 data"
"Line #3 data"
. . . .
"Line #7 data"
"Line #8 data"
"Line #9"
. . . . 
"Line # 22 data"
"Line #23 data"
"Line #24 data"
	View 14 Replies
    View Related
  
    
	
    	
    	Oct 9, 2013
        
        I need to set some 'global' variables with default values when my Access 2007 database is loaded. Depending on the user etc these values may be modifed after Access starts but defaults need to be set.
   
I declared the variables as 'Public' in a Module, then put a function in the same Module (to set the default values) then tried to call the function from an "AutoExec" macro, so it's the first thing that runs when Access loads.The macro throws an error - it can't 'find' the function(?)
	View 2 Replies
    View Related
  
    
	
    	
    	Apr 10, 2014
        
        What is the syntax for using variables in a VBA update statement? I have the following that I want to use to update a record field.
Code:
Dim thisTbl as String
If Answer = vbYes Then
   If MedicationInvNo2 <> "" Then
      thisTbl = "tblMyMedData"
   Else
      thisTbl = "tblMedData"
[code]....
I'm getting run-time error '3144' when the database tries to run the SQL. So I'm assuming my syntax is wrong (specifically in the WHERE clause)?
	View 3 Replies
    View Related
  
    
	
    	
    	Oct 29, 2014
        
        I have been tasked to create a multi-keyword search form, however, my form isn't working right and only the first record of the table is opened.
 
Code:
Public Sub txtSearch_AfterUpdate()
    Dim strWhere As String
    Dim strWord As String
    Dim varKeywords As Variant
    Dim i As Integer
    Dim IngLen As Long
    
[Code] ..... 
These are the codes that I am using for my search form. I have a feeling that I am not calling the variable from the after update portion the right way. 
	View 14 Replies
    View Related
  
    
	
    	
    	Apr 9, 2015
        
        I have a Change Management database with several fields, the key fields that I need to talk to work together are as follows:
[Patch] , [CVE] & [Patch Approved]
When opening a form I have I can sort it by the patch number which will then sort out all other CVE's that are not associated with that patch. What I would like to be able to do is approve one patch under the [Patch Approved] field and have it carried through the rest of the filtered CVE's that have the same [Patch] number/ field.
	View 1 Replies
    View Related
  
    
	
    	
    	Sep 30, 2013
        
        I have a simple date stamp that works great in a private sub within a form. (error handling removed for clarity)
 
Code:
 
Private Sub btnDateStamp_Click()
'    UserInit is global variable 
    Me!Notes.SetFocus 
    Me!Notes = Chr$(13) & Date & " - " & Time() & " - " & UserInit & _
        " -" & vbCrLf & Me!Notes
 
[code]...
I am rewriting it as Module function that is Called from various forms, to save space. The function receives the parameters varFormName and varControlName. I wish to write the results of the function back to a memo field on the form.I am stumped at the get go by the need to refer to the Forms controls with a full reference instead of the Me command.
 
Code:
 
Function DateStamp(varFormName As String, varMemoName As String)
'varInitials, varFormName, varMemoName are global variables
Forms!varFormName.Controls!varMemoName.SetFocus ' Error here
'Me!Notes = Chr$(13) & Date & " - " & Time() & " - " & varInitials & _
[code]...
how to refer to the forms control's with their full reference, from within the Module's function, the rest will fall into place.
	View 3 Replies
    View Related
  
    
	
    	
    	Jun 6, 2013
        
        I am fairly new to VBA and am trying to apply a filter within a form so that agent records can be filtered based on an agent's name (so that they can only see information that refers to them).
 
I also want a record to be removed when it has been completed (when this habbens a date completed field will populated) however I do want to see those completed records that refer to the agent that have been completed today.
 
Here is my code. The 2 filters work on their own howver when I put them together I get a mismatch error.
 
 If Me.txtRole = "Agent" Then
    DateCompletedFilter = "(DATECOMPLETED Is Null) Or (DATECOMPLETED = Date())"
    AgentFilter = "CASEOWNER ='" & Me.txtName & "'"
    DoCmd.ApplyFilter , AgentFilter And  DateCompletedFilter 
    Exit Sub
    End If
	View 13 Replies
    View Related
  
    
	
    	
    	Jul 18, 2013
        
        I'm looking at importing data into a table from a spreadsheet. The spreadsheet will only contain a single column of data, while the table in Access will have a few more, some of which will would be will provided from the form the user is using to import the data, and some at a later date.
Is there a way to do this? I've found the "DoCmd.TransferSpreadsheet acImport" command, but not sure this fulfills what I need, as I can't see a way to set variable data.
Here is a brief idea of what my Table would look like, where where the data to import would be obtained from
Fields:
PromoID, DiscountID, PromoCode, AddedBy, DateAdded, UsedBy, DateUsed
Spreadsheet
PromoCode
Form:
DiscountID, AddedBy (environ("username") query), Date ( DATE() )
Note, the PromoID is a autonumber.
	View 2 Replies
    View Related
  
    
	
    	
    	Aug 26, 2014
        
        I am trying to set a filter on a form with VBA using variables and having no success at all. The code I tried last, which seemed to be "close, but no cigar", was:
Code:
Dim sFilterValue As String
    Me.FilterOn = False
    sBiller = Me.txtbiller.Value
    sLastSource = Me.txtbiller.ControlSource
    sLastSource = "[" & sLastSource & "]"
    sFilterValue = sLastSource & "=" & sBiller
    Me.Filter = sFilterValue
    Me.FilterOn = True
sLastSource and sBiller are global variables. When I debug this code the sFilterValue is exactly what I would plug in manually and the Me.Filter shows up as "[Field Name] = Filter Value". But it crashes on Me.Filter = sFilterValue. I have tried all sorts of combinations but nothing I've tried works. What is the proper syntax for using variables as filters?
	View 2 Replies
    View Related
  
    
	
    	
    	Jul 1, 2014
        
        I am writing a process for a hospital application in the UK
We have a concept of "Takes" which are periods to which patients coming into hospital are assigned to and thus the consultant (specialist) who looks after them. 
They are fixed times between 0800-2000 (Day take) and 2000-0800 (+1) Night take.
I have written the following function to try and determine which take a patient should be assigned to based on the time now to power various queries to enable the end user to quickly see "today's day take" and "yesterday's take"
Testing it I seem to not be able to hit the right "Take times" in my output. I suspect it's a problem with the way I'm initiating my variables as Today 0800 and Today 2000 
Code:
Function GetTakeStarttime()
Dim StartTime As Long
Dim EndTime As Long
Dim CurrentTime As Long
Dim YestStartTime As Long
[Code] .....
	View 2 Replies
    View Related