VBA Passing Array Arguments To Procedure
			May 13, 2015
				The procedure call "Call RearrangeCoordinates(RearrangeCoords(), ReturnCoords())" return a message "Type mismatched: Array or user-defined type expected"Are there any views as to why the message is being displayed?
Private Sub CommandButton1_Click()
Dim ReturnCoords As Variant
Dim ...........................................
ArrayLength = UBound(ReturnCoords)
[code]....
	
	View Replies
  
    
		
ADVERTISEMENT
    	
    	Mar 10, 2015
        
        I have a form displaying the contents of a table in a datasheet view. I want to click on a row and open up a new form that will use a field in the selected row as a parameter.
I know how to call the VBA procedure by setting the double click on field (Cant do it for click on any fields in the row?) and in the VBA was using:
strText = Me.[Product Reference].Value
to get the required value. However this only seems to work in single form view. If it is in datasheet view it gives an error and will not let you save the form.
I am guessing I am missing the row identifier in my VBA code. 
	View 3 Replies
    View Related
  
    
	
    	
    	Feb 22, 2005
        
        Not sure which forum this was under, but I figure Access might be it 
 
I have a stored procedure already written which works fine, if I supply the criteria to it before or at manual execution.  I want it to use a field on a form in an Access Data Project as it's criteria (as a form is built off the results of the procedure).  I can't find any documentation on how to pass criteria to a stored procedure for use in SELECT WHERE statements.  
 
Can somebody point me in the right direction?  Here is my stored procedure:
 
spGetContact:
 
Code:CREATE PROCEDURE dbo.[spGetContact](@parHomePhone numeric)AS SELECT dbo.tblContactAddress.AddressLine1, dbo.tblContactAddress.AddressLine2, dbo.tblContactAddress.City, dbo.tblContactAddress.Zip, dbo.tblContactAddress.State, dbo.tblContactEmail.PrimaryEmail, dbo.tblContactEmail.SecondaryEmail, dbo.tblContactPhone.HomePhone, dbo.tblContactPhone.BusPhone, dbo.tblContactPhone.CellPhone, dbo.tblContact.ContactID, dbo.tblContact.FirstName, dbo.tblContact.LastName FROM dbo.tblContact INNER JOINdbo.tblContactAddress ON dbo.tblContact.ContactID = dbo.tblContactAddress.ContactID INNER JOINdbo.tblContactEmail ON dbo.tblContact.ContactID = dbo.tblContactEmail.ContactID INNER JOINdbo.tblContactPhone ON dbo.tblContact.ContactID = dbo.tblContactPhone.ContactIDWHERE (dbo.tblContactPhone.HomePhone = @parHomePhone)GO 
 
When i execute this manually I get the dialog prompt to enter the value for @parHomePhone, which is what I want to automatically pull from txtPhone on the frmSearch form.
	View 1 Replies
    View Related
  
    
	
    	
    	Nov 21, 2013
        
        On my form I have a combo box where the user can select the sex of a person. I had set the row source of the combo to a table, tblSex and this works fine. Now I want to programatically add the table entries ( simply male or female) to the row source, having set the combobox to value list.   I cant see how to pass the combobox and tablename parameters and I am getting an error on form load "The expression you entered as the event property setting produced the following error: UserDefined type not defined"  The calling procedure from frmPeople is
Code:
'---------------------------------------------------------------------------------------
' Procedure : Form_Load
' Author    : Administrator
' Date      : 21/11/2013
[Code].....
I think the way the parameters combobox and tablename are passed is incorrect. I want to write a robust procedure which I can use for each of the comboboxes on my form.
	View 7 Replies
    View Related
  
    
	
    	
    	May 3, 2013
        
        if you are in a subform, can you pass the subform as a form to a procedure.
 
eg
 
msgbox(me.name) 'shows the form name correctly, but then
call somefunc(me) doesn't seem to work.
 
I get a type mismatch in
 
