Modules & VBA :: Public Function With Variables Referencing Table Date Fields
			May 31, 2014
				I have a table with only two fields and one record: BegDate and EndDate (beginning and end date of the reporting period respectively). I also made a function with variables that look up those values for use as a date parameter in a query.
Here is the code: 
Option Compare Database
Option Explicit
Public Function getCurrentRepDates() As Date
Dim dtBegDate As Date
dtBegDate = DLookup("BegDate", "tblCurrentRepDates")
[Code] ....
I am getting a syntax error for the line marked red. How can I use "Between" function in VBA code? Access 2010
	
	View Replies
  
    
	ADVERTISEMENT
    	
    	Sep 4, 2013
        
        I would like to declare Global or Public variables from a table so they can be added to or edited easily. I had the following function to do this with Alpha Five but at the moment my lack of knowledge of Access VBA is making this task difficult.
Here is the function that I use in Alpha:
FUNCTION udVars AS A (udTabName AS C )
dim codeStr as c
 t=table.open_session(udTabName,file_ro_shared)
t.fetch_first()
while .not. t.fetch_eof()
 
[Code] ....
It opens a table reads in the records and then makes them into a string the string would look something like this:
"Public EuroRate as Single = 0.885" 
I would then need to use this string to declare the variables but not sure what command to use - I was looking at the Eval function last night but couldn't get this to work...
The table would hold strings for all the above so you would have:
My_Var (variable name)
My_Typ (type of variable e.g. Single)
My_Val (value e.g. 0.885)
The table would hold as many variables as required, some would be dates, some paths for making directories and some would be numbers.
	View 6 Replies
    View Related
  
    
	
    	
    	Apr 22, 2015
        
        Is there any way of opening recordsets as public or global in a form? E.g. if i do something like
Set rs = db.OpenRecordset("TblCustomers", dbOpenSnapshot, dbReadOnly)
the variable rs should be available in all the private sub i have on that form, and i should be able to access records without opening database/ record sets for individual subs.
	View 6 Replies
    View Related
  
    
	
    	
    	Oct 4, 2013
        
        I am trying to read the value of a control on an open form from a Public Function in a Module with no luck. I suspect the issue is syntax.
Code:
 
Public Function MyFunction(varFormName As String, varControlName As String)
If Forms(varFormName).Controls(varControlName) = True Then ' = 0 even when control is -1
Else
End If
End Function
The variables pass through fine but the If statement equals zero regardless of the state of the form's control. I tried several variations to no avail.
 
If Forms(varFormName).Form.Controls(varContactControl  ) = True Then
If Forms(varFormName)!Form.Controls(varContactControl  ) = True Then
Etc.
	View 4 Replies
    View Related
  
    
	
    	
    	Jun 4, 2014
        
        I have an issue with this case select below. The DelayStart is time so lets say I put in the debug window 
