Modules & VBA :: Error Passing Variable To Class Module
			Jan 30, 2014
				I am trying to pass a boolean variable to a class module
 
Code:
Set rps.ViewS = View
the code in the module that this in theory is calling reads as
 
Code:
 
Private ViewC As Boolean
 
Public Property Set ViewS(ByRef ViewA As Boolean)
Set ViewC = ViewA
End Property
Public Property Get ViewS() As Boolean
Set ViewS = ViewC
End Property
However I am getting the error message
 
Quote:Definitions of property procedures for the same property are inconsistent, or property procedure has an optional parameter, a ParamArray, or an invalid Set final parameter.
	
	View Replies
  
    
		
ADVERTISEMENT
    	
    	Sep 16, 2013
        
        How you automatically initialize a newly instantiated class?
So when you create a new instance it will run a procedure to set attributes.
	View 4 Replies
    View Related
  
    
	
    	
    	Mar 30, 2015
        
        I have a parent form which has a class variable (class module instance) to store the form' status and more.... and when i add a new record to the subform it resets the class variable field' data. but this only happens on first transaction, but if i re-run the steps (re-set the variable field value) it's not happening again.
	View 3 Replies
    View Related
  
    
	
    	
    	Jan 1, 2014
        
        An instance of a form can be opened with:
 
Dim frm As Form
Set frm = New Form_formname
 
How can this be done using a variable as the formname?
	View 5 Replies
    View Related
  
    
	
    	
    	Jan 6, 2015
        
        I need to pass a variable from one Access Database to another
 
The scenario is I have a item number in one database that I need to use to open a form in another database, 
 
I can open the database using vba, currently launching a BAT file that copies the latest version database to a local drive and then opens it, 
 
Is there an easy way to pass the variable after this has completed?
	View 1 Replies
    View Related
  
    
	
    	
    	Dec 17, 2014
        
        I'm running a VBA routine in Excel that loops through a lot of data. As part of the process, I'd like to pass a variable from Excel to an Access database that is open and have it run a query based on that value.
	View 4 Replies
    View Related
  
    
	
    	
    	Jun 10, 2014
        
        I haven't created classes in a while, and I don't see what is the problem
I'm modifying a function to get fractions from double. It worked well, but it returned a string.
I need it to be in parts, so I created this class
Code:
Option Compare Database
Public Entier As Integer
Public nominateur As Integer
Public denominateur As Integer
Public Function getText()
getText = Entier & " " & nominateur & "/" & denominateur
End Function
I changed the function type and the assignation:
Code:
Function GetFraction(ByVal Num As Double) As nombreEnFraction
Set GetFraction = New nombreEnFraction
    If Num = 0# Then
        GetFraction = "None"
    Else
        Dim WholeNumber As Integer
        Dim DecimalNumber As Double
[Code] ....
For some reasons, when I get to the end of the function, I get a 91 error, like if it was nothing
But when I use a spy, I see values in the object until the end.
	View 1 Replies
    View Related
  
    
	
    	
    	Jul 8, 2013
        
        Error 91 - Object variable or With block variable not set
 
I am getting this error telling me that an object variable is not set.
 
I know which variable it is but when I step through the debugger it sets the variable and all is fine? Issue is that public variable of a class is not getting set when the VBA Editor is not open?
	View 14 Replies
    View Related
  
    
	
    	
    	Feb 6, 2008
        
        I have a variable declared in a module as such
Code:Dim tracking_customer As Double
When i use one form to set the variable like
Code:Private Sub Command83_Click()'Set the global variable to this customer number'So it can be called in "ON OPEN" event in URL formtracking_customer = Me![Customer Number]'gets expected number in following lineMsgBox ("Trackign is " & tracking_customer) DoCmd.OpenForm "Url Tracking", acNormalEnd Sub
Now when I open that next form I try grabbing the newly set module variable but I always get the number 0. So I am assuming it loses the number once I change forms for some reason
Code:Dim trackID As DoublePrivate Sub Form_Open(Cancel As Integer)trackID = tracking_customer'Following line always produces 0MsgBox ("hey this is tracking customer number " & trackID)End Sub
Can someone explain this, and let me know what I am doing wrong please.
	View 4 Replies
    View Related
  
    
	
    	
    	Oct 1, 2004
        
        I am creating an form in a database and whenever one of my procedure's run it creates this error message:
 
 
The expression ON Load you entered as the event property setting produced the following error:
Member already exists in an object module from which this object module derives.
 
*The expression may not result in the name of a macro, the name of a user-defined function, or [event Procedure].
*There may have been an error evaluating the function, event, or macro.
 
An ideas?
	View 7 Replies
    View Related
  
    
	
    	
    	Jul 13, 2015
        
        I am trying to pass a recordset to a sub procedure as follows