function somefunc(frm as form)
 
E.g.
 
function somefunc(frm as object)
msgbox typename(frm) 'returns "Controls"
end function
	View 14 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
  
    
	
    	
    	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
  
    
	
    	
    	Sep 1, 2005
        
        Hello,
    I want to be able to pass arguments to an access file on start up. I want to be able to grab this value and then perform an action based on this.
Background:
    The program will send an email with details for a change request, the recipient will then need to click on a link to accept or reject this change. So I want them to be able to click the link which will trigger the program to save  accept or reject. 
Regards,
  Todd
	View 3 Replies
    View Related
  
    
	
    	
    	Aug 1, 2005
        
        Hi. 
I'm putting together a database of property clients and i have almost finnished but as always i seem to get so very close to the end of a project and i hit a wall. 
background:- I have about 5 different tables which mostly have relationships but there is one main table (clientDetails) which holds the main record this has a very predictable clientID primary Key. the other tables have equally predictable keys for the tables ie: LettingID for a letting client insuranceID for insurance clients etc.. the deal is really that EVERYONE is a client so they get the main details filled out and another record in another table using the primary key of the main table in all other tables. one client can have many other records relating to them useing the primary key. 
The Problem:- I have made lots of nice forms that all link up together so you can edit and brose all of the records in the database, and this works very well.. however my problem comes when i want to add a new record in one table that relates to the same record in another using the forms not the table view. eg.  on form 1 (clientDetails) i add a new client to the database all fine even using the autonum for the PK. now i bring up the record of that client and i have a button (addProperty) this brings up another form (propertyDetails) using the PK from the previous.  this works fine if there is already an entry in the DB but if not then the PK is autonumbered.. 
What i need:- I need to be able to open up a form using PK then (addProperty) button to the next form which finds that record using the pk (clientID) and FK (propertyID) and if there is no FK relating to the PK then to autonumber and use that... so i basically transfer the PK from form 1 to form 2 regarless of any other data relating to it, and auto numbering to the next number in that table for the FK.
eg. 
form1            form 2
-------    >   ---------
PK=100         PK=100
                   FK=5
this is probibly really basic.. but i hope someone can help .. 
Many thanks. 
chiller149@gmail.com = is me..
	View 3 Replies
    View Related
  
    
	
    	
    	Jan 24, 2005
        
        Hi,
I have got an unbound access form, and in this form I gather 2 dates (i.e. through txt fields).  Once I have these fields, I want to open a form that has one list box on it.  This list box should populate based on the dates that I gather on the previous form.  How do I specify this through the DoCmd.OpenForm arguments?  Currently I have the following code, but it is not working:
Form 1:
    Dim whereClause As String      
    whereClause = "SELECT * FROM qryInvoice WHERE tblInv.InvDate Between #" & txtStartDate & "# And #" & txtEndDate & "#" & ";"
    DoCmd.OpenForm "frmInvoiceFax", acNormal, , , , , whereClause
Form 2:
public Sub Form_Load(args As String)
    MsgBox args
    lstInvoice.Rowsource = whereClause
End Sub
I know I am not doing it the right way (because it is not working), but I can't actually find how to do it.  Help!
	View 2 Replies
    View Related
  
    
	
    	
    	Jan 20, 2007
        
        I'm going nuts here...can you privide some help.
I'm trying to QUERY an ACCESS database called ARQUIVO and i would like to have from the column EMPRESAS all the DISTINCT records that have the same 'aviacao' in the INDUSTRIA column.
and it goes like this:
Code:<%Set rse = Server.CreateObject("ADODB.Recordset")sSQL = "SELECT DISTINCT empresa FROM arquivo WHERE industria='Aviacao'" rse.open sSQL,con, adOpenStatic, adLockPessimistic, adCmdText%>
But all I get in a 500 error.   
The fact is that if I use "*" instead of "empresa" the query runs but i list all the records with 'aviacao' in INDUSTRIA
I have this SQL query made in ACCESS - that does what I want - but it doesn't rune in mine ASP page.   
SELECT DISTINCT arquivo.EMPRESA, arquivo.INDUSTRIA
FROM arquivo
WHERE (((arquivo.INDUSTRIA)="Cāmaras Municipais"));
Would anyone help on this?  
	View 1 Replies
    View Related
  
    
	
    	
    	Jan 8, 2008
        
        Can you help me? I get the error wrong type of arguments in my  function as follows
