Modules & VBA :: Compile Error - User-defined Type Not Defined
			Apr 20, 2015
				I copied some VBA from one database to another.  I didn't change anything and I am able to run it fine in the first database.  But in the DB I pasted it to, I am received a Compile Error message with the XlApp As Excel.Application area highlighted.
 
Function OpenAutoCount()
    Dim xlApp As Excel.Application
    Dim xlWB As Excel.Workbook
    
[code]...
	
	View Replies
  
    
	ADVERTISEMENT
    	
    	Nov 9, 2005
        
        Hi,
On Compiling my assecc database VB code I get the following error message "User defined type not defined". I understand it is beecause I have not declared the Variable Type, but have no idea to exactly which part of the code the error is referring to.
How do I find out WHICH User defined type is not defined, especially when I have not got any (or do not want to use any) user defined types?
Thank you in advanced programming wizards. Kind regards, Adam.
	View 14 Replies
    View Related
  
    
	
    	
    	Feb 10, 2014
        
        I have a line of code in an old program:
Dim CN as ADODB Connection
This is giving me the error 'User defined type not defined'.  I know I have to set something in a list somewhere but have forgotten how to do that. Where to go, and what to set?
	View 1 Replies
    View Related
  
    
	
    	
    	Oct 15, 2004
        
        Dim XL As Excel.Application
When I try to run this specific line of code an error occurs. It says:
"User-defined type not defined"
 
May I know how to solve this problem?
Thanks a lot
	View 1 Replies
    View Related
  
    
	
    	
    	Sep 27, 2005
        
        I've put in this in a module many times and this is the first time I have gotten an error.  
Dim Conn As ADODB.Connection
When I run the app I am getting a compile error saying "User-defined type not defined".
Anyone have any ideas?
Thanks,
B
	View 3 Replies
    View Related
  
    
	
    	
    	Dec 21, 2014
        
        I have developed a quote form that is working well. I want to print out a Quotation to send to my customer. Currently it shows the Qty, Item ID# and description in the detail portion of report. In the report footer, currently it will print out, Subtotal, Freight and the resulting total. 
  
A problem arose when I tried to add the total weight of the items in a quote to the report form. I get a "compile error...variable undefined" msg when I try to open up the report by clicking a "Print Report" button I have on the form.Here is the code that is highlighted by the error msg. the Undefined variable is dWtTotal n red below. 
 
Private Sub ReportFooter_Format(Cancel As Integer, FormatCount As Integer)
 Me!txtSubTotal = dSubTotal
    Me!txtDiscountValue = dDiscVal
    Me!txtTotal = dTotal
    Me.txtFreight = dFreight
  '  Me!txtTotalWithWork = dWithWork
  '12-21-14 Add Total Job Wt to Report
    Me.txtWttotal = dWtTotal
  
 I feel like I have defined the variable with this code below which is in the first part of the VBC code that occurs when I click on the Print Quote button:
   
    dSubTotal = 0
    dDiscVal = 0
    dTotal = 0
    dWithWork = 0
    dPkgPrice = 0
    dTotPkg = 0
    dDisc = 0
    dVatVal = 0
    dVatRate = 0
    dFreight = 0
    'Added 12-20-14
    dWtTotal = 0
	View 2 Replies
    View Related
  
    
	
    	
    	May 14, 2013
        
        I tried to create a form that recognizes two kind of users and when you log in it shows a different form, reading and seen videos I type something like this (code below) but when run in a click on a button it says....
Compile Error: Variable not defined: In this forum read that you must declare global variables on a Module, so I added this on a Modele Called Modeule1 but also doesnt work.
Option Compare Database
Option Explicit
Public strAdmin As String
Public strUsuar As String
Usuar and Admin are the form that will appear when login as a usuary or Administrator.
Option Compare Database
Option Explicit
Dim NumIntentos As Integer
[code]....
	View 6 Replies
    View Related
  
    
	
    	
    	Oct 23, 2006
        
        Hello,