?DatePart("h", #04:00pm#) 
The result would be 16 which is correct BUT the issue is my second shift starts at 04:01pm and the result is still 16 untill  5pm. How do I fix this so I get the correct shifts? Im guesing use something other than DatePart but what?
'Daylight 6:00am - 4:00pm
'Afternoon 4:00pm - 2:00am
'Midnight 2:00am - 6:00am
Code:
Public Function getShiftForRecord(DelayStart As Variant)
On Error Resume Next
Select Case DatePart("h", DelayStart)
Case 6 To 16 'Daylight 6:00am - 4:00pm
[Code] ....
	View 11 Replies
    View Related
  
    
	
    	
    	Jan 23, 2014
        
         I have built an access application that contains a set of buttons along the top of every form that serve as navigation.*  These buttons each perform the same function on every form they are on. (menu opens the main menu, etc)  I have database macros to assign each button the same function but I still have to go through each form and manually assign them.  I was wondering if it was possible to define a public function that on db open will look for all buttons with a certain name and assign them the macro.  (so all buttons called cmdmainmenu will have the OpenMainMenu macro assigned and so on).Before you go there, I have already tried the navigation form and set all forms as subforms. 
	View 5 Replies
    View Related
  
    
	
    	
    	Sep 23, 2014
        
        Question for Documentation purpose: Should the Public Type  be declared in its own module?
Or should it be declared in a standard module where non-public functions use it? It is not for a Form module use.
For a Rule Engine, a function is calling one record on 4 different SQL Views (as linked tables) that have the same field format.
For speed, the recordset should only be opened once. However, there are multiple values that must be returned to the result table multiple fields.
One way to return multiple values is an Array. That has over head too.
Another way is to create multiple public variables. Not my choice for documentation. Another is to create a string. 
This is a pure code module with several non public functions / subs. What is the documentation preference? List a Public Type close to the function, or place it in the Global module?
Background: A function can only have one return value. 
By creating a public Type, multiple values can be returned.
Code:
Public Type Income
        Wages As Currency
        Dividends As Currency
        Other As Currency
        Total As Currency
    End Type
Use this structure as the return type for a function. In a real situation, the function would look up your database tables to get the values, but the return values would be assigned like this:
Code:
    Function GetIncome() As Income
        GetIncome.Wages = 950
        GetIncome.Dividends = 570
        GetIncome.Other = 52
        GetIncome.Total = GetIncome.Wages + GetIncome.Dividends + GetIncome.Other
    End Function
To use the function, you could type into the Immediate Window:
    GetIncome().Wages
(Note: the use of "Public" in the Type declaration gives it sufficient scope.)
Important Notice The way this function is called will work, but is wrong from the aspect it re-calls the recordset over and over.
See the proper way to use it submitted below.
	View 5 Replies
    View Related
  
    
	
    	
    	Oct 22, 2013
        
        I am designing a Public Function F() 
I want this function to populate value from a any field selected from any table to any text box in any form ...... Lets say in a Database named TestDB we have a Table named tblTest , a Form named frmTest and in this form( frmTest ) we have one Bound Combo Box named cmbTest and one unbound TextBox named txtTest 
We assume that the table tblTest has three fields : TestID , FName and LName .
We also assume that there are already some records in the Table tblTest .
If the function F() is already programmed it should take as arguments as it follows :
F(FormName as??? ,ControlName as ???, TableName as ???, FieldName as ???, ID_Field_Name_of_the_Table as ???, Combo_box_selected_ID as ???)
In result the function should (probably) DLookup (FieldName , TableName , ID_Field_Name_of_the_Table = Combo_box_selected_ID )  and then store the value in a variable ( probably Variant ???) , lets say called varSetValue.
The problem is IF this is the correct way to handle that issue , than what should i do next.... I really don't know how to pass a Control's name to a function from the Event module of the ComboBox - 
I mean - how can I obtain the value so it is usable for the function .... What data type should be the function arguments so I can use them to set a value for a control in any form .
In example :  If the Dlookup() is somehow successfull then I want to assign the varSetValue to the txtTest what should I do : FormName.ControlName.Value = varSetValue  >??????
I have read a lot materials but couldn't find a good answer for that , and aswell what data type should be the arguments that the function accepts and how do I obtain Controls and Forms names so I could use them in the function as described above . 
	View 4 Replies
    View Related
  
    
	
    	
    	Dec 23, 2013
        
        I have the following function that I found online. Unfortunately I can't remember where I got it since I've had it for a little while. Today, when I tried to actually put it to use it didn't work.
I'm calling it from a form as follows: CompactDB (tblHotword)
tblHotword is just a random table from the back end. My understanding of the function was that it would use that table to connect and get the file name of the back end. 
Whenever I run it, Access pops up a window that says "Object required" and nothing else. It doesn't look like a standard error message popup. When I click 'OK', Access continues with the rest of the code as if nothing went wrong. The function doesn't run though.
Code:
Public Function CompactDB(TableName As String) As Boolean
On Error GoTo Err_CompactDB
Dim stFileName
DoCmd.Hourglass True
stFileName = db.TableDefs(TableName).Connect
[code]....
	View 8 Replies
    View Related
  
    
	
    	
    	Jun 11, 2013
        
        I have multiple reports that use similar IIF statements as the controlsource for four textboxes. Naturally, I don't want to have to update twelve controlsources if any of the calculations change, so I thought I'd make this a public function. However, I don't know how to pass along multiple textboxes as variables. Here's what I have so far:
Code:
Option Compare Database
Public Function txtColor(ByRef textbox As Control)
Dim str1, str2, str3, str4 As String
'The IIf statement is simplified for this example. It's not important.
str1 = "=IIf(IsNull([Inquiry start date]),'W',IIf([txtInquiry]<1 And IsNull([Inquiry end date]),'R'))"
[Code] ....
And this is in the report (where ??? is what I'm asking about)
Code:
Private Sub Report_Load()
Call txtColor(???)
End Sub
The error I get is "Runtime 424 Object Required"
	View 7 Replies
    View Related
  
    
	
    	
    	Feb 26, 2014
        
        I am using a public function to feed a variable string to a query. So far I have got:
Code:
Public Function ClientStreetModule(firstLVar As Variant, streetVar As Variant, newFL As Variant) As String
     Dim cslStr1 As String, newStreet As String              
   newStreet = Right(streetVar, Len(streetVar) - Len(newFL))
  
[code]....
However, I only need to use newStreet as the true part of iif, in which instance all are longer. At least I think this is the problem. I realise I might need to use NZ but am not sure how. Why it is evaluating and giving errors for all records and not just when the iif criteria is true as I want it to?
	View 7 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
  
    
	
    	
    	Oct 9, 2007
        
        It just occurred to me that I use certain variables in several of my routines. Maybe you've done the same... something like:
Dim db as DAO.Database
Dim rst as DAO.recordset
Dim qdf as DAO.QueryDef
Now, if it's re-used in many routines, wouldn't it make more sense to make it a public variable, and set them to whatever you need it for a certain routine? Would it be more efficient than having to re-initializing and discarding it for every routine that used it? What problem would one expect from making them public?
Also, since it's very common to set db = CurrentDb, would it also make sense to set it publicly, and for cases where you aren't using CurrentDb, use a private variable just for that one?
	View 7 Replies
    View Related
  
    
	
    	
    	Nov 13, 2014
        
        I have created a Public Function that would get a new Production Instructions number based off the [PI Number] of Tbl_Production_Instruction table.
I have a form that people will put in all information but the PI Number, then when ready they will click a button to update the PI Number. I place an unbound txtbox that will be hidden, with the control source to =NewPINum(), but when I tested the see if the unbound txtbox was populated with the new PI Number it was blank.can't figure out what I am doing wrong. 
Code:
Public Function NewPINum() As String
Dim vNum As String
Dim strYYMM As String
Dim getnextPI As String
strYYMM = Format(Date, "yy") & "-" & Format(Date, "mm") & "-"
If strYYMM = Left(DMax("[PI Number]", "Tbl_Production_Instruction"), 6) Then
    vNum = Right(DMax("[PI Number]", "Tbl_Production_Instruction"), 3)    vNum = vNum + 1    getnextPI = Format(Date, "yy") & "-" & Format(Date, "mm") & "-" & Format(vNum, "000")Else
    vNum = "001"    getnextPI = Format(Date, "yy") & "-" & Format(Date, "mm") & "-" & Format(vNum, "000")
End If
End Function
	View 4 Replies
    View Related
  
    
	
    	
    	Aug 10, 2005
        
        Hi all,
I seem to have encountered a strange problem at work.
I declared a public variable for user department. The user selects his department from a Log On form and if the password is correct, he opens another form with the department variable passed on in openargs. 
All of this works fine in access2k but upon testing with 2003, the openargs somehow do not seem to be being passed on. Maybe I am being dense somewhere but it is kinda puzzling for me.
I am not using access's security for users and groups because I am trying to reduce the complexity of the whole project (I wont be around to maintain it next time).
Any help rendered is greatly appreciated!
	View 2 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
  
    
	
    	
    	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
  
    
	
    	
    	Nov 5, 2013
        
        I a trying to list all fields from ALL tables in a certain DB.I am using the tableinfo function. However, because the output of the immediate window is limited to 200 lines, I can only see the last 200 fields. Is there a way to export this in another way than the debug.print procedure, so I can bypass this limitation?
 
Code:
 
Public Sub showtablefields()
Dim db As Database
Dim tdl As TableDef
[code]...
	View 5 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
  
    
	
    	
    	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
  
    
	
    	
    	Apr 5, 2008
        
        I'm new to VB and am learing slowly with all your great help in this forum.  
I'm wondering if its possible to write a Public Function for vbCRLF.  I have a field in multiple forms that are all named 'Note'.  If I have the following code:
Public Function PubNoteLF()
On Error GoTo PubNoteLF_Err
    My!Note = My!Note & vbCrLf
    
PubNoteLF_Exit
    Exit Function
    
PubNoteLF_Err
    MsgBox Error$
    Resume PubNoteLF_Exit
    
End Function
When I run the code I get Compile Error: 'Sub or function not defined.'
Can someone tell me what I'm doing wrong? Its problably something real basic, but I'm stumped.  Thanks.
	View 7 Replies
    View Related
  
    
	
    	
    	Dec 22, 2011
        
        I have a table that contains dates (Saturday through Friday).  When I set up my query, I would like data returned where the date in a field is between the Saturday date and Friday date.  Is there anyway to do this n the query without hard coding the dates in and manually changing the dates every week?
	View 1 Replies
    View Related
  
    
	
    	
    	Oct 2, 2004
        
        I haev a report with 15 sub reports.  I have to use Visual Basic to format the sub reports.  I know how to do the formatting (see below) but what I would like to do is have one function (Public) that I can pass the subReport name to and have the formatting happen.  This would be mush easier to maintain than copying the code below into on_print events of all 15 sub reports.
 
Has anyone done this and have an example??
 
Thanks
 
--------------------------------------------------------------------------------------
Private Sub GroupHeader0_Print(Cancel As Integer, PrintCount As Integer)
    Dim widthOfBox, startLeftSide
    startLeftSide = 0.017
    widthOfBox = 0.21
    Me.ScaleMode = 1
    Me.ForeColor = 0
   'Repeat the following line of code for each vertical line
   ' 1*1440 represents 1 inch
   
 '  Me.Line (0 * 1440, 0)-(0 * 1440, 14400) 'Draws line at Left Margin
   Me.Line ((startLeftSide * 1440) + widthOfBox * 0 * 1440, 0)-((startLeftSide * 1440) + widthOfBox * 0 * 1440, 14400) 'Draws line at Left Margin
   Me.Line ((startLeftSide * 1440) + widthOfBox * 1 * 1440, 0)-((startLeftSide * 1440) + widthOfBox * 1 * 1440, 14400) ' Draws next line
   Me.Line ((startLeftSide * 1440) + widthOfBox * 2 * 1440, 0)-((startLeftSide * 1440) + widthOfBox * 2 * 1440, 14400) ' Draws next line
   Me.Line ((startLeftSide * 1440) + widthOfBox * 3 * 1440, 0)-((startLeftSide * 1440) + widthOfBox * 3 * 1440, 14400) ' Draws next line
   Me.Line ((startLeftSide * 1440) + widthOfBox * 4 * 1440, 0)-((startLeftSide * 1440) + widthOfBox * 4 * 1440, 14400) ' Draws next line
   'the 14400 is an arbitrary number to increase the line to the max of a
   'section.
End Sub
	View 1 Replies
    View Related
  
    
	
    	
    	Feb 13, 2015
        
        I have a query that I'm working on through Access 2010's design view.  I'd like to add a criteria to the query where it only shows results with the employee name column matching a global variable I created that stores the name of the currently logged in employee.
Here's my vba code that declares the global variable and the public function i'm trying to pass as criteria in the query:
Global gbl_loginName As String
Public Function returnName() As String
    If IsNull(gbl_loginName) Then
        returnName = "test"  ' dummy account created for development only
    Else
        returnName = gbl_loginName
    End If
End Function
and here's the SQL code from Access's design view:
SELECT      [Entry of Hours].WC, [Entry of Hours].[Employee Name], 
[Entry of Hours].[Set Up Time], [Entry of Hours].[Run time], 
[Entry of Hours].[Traveler Number], [Entry of Hours].[Entry Date], 
[Entry of Hours].[Quantity Finished], [Entry of Hours].Notes, [Entry of Hours].WPS, 
[Code] ....
when I try running the query, however, I get this error:
'returnName' is not a recognized built-in function name
Is there a problem with using public functions in Access' design view?
	View 10 Replies
    View Related
  
    
	
    	
    	Jan 14, 2008
        
        Hi all,
I'm trying to get a public function to work within the design view of a query. The function is defined as:
Public Function Percentile_(fldName As String, _
tblName As String, p As Double, _
Optional strWHERE As String = "") _
As Double... ( I can put the whole code if u need it)
Any thoughts about how I can make the Percentile function calculate values according to a GroupBy statement and not for whole data set?
	View 14 Replies
    View Related
  
    
	
    	
    	Jan 16, 2015
        
        I am using Access 2010 and I currently use a command button on a form to add new records to a table using data that the user has entered into the form using the code below:
Although this is pretty self-explanatory, here is a key for reference:
Me.lstFacilities = ListBox
Me.cboMeasure = ComboBox
Me.cboYesNo = ComboBox
Me.txtTarget = TextBox
Code:
Private Sub cmdAddMet_Click()
Dim DB As DAO.Database
Dim RS As DAO.Recordset
Dim strSQL As String
Dim i As Integer
Set DB = CurrentDb
[Code] .....
This works great but I would like to be able to pull in data from another database based off of Me.lstFacilities.Column(1, i) which is the FACILITY_ID field and is located in the other database's table. I thought about adding in another string variable(strSQL1) and opening up a separate recordset and database:
Code:
Set DB1 = OpenDatabase("serverotherdb.accdb")
strSQL1 = "SELECT [FieldName] FROM [tblOtherDatabase] IN 'serverotherdb.accdb'"
Set RS1 = DB1.OpenRecordset(strSQL1)
However, I'm not sure where to start pulling in the data from the [fieldname] in the [tblOtherDatabase] when I start the loop below:
Code:
For i = 0 To lstFacilities.ListCount - 1
    If lstFacilities.Selected(i) = True Then
        RS.AddNew
        RS!RELATIONSHIP_ID = Me.lstFacilities.Column(0, i)
        RS!MEASUREMENT_PERIOD = Me.cboMeasure
[Code] .....
Is it even possible to do this? 
	View 10 Replies
    View Related