Private Sub Command0_Click()
Call ANewDBWithPass("c:BELest", "secret")
End Sub
Function ANewDBWithPass(ByVal tName As String)   '// adds the current date to the name of the database
Dim wsp As Workspace
Dim db2 As Database
Set wsp = DBEngine.Workspaces(0)
If Right(tName, 4) = ".mdb" Then
' Remove .mdb from the name
tName = Left(tName, Len(tName) - 4)
End If
' Add date and extension
tName = tName & Format(Date, "dd-mm-yyyy") & ".mdb"
' Create database
',Set db2 = wsp.CreateDatabase(tName, dbLangGeneral)
Set db2 = wsp.CreateDatabase(tName, dbLangGeneral & ";pwd=" & strPassword)
db2.Close
End Function
	View 3 Replies
    View Related
  
    
	
    	
    	Aug 18, 2014
        
        I have a python script "runAll" that takes two arguments: processID (the primary key of one table as a string) and a filename (a full file name path as a string).
Is it possible to run a python method with arguments from inside a VBA script (activated by a button press)? 
My python script is called XMLGenerator.py, and the method I want to run is called runAll(processID,filename).
	View 4 Replies
    View Related
  
    
	
    	
    	Dec 18, 2012
        
        I have a database to monitor incoming emails from our contractor & my superior wants it to have control like the following situations:
1. If no respond yet, to calculate today's date minus received date
2. If responded, to calculate respond date minus received date
 
If i use the following expression, it does not relate to if the emails have no respond yet or have been responded.
 
IIf(IsNull([Reply Date]),DateDiff("d",[Due Date], Now()))
	View 4 Replies
    View Related
  
    
	
    	
    	Jan 24, 2008
        
        Is there a command line argument to open AND close a db? I am running a schedule task to open a db which has an autoexec macro but I don't want the db to stay open after running the macro. Or is there a close db function in a macro? I see close form but not db.
	View 2 Replies
    View Related
  
    
	
    	
    	Apr 22, 2014
        
        I have a after update event that will match the written record  with any exist record in a table in the field "OrgName". If it doesn't find exact match, will call a function with a "soundex" algorithm to see if there is only a misspelling or another name altogether. 
In the afterupdate event, I have a string called strOrg (wich is the name I want to compare). 
I have the soundex function in a module, so I can use it for several form generally.
What I want is to pass the strOrg to the soundex function, however I don't know how to declare the variables. however I keep having this error:
"compile error: Argument not optional"
and goes to the line tagged as 1 in the private sub afterupdate
The afterupdate sub is the following:
Code:
Private Sub tOrgName_AfterUpdate()
Dim strOrg As String
strOrg = Me.tOrgName.value
If IsNull(DLookup("orgID", "torg", "OrgName = '" & strOrg & "'")) Then
 resMsg = MsgBox("This organization name is not in the list. If you want to look for similar names press YES, if you want to register a new organization press NO.", vbYesNoCancel, "Organization not found")     
[Code] ....
and the soundex function is declared as 
Code:
Public Function Soundex(strOrg As String) As String
Dim Result As String, c As String * 1
Dim Location As Integer
	View 3 Replies
    View Related
  
    
	
    	
    	Oct 9, 2014
        
        I am getting something wrong but I don't know what - date related.