I have the following code and i don`t know what's wrong 
Private Sub cmdCautare_Click()
Dim strSQL As String, strOrder As String, strWhere As String
'Dim dbNm As Database
'Dim qryDef As QueryDef
'Set dbNm = CurrentDb()
strSQL = "SELECT DOSARE.DosarID,DOSARE.DenumireDosar,DOSARE.CodDosa r,DOSARE.DataDosar,DOSARE.Denumire,DOSARE.Data,DOS ARE.Stadiu FROM DOSARE"
strWhere = "WHERE"
strOrder = "ORDER BY DOSARE.DosarID "
If Not IsNull(Me.txtDenumire) Then
strWhere = strWhere & "(DOSARE.DenumireDosar) Like '*" & Me.txtDenumire & "*' AND" ' "
End If
If Not IsNull(Me.cmbStadiu) Then
strWhere = strWhere & " (DOSARE.Stadiu) Like '*" & Me.cmbStadiu & "*'"
End If
DoCmd.Close acForm, "frmPrincipal"
DoCmd.OpenForm "frmRezultateCautare", acNormal
Forms!frmRezultateCautare.RowSource = strSQL & " " & strWhere & "" & strOrder
End Sub
Here: Forms!frmRezultateCautare.RowSource = strSQL & " " & strWhere & "" & strOrder
The error is the following "Application-defined or object-defined error"
Thanks!
	View 1 Replies
    View Related
  
    
	
    	
    	Aug 19, 2013
        
        Is there a way to retrieve the value of a user-defined type in a query?
Here's the type:
Code:
Public Type ClassRank
    Rank As Integer
    ClassCount As Integer
End Type
I have a function with the following excerpt:
Code:
Function GetRank(strDOD) as ClassRank
...
GetRank.Rank = intRank
GetRank.ClassCount = intCount
...
End Function
In my query I expected to be able to put the following:
Code:
GetRank(strDOD).Rank & " " & GetRank(strDOD).ClassCount
However, Access didn't like the period in .Rank or .ClassCount.
Should I just write two different function to get 'rank' and 'classcount'?
	View 2 Replies
    View Related
  
    
	
    	
    	Nov 17, 2006
        
        hi,
  I am new to this forum and to MS Acess.  i am not a software engineer or in the field of software.  I had to learn as much as i could about MS Acess because of a project i worked on.  I have a standalone MSacess database and one of the forms is giving me trouble when I try to enter a new record
The form is called frm_fragrances and has information about a fragrance.  
the frm_fragrances has 4 fields in it and a sub form.  the sub form has details about the fragrance
In a new record when I enter the 4 fields and attemt to go to the subform which has details about this fragrance I face this error.
an unexpected error haas occurred @2465: application defined or object defined error.
additional information
Active form:<frm_fragrances>
Active control:<txt_VendorName>
Previous control:<frm_fragrances>@Please call the developer for further instructions
I have looked in the FAQ and on this forum for help on error 2465 and cannot find anything to help me.  I can work with forms to an extent but cannot write too much code.
I would really appreciate some help in this matter
Thank you
	View 4 Replies
    View Related
  
    
	
    	
    	Jul 15, 2013
        
         I have quite a few user defined / custom functions which I would like to be available in any new database that I create without have to copy the VBA codes in a module each time. Basically, some sort of add-in that loads on MS Access startup may be (but I am not too sure - never created one). So something that will start with the MS Access Application and not just a particular database. I know excel addins can be copied to the XLStartup folder to achieve something like this in excel, but not sure about Access. 
	View 11 Replies
    View Related
  
    
	
    	
    	Jul 9, 2013
        
        I have a table onto which i would like to add new column based on a set of if statements. (to assign weekly dates)this is only a portion of the code, but when I clicked on run, it gives me "external name not defined error". 
 
Code:
Option Compare Database
Option Explicit
Public Sub AssignWeekly()
'declares weekly column as a new variable
Dim Client_Weekly_1213 As Integer
[code]...
	View 7 Replies
    View Related
  
    
	
    	
    	Sep 20, 2013
        
        I would like to export a table as a text file to a user defined location.
I have it mostly working, but not exactly as I would like. I'm stuck on the user defined location. 
 
I have a Form that contains a subform and two command buttons.
The subform contains the table I want to export as a text file.
The text file has to be comma delimited, no qualifiers.
 
I have the transfertext command in VBA that works perfectly:
 
Code:
DoCmd.TransferText acExportDelim, "My Specification Name", "MyTableToExport", StrDirTemp & "input_" & StrPName & "NameCode" & StrDIAUnFormatted & "d" & ".txt", False
What I'm stuck on is the filepath. The file path changes everytime. So I would like to have either the open dialog box (I've tried many different versions that I found on the web.) or to search by the account name for the folder and place the text file in there.
 
Here is one that is closely working how I want it to:
 
This is a function that I found, that opens a dialog box for the user to select the folder location. It works, but I can't seem to get it to work properly.
 
It prompts, the location, then once you select it and press ok. It will add the folder name to the full file name, and place the file in the default root path. Not the selected folder path.
 
So in the end it will look like this:
 
D:1_MainMyFolderName_MyTextFileName.txt
 
I'm somehow stuck on getting to seperate the file path from the file name, so you it look like this:
 
D:1_MainMyFolderNameMyTextFileName.txt
 
Code:
 
Dim MSg As String
Dim SelectedDir As String
Dim SelectedDirFinal As String
Dim SelectedDirName As String
Dim StrFolder As String
[Code] ....
I think it should be something very easy, that I just need a pair of fresh eyes to look.
 
I've tried the Fileobject, FileFolder method, but can't get the quite work properly.
 
I've also tried wildcard methods as well:
 
StrDirTemp = Dir(StrFolder & StrPName & "*", , vbNormal)
 
But keep throwing up blanks.
	View 2 Replies
    View Related
  
    
	
    	
    	Jan 12, 2014
        
        I am studying error handling. I am using VBA Developers Hand Book and some Google stuff.  I have been over the material several times and cannot find my mistake.  When I click cmdFindState it give me "compile error" " label not defined",and stops at: 
Code:
"On Error GoTo Err_cmdFindState_Click"
Code:
  Private Sub cmdFindState_Click()
   On Error GoTo Err_cmdFindState_Click
  DoCmd.OpenForm "frmChurchesAll"
  DoCmd.ApplyFilter "qryFindState"
  '-----------------------------------------
   ' 51 Vermont
    '------------------------------------------
     DoCmd.GoToControl "ComboState"
[Code] .....
	View 14 Replies
    View Related
  
    
	
    	
    	Apr 13, 2015
        
        I have used the following script to export a subform to excel but it isn't working for a report.
The report name is spelled correctly etc... but the error message keeps saying error 2465 or if I enable the error handler it says application defined or object defined error.
I don't want to have to export the data to a table first, but if I have to then I guess I will have to.
Code:
Sub fFunctionNameExportExcel(ctrl As IRibbonControl)
'print to excel
Dim rst As DAO.Recordset
    Dim ApXL As Object
    Dim xlWBk As Object
    Dim xlWSh As Object
    Dim fld As DAO.Field
    Const xlCenter As Long = -4108
[Code] ....
	View 3 Replies
    View Related
  
    
	
    	
    	Jun 16, 2005
        
        Has anyone ever produced a function to let users, pick their own tab order for a form.
I am thinking along the lines of holding a tab order for each user for each form.
So when a form opens - if a user has saved a tab order the form will adopt it, if the user has never saved a tab order, the sytem default will be applied.
Would this work.
Paul
	View 4 Replies
    View Related
  
    
	
    	
    	Oct 31, 2005
        
        Can anyone help?
Is it possible to have an autonumber that is generated depending on the entry in a particular field?  I'm creating a database to track various enquiries and I would like each enquiry to have a unique number that is preceded by a codenumber that identifies its origin.  For example:
ABC query - 100xxx
DEF query - 200xxx
XYZ query - 300xxx
(xxx denotes the autonumber part)
This way a particular query can be identified just from its number without having to interrogate the main record.
Can it be done?  I've searched other posts and not found quite what I'm looking for.
(If not then no probs - I'll think of another way!)
Thanks in advance
	View 2 Replies
    View Related
  
    
	
    	
    	Sep 2, 2004
        
        I have a combo box that the user can select a value and the form will display that record on the form. This all works fine, but if the user dosn't enter anything in the combo box, it does not work. Is there a way to have it work if the combo box is left empty?
Thanks in advance - John
	View 1 Replies
    View Related
  
    
	
    	
    	Nov 2, 2004
        
        I am trying to get the list of all user defined tables from the Access database. 
If I use the following query in Access it's working fine and getting the result. But if I am trying to execute the query in ASP page, it's not working. I am getting an error ([Microsoft][ODBC Microsoft Access Driver] Record(s) cannot be read; no read permission on 'MSysObjects'.)
Can u please tell me the reason. 
SELECT MSysObjects.Name AS TableName
FROM MSysObjects
WHERE (((MSysObjects.Type)=1)
AND ((MSysObjects.Flags)=0));
Note: If you have anything, to extract user defined tables, please tell me. Either one works out for me.
	View 3 Replies
    View Related
  
    
	
    	
    	Oct 3, 2006
        
        HI,
I have a query [CustomerOrdersByDate] that requests user input for [CustomerID], a 'Start Date' and an 'End Date' for the [OrderDate] field.
the Report works fine, however I'd like it to be able to take the Start & End dates the user has inputted when running the report, and make it appear in the Report header
e.g. Orders Received from [CustomerID], Between {user defined}[Enter Start Date] And {user defined}[Enter End Date].
I have added a text box to display the results and played around with a few different expressions, etc... unsuccessfully so far, and as I'm not up to working with VBA code, I would appreciate some help!
	View 2 Replies
    View Related
  
    
	
    	
    	Feb 7, 2008
        
        Hello,
Is there any way of creating a user defined query/ report based on fields in a table? Basically we want a report to be generated based on whatever fields the user enters. So, say we have 30 different fields in a table, the user gets to click on a button that gives them the option to create a report that includes: field1, field2, field3 and where field10 = Blue. 
Is this possible to do?
	View 1 Replies
    View Related
  
    
	
    	
    	Apr 16, 2008
        
        I want to run an activity query (i.e. objective is to check which data lines have changed) within a user defined date range. Please advise what is the most efficient way to achieve this.
Is it possible to run such a report without having a date column i.e. does Access have a hidden line modification date that can be used in a search?
Look forward to your feedback - thanks!
	View 2 Replies
    View Related
  
    
	
    	
    	Apr 17, 2008
        
        Hello all, im new here so hi to everyone.
Im stuck! I am pretty much a novice when it comes to access and have been given the task or creating some reports to stop us doing it manually.
Within a query, I have a date column which we would currently enter the following into the criteria:
Between #01/01/2008# And #31/01/2008#
for the month of January.
What i want to be able to do (and i know is possible as ive done it in the past but cant remember how) is have a pop up when the query is ran to enter the Start date and End date. I remember it being something to do with square brackets but cant get it to work.
Help please! lol
	View 14 Replies
    View Related
  
    
	
    	
    	Nov 16, 2004
        
        Please advise, how do I set up a form for this:
Based on one particular report style, have multi select criteria to produce user selected criteria
based on selections from a. Interest, b. State,  c. Type
Report 1. sorts on Interest, 2. sorts by State, 3. sorts by Type ... and each report includes selections of the other 3 selections plus basic data common to all.
Plus, the Interests have a table where the main interest data is stored in a ContactInterest table, while the specific interest selections, per contact, are stored in the Contact table as Interest_1 through Interest_20.
In the Report, when it is sorted by Interest, while I have a concantated output for 5 of the selections, they also, want to sort alphabetically by the interest selections (which changes per Contact).
There is already a form for printing reports that are more static, and I wanted to add these selections on that form, perhaps as a subform, to allow printing of the reports, mentioned, and associated mail labels to the targeted addresses per group.
Any help, direction, guidance, or redirection would really help and is MUCH appreciated. I've tried many options, and as a newbie, have not yet found a solutions- or solutions. 
Thank you so much. (time is of the essence and my skills are small so far.)
__________________
	View 1 Replies
    View Related
  
    
	
    	
    	Sep 16, 2012
        
        I have a database that creates many forms based on queries which are based on user-defined variables. These are permanent variables added directly in the query, such as "if an employee is late 4 times in a month, we yell at them." I would like to be able to change this to "5 times in a month" if the users want to.
Rather than waiting for that to happen and having to change all my queries, i want to set up a form for them to access and edit the variable, save it, and then my queries to reference that variable.
My question is what is the best way to store and reference them? I could create a table, but i am not too sure how easy it would be to make my queries work with that. 
I could also add them onto my main form which is always open, but I'm not sure how to make them save when access is closed. (a quick trial from my variable form won't let me update either a text box or label value on the main form).
	View 5 Replies
    View Related
  
    
	
    	
    	Dec 5, 2006
        
        Hi all,I'm trying to attach some table from a Sql Server database, but when I take a look to the content, I see all the fields filled by the value "#CANCELLED".I supposed that the matter of such an issue could be the datatype used for some  fields, a user-defined datatype. The only table content from the same Sql Server database I can see does not use that data type. I'm using a read-only account to access the Sql Server database. If I try to import the table, the data are imported correctly and the user-datatype is converted to text.Any suggestions for a solution / workaround ?Thanks Bye
	View 4 Replies
    View Related