Code:
Private Sub AddNewSProdStatus(rsTemp As DAO.Recordset)
    rsSProdStatus.AddNew
    rsSProdStatus![ProdID] = Me.Recordset![ProdStatusID]
    rsSProdStatus![TitleID] = Me.Recordset![Title]
    rsSProdStatus![ProdDealType] = 1
[Code] ....
However, whenever I call the procedure as below
Code:
AddNewSProdStatus (rsCSales)
I get a type mismatch error. 
All Recordsets are declared as DAO and contain data...
	View 1 Replies
    View Related
  
    
	
    	
    	Feb 18, 2014
        
        Somehow it doesn't take this variable msoFileDialogSaveAs. It tells me it's unknown.
Code:
Public Sub Command2_Click()
On Error GoTo MyError3
Dim filelocation As Variant
Dim g As Object
Set g = Application.FileDialog(msoFileDialogSaveAs)
  
[Code] .....
	View 2 Replies
    View Related
  
    
	
    	
    	Jul 19, 2013
        
        Is the following possible? If so - how?
 
I have a series of several hundred variables being assigned values.
 
If the value assigned to the variable results in an error, I would like to assign a default value to the variable which caused the error.
 
How do I reference the variable, or line (or any info I can work with), which caused the error?
	View 2 Replies
    View Related
  
    
	
    	
    	Jun 24, 2015
        
         I am using Windows 8.1 64 bit system. Into attached access file (OfferStudy.accdb) ,trying to load an activeX  TreeView control by defining into a form module. First, I created an empty form and activeX Treeview control.When I define tv variable As TreeView as created in application, it is changing as Dim tv As treeView instead of TreeView. After my code is completed,an error message ("user-defined type not defined") is returning as shown in attached (DebugError.png)file.
  
 I suppose that there is some conflict on creating activeX control on my Access 2013 application.
	View 4 Replies
    View Related
  
    
	
    	
    	Feb 6, 2006
        
        I want to build an SQL statement in code which includes the value stored in a string variable where the variable name includes a loop counter.
This is a much simplified example of what I am trying to do:
Dim i as integer
dim Strtable1 as string
dim Strtable2 as string
dim Sqlstring as string
...
Strtable1 = "tblEmployees"
Strtable2 = "tblSales"
...
Sqlstring = " select * from ... where....."
for i = 1 to 10
DoCmd.RunSQL "INSERT INTO " & StrTable & i  & sqlstring
Next i
I am not sure how to get the table names stored in the string variables into the SQL statement.  When I try the above it looks for a variable named StrTable, not StrTable1, StrTable2 etc.
	View 4 Replies
    View Related
  
    
	
    	
    	Mar 5, 2008
        
        how can i pass a variable from one form to another
this works fine 
Tracking_Number = Forms("Main").Control("mytext")
but if "mytext" was in vb (rather than from a text box as shown above) how can i do this
	View 4 Replies
    View Related
  
    
	
    	
    	Aug 8, 2006
        
        Hi Everyone,
I'm trying to pass a variable called MyFilter between forms but am having problems. I have created a Module and declared MyFilter as a public string.
The original code in my first form is:
Private Sub Command65_Click()
Dim MyFilter As String
If Me.Filter = "" Then
        MsgBox "Please apply a filter to the form first."
ElseIf Me.Dirty Then
' Make sure the record is saved
RunCommand acCmdSaveRecord
Else
    MyFilter = Me.Filter
    DoCmd.OpenReport "Temp", acViewPreview, , MyFilter
    