Take this code for example:
Code:
Dim varDate
varDate = Date
If DCount("RunningNumber", "AllocatedVehicles", "ServiceDate=" & varDate) > 0 Then
MsgBox "Go Away", vbOKOnly
Else
Go on and do the real work
End If
End Sub
The DCount line is being completely ignored, no error message, it just cracks on as though there were no records found (but they are definitely there!) I have tried:
Code:
Dim varDate
varDate = Date
If DCount("RunningNumber", "AllocatedVehicles", "ServiceDate='" & varDate & "'") > 0 Then
MsgBox "Go Away", vbOKOnly
But that throws up a Type Mismatch (which is what I would expect). Then I tried
Code:
Dim varDate
varDate = Date
If DCount("RunningNumber", "AllocatedVehicles", "ServiceDate=#" & varDate & "#") > 0 Then
MsgBox "Go Away", vbOKOnly
And it gets ignored again.
I am having similar trouble trying to open another form using the same field as the open argument, and getting similar results, so it is clearly me that is wrong.
	View 7 Replies
    View Related
  
    
	
    	
    	Jul 1, 2013
        
        Access 2010
 
I am trying to check for when a user trys to enter a duplicate number.
 
The control that I am checking is in a subform on the main form:
 
Main: frmCandidateInfo
Sub: frmTestInfo
 
Control on the subform is: RankOrder
 
I am trying to check the control entry against the table entry:
 
Table: tblTestEvents
Field: RankOrder
 
Here is what I have:
 
Code:
Private Sub RankOrder_BeforeUpdate(Cancel As Integer)
    Dim lngRankDup As Long
    lngRankDup = Nz(DLookup("[RankOrder]", "tblTestEvents", "[RankOrder]=" & Forms!frmCandidateInfo!sfTestInfo!Form!RankOrder, 0))
    If lngRankDup <> 0 Then
        MsgBox TestEventID & " already exists in the database"
    End If
End Sub
I know that the error is due to the argument not being correct, but I am not sure how to fix it.
 
I have tried:
Code:
    lngRankDup = Nz(DLookup("[RankOrder]", "tblTestEvents", "[RankOrder]=" & Me.RankOrder, 0))
Code:
    lngRankDup = Nz(DLookup("[RankOrder]", "tblTestEvents", "[RankOrder]=" & [RankOrder], 0))
Code:
    lngRankDup = Nz(DLookup("[RankOrder]", "tblTestEvents", "[RankOrder]=" & Forms!sfTestInfo!Form!RankOrder, 0))
But nothing seems to work.
	View 3 Replies
    View Related
  
    
	
    	
    	Mar 17, 2006
        
        Before attempting to create a VBA User Defined Function that will accept arguments for creating UPDATE/INSERT INTO SQL statements, I thought I would check to see if some already exist.  It seems like a very tough task to tackle.  I'd like it to determine the data type of the the values being placed into the specified fields and subsequently provide the appropriate syntax.  (i.e. '" & mString & "', #" & mDate & "#, etc.)  Do any exist?
I'm working with MS Access 2003.
Thanks,
Steve G.
:confused:
	View 1 Replies
    View Related
  
    
	
    	
    	Mar 17, 2006
        
        Before attempting to create a VBA User Defined Function that will accept arguments for creating UPDATE/INSERT INTO SQL statements, I thought I would check to see if some already exist.  It seems like a very tough task to tackle.  I'd like it to determine the data type of the the values being placed into the specified fields and subsequently provide the appropriate syntax.  (i.e. '" & mString & "', #" & mDate & "#, etc.)  Do any exist?
I'm working with MS Access 2003.
Thanks,
Steve G.
	View 1 Replies
    View Related
  
    
	
    	
    	Jun 4, 2007
        
        I have a table that holds the names of locations and a count for each location. example below
LocationCount
INR100
INR16
MTU245
MTU123
INR300
RVO1234
TC45
TC188
The table is always changing and I need to create a query in code that sums the count, grouping for each location. These values will need to be stored in a dynamic array for further processing. How do I store this query value into a dynamic array. 
array would need to store these values
(INR, 316)
(MTU, 368)
(RVO, 1234)
(TC, 233)
   
