Modules & VBA :: How To Get Query Output Into Variable
			Mar 15, 2015
				I want to get the output of a vba query (only one solution possible) in to a variable but the variable stays empty.
Dim rst As DAO.Recordset
Set rst = CurrentDb.OpenRecordset("SELECT info FROM evaluationtable WHERE evaluation= " & evaluationchoice & " ")
var = rst(0).Value
rst.Close
some explination: evaluation  and info are fields of evaluationtable evaluationchoice is a field in an accessform where I can choice a value from the evaluation field
the table is build as this (only two fields)  evaluation - info
	
	View Replies
  
    
	ADVERTISEMENT
    	
    	Jul 1, 2015
        
        How could i get output of a Query in a VBA variable ?? I'm trying as below butIi'm getting error:
Dim output As Integer
vari = DoCmd.OpenQuery("qryCompare", acViewNormal, acReadOnly)
Output of a query is a single MAX value.
	View 4 Replies
    View Related
  
    
	
    	
    	Sep 30, 2014
        
        Im trying to output my VBA code to a report.
 
Here is my code:
 
Code:
Dim strEmployeeName As String
strEmployeeName = EnUsername
DoCmd.RunSQL "SELECT StrConv(Replace([sUser],""."","" ""),3) AS Employee, TimesheetTable.Activity, TimesheetTable.Hours, TimesheetTable.Description, TimesheetTable.[Task Date], TimesheetTable.ProjectRef " & vbCrLf & _
"FROM TimesheetTable " & vbCrLf & _
"WHERE (((StrConv(Replace([sUser],""."","" ""),3)) Like """ & strEmployeeName & """) AND ((TimesheetTable.[Task Date])>=#" & [Forms]![DateSelection_Frm]![txtWeekCommencing] & "# And (TimesheetTable.[Task Date]<= #" & [Forms]![DateSelection_Frm]![txtWeekEnding] & "#)) AND ((TimesheetTable.ProjectRef) Not Like ""CENG*""));"
And my report is called TimeReport.
	View 1 Replies
    View Related
  
    
	
    	
    	Jan 29, 2015
        
        I have a query that randomly selects records from my table:
SELECT TOP 6 *
FROM SM_Import
ORDER BY rnd(INT(NOW*id)-NOW*id);
I would like to loop through those results, and create emails
I can get one email formed (displayed) with the code below but don't know how to get both working together to display the (6) emails:
Private Sub Command3_Click()
Dim ol As Object
Dim CaSubject As String
[Code].....
	View 4 Replies
    View Related
  
    
	
    	
    	Mar 24, 2014
        
        The user will select two dates. Start and End date. The user will hit the run button and the application will read an excel file with employee data and only display/output the records within that date range selected (employment date).
 
Code:
Option Compare Database
Function DeleteTable()
'Delete old records from AllEmployeesData table
On Error GoTo DeleteTable_Err
 
[code]....
I am not getting the query displayed on the datasheet after it is done executing. It's just a blank sheet. Also the output file is just this:
 
Code:
ssn
last
mi
first
employ
I did a quick query test using SQL in Access and it worked fine there. I am guessing my error is somwhere in this section:
 
Code:
'--Display query result on Datasheet and Output query to text file
With db
Set qdf = .CreateQueryDef("NewHireQuery", strSQL)
DoCmd.OpenQuery "NewHireQuery"
.QueryDefs.Delete "NewHireQuery"
End With
db.Close
qdf.Close
Set qdf = Nothing
 
[code]....
	View 5 Replies
    View Related
  
    
	
    	
    	Nov 12, 2014
        
        Any code that stops the vba from running if an 'output to' function is null. I've found some code using the DCount function but I'm struggling to adapt this to multiple excel outputs.
I'm sending 5 excel files via E mail to several addresses and I'm wanting to identify if the first file has records, currently using access 2010.
	View 5 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
  
    
	
    	
    	Oct 3, 2014
        
        This code runs fine the FIRST time, however trows up a message the SECOND time it is run. 
The error is on the line ".Range"
I am trying to sort records which have been exported to Excel.
Dim LR As Integer
LR = 5
Set xlApp = CreateObject("Excel.Application")
xlApp.Visible = True
Set wbRef = xlApp.Workbooks.Add
With wbRef
wbRef.Activate
        .Worksheets("Sheet1").Activate
        With ActiveSheet
            .Range("A2", .Cells(LR, "O").End(xlUp)).Sort Key1:=.Range("C2"), Order1:=xlAscending, Header:=xlYes
        End With
end With
	View 3 Replies
    View Related
  
    
	
    	
    	Sep 19, 2013
        
        I have a form in which am gathering information from the user to populate a table(Customer Master List) and at the same time (btn_Copy_Click Event)transferring the info to another form(Case) populating another table(Customer_Call).  It is working fairly well, My issue is that before transferring the info I need to run a check(SQL Query) to make sure the customer or actually the Well ID don't exist in the Customer_Call table. I am trying to do this in pieces .....
1) capturing the well_Id in a variable(WellID) in the first form and using that to build the sql string and query the Customer_Call table.
2)once that works place it in a if / else clause to copy or not with appropriate messages
With that I am stuck in step 1
It works up until  Set rst = CurrentDb.OpenRecordset(strSQL) the i get Run-time error '3061' Too few parameters. Expected 1.
Code:
Dim WellID As String
Dim strModel As String
Dim strSQL As String
Dim rst As DAO.Recordset
WellID = Forms!f_Customer_Lookup.Well_ID
MsgBox WellID ' testing to see if it picks up the correct box in form
strSQL = "SELECT Customer_Call.[Cus_Well_ID] " & _
"FROM Customer_Call " & _
"WHERE Customer_Call.[Cus_Well_ID] = WellID;"
    Set rst = CurrentDb.OpenRecordset(strSQL)
    strModel = rst!Cus_Well_ID
    rst.Close
    MsgBox rst ' Testing to see if the strSQL captured the data
    Set rst = Nothing
End Sub
	View 8 Replies
    View Related
  
    
	
    	
    	Oct 10, 2013
        
        I have a query
Code:
Select distinct [tbl_DTP/CTP].id_zlecenia, [tbl_DTP/CTP].Folia_na_lakier_UV, [tbl_DTP/CTP].Wykrojnik, [tbl_DTP/CTP].Makieta, [tbl_DTP/CTP].Matryca_do_tloczenia, [tbl_DTP/CTP].Matryca_do_zlocenia, [tbl_DTP/CTP].kalka, tblGoraZleceniaRoboczeLaczenie.NumerZlecenia from [tbl_DTP/CTP] inner join tblGoraZleceniaRoboczeLaczenie on [tbl_DTP/CTP].id_zlecenia = tblGoraZleceniaRoboczeLaczenie.NumerZlecenia  where tblGoraZleceniaRoboczeLaczenie.NumerZlecenia = r1;
Where "r1" is a public variable as string.The variable has value e.g. "10/145" But query can't get this value and all the time ask about value from "r1" :/
	View 3 Replies
    View Related
  
    
	
    	
    	Aug 20, 2014
        
        I look at a lot of files to see when they were last updated. I wanted to write a generic procedure to manage that so ..
 
Code:
Public fDate As Variant
Public vField As String
Public vFile As String
 
'GTSdata    
vField = "txt_gts_data"
[Code] ....
What I hoped Me.vField would do is update the date field [txt_gts_data] on my form with the date the file was last saved.
i.e. me. txt_gts_data = fDate
 
What actually happens is the variable vfield gets updated from "txt_gts_data" to 19/08/2014 then later code falls over because the fieldname is lost .
 
Me.[vField] corrects itself to me.vField (and does not work)
Me!vfield falls over (cannot find the field vField, not surprising J)
 
How do I say update the contents of the variable, not the variable itself?
	View 7 Replies
    View Related
  
    
	
    	
    	Jul 22, 2013
        
        I am currently trying to create an update query (building a SQL String in VBA for a command button click event) to update a variable's value into a table.  
Basically, there are 2 tables, displayed in 2 sub froms within the same main form. (OldTable and NewTable for arguments sake)
The basic method I want to implement is that a user highlights a record in the subform of "NewTable". (This value is stored as a variable "NewJPNUM" This value is then to be inserted into the highlighted row (or rows) of table OldTable on command button click.
So the basic idea is a user highlights a row in one table and this value is stored as a variable "NewJPNUM" . The user then highlights a row or rows in "OldTable" and the value from variable "NewJPNUM" is then written to field "NewJPNUM" in "NewTable" on command button click.
I am not experienced with Access but have decent experience in Excel / VBA so not really sure of best practice methods etc. 
	View 3 Replies
    View Related
  
    
	
    	
    	Jun 1, 2014
        
        I have made this sql statement in VBA where rubriek = a variable but I dont know how to implement a variable in a nested query.
SELECT "rubriek, SUM(verkoopprijs) as prijzen
FROM voorwerp
(inner join VoorwerpInRubriek on voorwerp.voorwerpnummer = VoorwerpInRubriek.voorwerp)
inner join Rubriek on rubriek.rubrieknummer = VoorwerpInRubriek.rubriekOpLaagsteNiveau  
where rubriek in (select rubrieknummer 
                      from rubriek
                      where rubriek = variable name
                      )
group by rubriek"
Do I have to treat it as a normal select query or is there something speical that I have to do ?
	View 5 Replies
    View Related
  
    
	
    	
    	Sep 6, 2013
        
         There are two forms to be filled out on Access. One (maybe two) come from our Contractor. They will input the Bill of Materials, Scrap Rates, Inventory Turns and Cost. This goes to a non-official Bill of Materials table. The second form comes from our Supplier. They will input the the cost they charge the contractor for the given Bill of Materials. Access runs a report that will automatically compare the Contractor costs with the Supplier costs for each component on the Bill of Materials. If the component costs match, it will highlight the Contractor cost green, it they do not, it highlights red. 
If all numbers are green, I hit the "Approve" button on the report and there are three queries that need to be ran. An Update Query that changes all the statuses for the components from "Unapproved" to "Approved", an Append Query to add the Bill of Materials to our official table, and a Delete Query that removes the components from the unofficial Bill of Materials table. Once this is all done, an e-mail needs to be sent to Finance to roll costing for the SKU. I do not know the best way, but I currently am having getting the Code to do the following: 
1. Put the specific SKU in the e-mail, which is variable. 
2. Change the Criteria of the Queries so they only run for the specific approved sku 
3. Get the "Approve" and "Deny" buttons on the report to only function for the specific SKU. 
Currently all the SKUs that are in "Unapproved" status show on the report. Once I hit approve, it wants to approve all the SKUs, not just the one I'm looking at. 
Code:
Sub Command36_Click()
'''Current Issue: Need Query Criteria to be SKU specific''' 
'Update Query to change BOM status to "Approved" 
DoCmd.OpenQuery "(2302) BOM - 3PM Entry Query Approved", acViewNormal, acEdit
[code]....
	View 2 Replies
    View Related
  
    
	
    	
    	Jan 20, 2014
        
        I have a query which returns a list of reports I have created this session.  
I want a button that when I click it runs the query and then stores the results into a variable.  
I looked online and found a pretty good connection code and loop code to get the data but I'm having a hard time getting it to store into a variable.
What I want to do next is using code print the reports that were listed in the query.  
That Means I need to be able to take that variable and pop the information off it, storing it into another variable (or if i can use an array just use that) and use that to concatenate into a command to print that report.  
I am having problems with the syntax of this though.  I think I'm just missing some key elements.
	View 3 Replies
    View Related
  
    
	
    	
    	May 6, 2015
        
        I am using Access 2013. I have the ability to pull a selection from a listbox. I can create a Select Sql string using that variable
 
sql As String, strCompany As String, strWhere As String
strCompany = strCompany & Me.lstResource.Column(0, varItem)
strWhere = "[Company name]=" & "'" & strCompany & "'"
sql = "select * FROM tblResources WHERE " & strWhere
 
From here I have trouble. I see lots of examples to run an active query but not much on a select query. I have tried a number of things with no success. How to use this select statement to actually run against an existing access table? I am not putting it into a form or report at this time, just running the query to check results. 
	View 1 Replies
    View Related
  
    
	
    	
    	Aug 10, 2015
        
        I am looking for the vba to have a query cycle through using records from another query as the parameter run and export for each of the records on the second query. 
Table 1 has information with all clients
query 1 has x, y, z being pulled > client used as parameter
query 2 has the list of clients
Currently I have the coding to run the query and export however I am not sure how to get it to repeat for each client. 
Code:
Private Sub CmdInternalReports_Click()
Dim xlApp As Excel.Application
    Dim rstDetails As DAO.Recordset
    Dim strTab As String
    Dim strDir As String    
    Set xlApp = Nothing
    Set rstDetails = Nothing
[code]...
There can be upto 70 different clients or as little as 2 depending on the day. So the Query I have takes a list of the clients that receive the report and runs it against the imported table to only give the ones with data day.
PHP Code:
tblClientReport.Distro 
Is where I have the report via client name linked the the distro list that should be pulled.
	View 14 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
  
    
	
    	
    	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
  
    
	
    	
    	Jan 30, 2015
        
        My access is 2013.
Suppose there's a simple query which has two fields, "year" and "graduates", where "year" can be grouped by "2012",  "2013", etc and "graduates" are individual names.  
How can I export the list of graduates to multiple excel files, with the filename based on "year"?  
I have tried to set the output file in macro as "c:desktop" & query.year & ".xls"
But it's not working and the output filename is exactly "&query.year&.xls "and the file contains all year and all names.  
	View 14 Replies
    View Related
  
    
	
    	
    	Aug 5, 2014
        
        I am trying to set up something to be able to take me to a folder that holds various forms for personnel.  I have a query that generates the link for each person.  I have tried to set it up as a hyperlink in ACCESS 2013 and it displays as one but doesn't act like one.
 
I want to be able to click the link and have it open up a personnel folder for that individual.  I can't find a MACRO that I can create to do it.  Example of my query is that it creates a link K:Main BreakdownSection BreakdownPersonnel FoldersName and the name is the variable part.
 
My next problem will be to have it create that folder when we have new personnel arriving.
 
I would also note that I have not worked with ACCESS in many years and much of what I was able to do with 2002 and 2003 doesn't work with the newer versions of ACCESS.
	View 3 Replies
    View Related
  
    
	
    	
    	Feb 27, 2015
        
        The following SQL statements run with no errors, but I can't see the output of the SQL statements.  What is wrong with my "Debug.Print" or "rs" statement ?  I would like to see the results.  The SQL statements works when I save them to a query.  
Dim db As DAO.Database
Dim rs As DAO.Recordset
Rem Dim intResult As Integer
Dim strSQL As String
Set db = CurrentDb
[Code] ....
	View 4 Replies
    View Related
  
    
	
    	
    	Jan 12, 2014
        
        I'm using the following command to output a form as a PDF
DoCmd.OutputTo acOutputForm, "Frm_RTA", acPDF, outputFileName
outputFileName is a variable I've created for file path / name etc...When I run this command, I get a popup box asking what format I'd like to export / save the form as. I'd like to disable this and just have it save as a PDF.
	View 2 Replies
    View Related
  
    
	
    	
    	Oct 10, 2014
        
        I currently have an invoice report that runs through my database which is e-mailed to clients (automatically through vba), and then saved to a specific file path.
I'm currently having an issue with the saving part of the process with certain clients who have illegal characters in their names - for example, "Client / Other Information" where the '/' is causing the save to fail.
I'm trying to find a way to change the file name of the save file for clients with these illegal characters in their names. I would prefer not to take only part of the name (as some clients are listed as "Town/Village of...") but if there is no other way then there is no other way.
The code I'm currently using is as follows:
Code:
Dim strFilePath as String
strFilePath="C:Users" & Environ("UserName") & "DesktopNew Invoices" & Me.Client.Value & ".pdf"
docmd.OutputTo acOutputReport, , "PDFFormat(*.pdf)", strFilePath, False, "", 0, acExportQualityPrint
	View 3 Replies
    View Related
  
    
	
    	
    	Aug 8, 2013
        
        I was able to use the UNION ALL qry.  But, when I have another file (like original2) that does NOT have all the columns listed in the UNION ALL qry,  I get a Parameter value box asking for the missing columns when I run the qry.
Example:
original1IDDateGroupChristianJohnnySteve 18/5/2013A1528/5/2013B338/5/2013C2348/5/2013D2358/5/2013E5 
 
original 2IDDateGroupChristianJohnny18/6/2013A212528/6/2013B2338/6/2013C2248/6/2013D22
 
The UNION ALL qry includes all the possible resources ( includes all the possible column fields Christan, Johnny, and Steve). 
When I run the UNION ALL qry with the original2 file, An "Enter Parameter Value" box is displayed with the mssing column name "Steve".
 
Is there a way to Map the original2 table into a working table with all the columns, or use VBA code to construct the UNION ALL qry to only include the existing columns? My data has variable columns and I'm trying to avoid the parameter popups. 
	View 2 Replies
    View Related
  
    
	
    	
    	Dec 16, 2014
        
        I have a query that contains Invoices(usually 2 line items per invoice) Taxable and NonTaxable. I need to able to basically export it to excel on multiple worksheets when the Amount of unique invoice number reaches 15.
From all my scouring on the internet I can't find anything with this criteria.
	View 2 Replies
    View Related