End If
End Sub
How to I change this so that it now stores the value in the Public variable instead of the Private one which it is doing above?
Thanks,
	View 5 Replies
    View Related
  
    
	
    	
    	Sep 13, 2004
        
        I have an event on a form kicked off by On Delete and I have an event on the same Form kicked off by After Delete Confirm. I need to pass a variable from the On Delete Event to the After Delete Confirm Event. I have set up the variable as public, but it keeps getting reset inbetween the two events. Any ideas?
	View 1 Replies
    View Related
  
    
	
    	
    	Mar 13, 2014
        
        I have some code that will run if I am populating an empty table(no duplication's possible) but now I am trying to create a Sub to check for existence of a record and handling it going forward.  
Anyways the big picture is looping through a text file and placing data where it needs to go.  The code follows including some comments point to the issue.
Code:
Sub PutinNewTag(TableIn As String, Tagtype As String, textline As String)
    Dim strSQL As String
    Dim NameIn As String
    Dim TagName As String
    Dim Db As DAO.Database
    Dim rstin As DAO.Recordset
[Code] ....
	View 8 Replies
    View Related
  
    
	
    	
    	Apr 29, 2007
        
        Hi all!
I have a college project were we have had to code a database for a fictional hospital to hold patient, doctor, consultant and appointment information. I am struggling with one particular problem.
I am trying to pass a variable from a combobox of results to another form to display a certain record.
I am trying to send:
stLinkCriteria = "[NHS_Number]=" & "'" & Me![lstSearch].Value & "'" & " AND [AppointmentID]=" & "'" & AppointmentID & "'" 
to the form but it fails, yet if I "hard code" the variable it works:
stLinkCriteria = "[NHS_Number]=" & "'" & Me![lstSearch].Value & "'" & " AND [AppointmentID]=23"
Can anybody shed any light upon this please?
	View 2 Replies
    View Related
  
    
	
    	
    	Jul 13, 2005
        
        Hi
I have a matrix variable (ex: test(7,3)) define as private in a form's code vba. In this form, I open a report in which I would like to show the values of my matrix variable. How can I do this efficienly ... what i use now is a public buffer variable in a module(it eats memory for nothing)
can someone tell me a trick ...
tanks a lot
	View 1 Replies
    View Related
  
    
	
    	
    	Sep 21, 2005
        
        I'm attempting to pass a variable from form to form...I'm having trouble doing it...I checked the forum and read a little that the form I'm passing it from must stay open...is this correct?  I have my variable as: Public strUserName as String.  It does work fine if I leave the form open then I can pass it...
But I want to be able to close the form and still pass the variable...How can this be acheived?
Thanks in advance.
Kacy
	View 3 Replies
    View Related
  
    
	
    	
    	Apr 16, 2013
        
        I am creating a 2 level report to confirm an order.  Main report already created, runs successfully called as subform/subreport under "OrderDetails" form. Linked to master using Order.ID.  There are two versions of the confirmation report that have different layouts for different program types.
The hangup comes when I try to add a "Class Dates" subreport. It lists dates of individual classes and Skip dates.  I have created the subreport as "srClassDates". When I add it to the main report, it lists the records.  However, when I try to link it to the Main report, an error message box appears with the "object variable or With block variable not set".
I have tried rebuilding both the main and subreports, rebuilt the query, have not found anything that changes the result.
Linker has been working successfully on other subforms.  Report with groupings works fine, but I need data from 2 tables both linked to order.id.
	View 2 Replies
    View Related
  
    
	
    	
    	Aug 5, 2006
        
        In form1 I've a command button to open form2.
Code in form1:
Private Sub button_Click()
On Error GoTo Err_button_Click
    Dim stDocName As String
    Dim stLinkCriteria As String
    stDocName = "form2"
    stLinkCriteria = button.Caption
    DoCmd.OpenForm stDocName, , , stLinkCriteria
Exit_button_Click:
    Exit Sub
Err_button_Click:
    MsgBox Err.Description
    Resume Exit_button_Click
    
End Sub
button.Caption contains a valid date value
In form2 I want to display the date in a label.
Code in form2:
Private Sub Form_Load()
    Dim DatePassed As Date
    DatePassed = CDate(Me.OpenArgs)
    label.Caption = DatePassed
End Sub
On executing I get an error like "Invalid use of null value."
Who helps?
	View 5 Replies
    View Related
  
    
	
    	
    	Sep 16, 2014
        
        I have a form with 5 buttons on it.  Each button is meant to select a warehouse location, so a query can be run to give an inventory report for that location.  There is a separate query for each button and the OnClick event does properly modify the recordsource to give the appropriate data to the report for the location selected.  
To this functionality I want the OnClick event VBA to pass the warehouse location to a textbox on the report, so the title of the report reflects that inventory location.
My code thus far is:
Private Sub Command5_Click()
Dim mySQL As String
Dim WHSE As String
mySQL = "SELECT [Master Part List].[Part Number], [Master Part List].Category, [Master Part List].Description, [Master Part List].MaterialCost, [Master Part List].Inventory, [Master Part List].Update, [MaterialCost]*[Inventory] AS [Total Cost], [Master Part List].Warehouse"
[Code] ....
When I get the report, the textbox is empty, instead of containing the text value for the warehouse location.
	View 5 Replies
    View Related
  
    
	
    	
    	May 7, 2013
        
        I have a subroutine that successfully builds a SQL statement "strSQL", which is a public variable.  
Using msgbox, I can read that the value is correct - 
SELECT * from tblIncidents WHERE [Nature] = 'Hover';
 
(The select statement may be complex, e.g. [Nature] = 'hover' AND [COLOUR]= 'Blue' AND [GRADE] = 'High')
 
I want to pass the variable strSql to my report rptIncident in the following command:
 
Private Sub CmdPrintReport_Click()
If Right(strsql, 1) <> "'" Then    'check if statement was built
Else
strsql = strsql & ";"              'add trailing ; to statement
MsgBox strsql 
DoCmd.OpenReport "tblincidents", acViewNormal, , strsql
End If
End Sub
 
I get a flashing error, then runtime error 3075 - |1 in query expression '|2'.
	View 6 Replies
    View Related