Thanks in advance
	View 2 Replies
    View Related
  
    
	
    	
    	Mar 16, 2005
        
        Hey, is there a way to get the full list of tables in the database by using VBA? I am trying to do a backup function, where I want the database to fetch all the table names and put them into an array, to export them one by one to the backup file........hope you guys understands me.....thanks in advance
	View 2 Replies
    View Related
  
    
	
    	
    	May 31, 2005
        
        Hi all, 
I have a table with multiple records per individual.. 
I need to search through all of their results to flag up those in a query that do not match the approved list..
what is the best way to do this?
I am trying a recordset loop but am struggling a bit...
here is my code so far
Private Sub Command0_Click()
  Dim rst As DAO.Recordset
  Dim dbs As DAO.Database
  Dim strSQL As String
  Dim strPscale As String
  
  strSQL = "SELECT Eng_Speaking, Eng_speaking from qry_Sub1_crosstab_Crosstab;"
  Set dbs = CurrentDb
  Set rst = dbs.OpenRecordset(strSQL)
  Me.Text1 = ""
  
  Do While Not rst.EOF
    strPscale = rst.Fields("Eng_Speaking") & ";"
    
    
   rst.MoveNext
   
Loop
    Me.Text1 = strPscale
Set rst = Nothing
End Sub
but I need to somehow incorporate an array into this to check the score...
any ideas?
ta 
John
	View 4 Replies
    View Related
  
    
	
    	
    	Dec 27, 2006
        
        I have built the first part of a table analyser into one of my projects as below:
It lists a complete list of tables except system tables for the db being assessed and writes all the table names to a table then the table properties, the fields plus there properties And relasionships and Indexes.
The Idea behind this is When I build a system I always use a frontBack Arrangement and versions within my management system.
there are always two Datafiles one the working datafile where the changes are made during design and the production model used by the users which is the one that will need to be updated by this tool.
The problem I'm having is I don't need to store all the field properties within the tables as a lot wont be used for updating the production model.
So I've been looking at ways I can generate a list of property names that I want stored so when my code loops through the properties list it can before writing the property name and value to the table check it against a list.
My question is would it be better to use an array or enum so I could check for an item and how could I best achieve this as I've not used enums before and I'm not that good at Arrays but there's more help there.
I have in the past used a list like: Prop1,prop2,prop3 which I then check using instr like instr("Prop1") which will return a start position so I know it's in the list but I think this is a bit messy so want to make the improvements
Any help would be much appreciated
mick
	View 2 Replies
    View Related
  
    
	
    	
    	Jan 4, 2007
        
        Hi, am new here and need a hand
i'm stuck on part of a program where  i have a form which has two look-up lists (both looking up names of towns from the same table) and there is also a  text box (called distance), which after choosing the town names from the look-up lists, should get the distance between the two towns from the array (in VBA).
thats where i have a problem, for now i have two towns (planning to have probably around 20 maybe more in the future), and something in the array isn't working
below is a link to a zip with that part of the array 
i would be really grateful for any help, as i don't have a clue what went wrong
cheers
	View 2 Replies
    View Related
  
    
	
    	
    	Jan 29, 2007
        
        Hi, totally new on MS access. Is it possible to solve this following task in Access. (using it in Excel today)
Ex.
2d table?
         Prod 1        Prod 2       Prod 3
Prod 1   0              10            20
Prod 2  10              0             30
Prod 3   20            30             0
Question 1: What did you just create?
Answer: Prod 1
Question 2: What will you create?
Answer: Prod 3
Then Access will show 30.
Probably explaning it bad but hope you understand and can answer me if this is possible to solve in Access....
The mission is to create a database with setup times between diffrent products, and make it possible to ask a question to get the answer.
/Martin
	View 11 Replies
    View Related