Modules & VBA :: Add WHERE Clause To Query (queryDef)
			Dec 1, 2014
				I have a TRANSFORMED query: 
Code:
TRANSFORM nz(count(T_qa.qaQAPK),0) AS SumOfQAs
SELECT month(qaDate) AS QAmonth, Count(T_qa.qaQAPK) AS QAs
FROM Q_ALL_qa
GROUP BY Month(qaDate)
PIVOT month([qaDate])
IN (1,2,3,4,5,6,7,8,9,10,11,12);
This query is record source for a report, then this report show all calculations in a form.
I have 7 of each (query + report) all showing on the same form.
All those queries calculate data for all departments.
In the form, I have placed a combobox.
What I want is to create a vba code which will add clause WHERE to all queries at the same time and then run it.
Code:
WHERE qaDeptFK=Forms!F_CompLvl.cboDeptStats
However, if nothing has been selected in the combo, I want the queries to calculate data as normal, for all departments.
Where do I place the vba statement? Is it under combobox AfterUpdate event?
I am planning to use this: (As I never done it before)
[URL] ....
Modifying SQL On-The-Fly section
	
	View Replies
  
    
	ADVERTISEMENT
    	
    	Aug 27, 2013
        
        I have a query that searches for records that are between two dates using the WHERE clause. The two dates are referenced to two respective text boxes on a form. On the same form I have a button that will launch the query in VBA using querydefs. I get the error 3061 saying I need to input the parameters. Therefore I am a bit unsure how to set the parameters in VBA. So far I have done this:
Code:
Dim Db As DAO.Database
    Set Db = CurrentDb
Dim QDef As DAO.QueryDef
Dim rst As DAO.Recordset
    Set QDef = Db.QueryDefs("Rqt_F_BrokerageMandate_MF3_TEST")
[Code] ....
Where Date_VL is the field to be filtered. I know this is wrong but all examples I have seen have equated the parameter to a fixed value i.e 30/12/2012 for example, but I want this to be at the users discression. The only way I know of to get around this at the moment would be to write a temp query in VBA with PARAMETERS in the SQL code instead using the method above/
After this I'm going to assign the recordset to a matrix but that's a different story!
	View 10 Replies
    View Related
  
    
	
    	
    	Jun 13, 2014
        
        So I had this code working and then I cleaned it up a little and it no longer works. It should export data from a created query using criteria selected by the user on a form and put it into an excel file that exists. I get no errors but it does not export anymore. After pouring over it for a while checking for mistakes with my form control references and variables I have yet to find anything. I did change my form name and edited the code accordingly after I already had it working, and changed a few form settings but changing them back did not fix the issue. I am not very experienced and stumped since I am not getting error messages.
Code:
 
 'First set variables for the SQL string and CreateQueryDef command
 Dim strExport As String
 Dim qdf As dao.QueryDef
  'Then define the SQL to be exported (Static Response Info by ItemID)
 
[Code] ......
	View 6 Replies
    View Related
  
    
	
    	
    	May 30, 2014
        
        I have this code below which pulls a report based on the current date, I wanted to be able to pull the same report by entering between 2 dates as is done in a query using parameters.
Code:
reworkWhere = "ReworkTech = '" & Me.txt_tech_by_date_techid & "'  And ReworkTimeOut = Date()"
repairWhere = "RepairTech = '" & Me.txt_tech_by_date_techid & "' And RepairTimeOut = Date()"
qcWhere = "QC_Tech = '" & Me.txt_tech_by_date_techid & "' And QC_TimeOut = Date()"
strWhere = reworkWhere & " Or " & repairWhere & " Or " & qcWhere
DoCmd.OpenReport "RPT_RF_TECH_REPORT_UNIT_DAILY", acViewReport, , strWhere
How to make a combo box with the months listed so they can pull this report by the month selected but is a side tangent.
	View 3 Replies
    View Related
  
    
	
    	
    	May 7, 2015
        
        I have a form with 3 combo boxes that filter another form/report.  The first combo (cboByCategory) contains options from 2 different fields within the same table. Before I added this add'l piece of code, all 3 combos worked fine.  I am not getting error messages, it just does not filter on the other 2 combo boxes - cboDiv and cboGender.
Code:
Private Sub cmdModifyRecords_Click()
On Error GoTo Err_cmdModifyRecords_Click
    Dim stDocName As String
    Dim strFilter As String
    Dim stLinkCriteria As String  
   stDocName = "Modify_OpenItems"
 
[Code] .....
	View 5 Replies
    View Related
  
    
	
    	
    	Feb 11, 2014
        
        My question is which method of finding the last record is best, QueryDef or Recordset? Here is my data:
Table:
tbl_module_repairs
Field:
aps_rma
Textbox to insert last record RMA into:
txt_test
Here is some code I tried but get an invalid argument msgbox:
'''''''''''''''''''''''''''''''''
'Opens last RMA into textbox (For opening tag sheet)
    Dim dbs As DAO.Database
    Dim rst As DAO.Recordset    
    'Get the database and Recordset
    Set dbs = CurrentDb
    Set rst = dbs.OpenRecordset("tbl_module_repairs")
[Code] .....
	View 14 Replies
    View Related
  
    
	
    	
    	Jan 19, 2014
        
        Is it possible to add/edit a record from a DAO querydef that has a calculated field in.
Code:
 
Set qdf = db.QueryDefs("qryOutput_" & strDept)
  qdf.Parameters("Enter Date") = dDate
  Set rs = qdf.OpenRecordset()
Using the rs.Edit or rs.AddNew worked fine until I put a calculated field in the query.
The calculated field is just a total of some fields in the table.
I thought this was something to do with dbOpenDynaset but it just keeps having the same error
Cannot update. Database or object is read-only.
	View 3 Replies
    View Related
  
    
	
    	
    	Jun 6, 2013
        
        I'm trying to get an SQL statement to take a value from a combo box in a WHERE LIKE clause.
 
For example:
INSERT INTO tblInspectionTempp (BuildingID, DoorNumber) SELECT tblDoorData.BuildingID, tblDoorData.DoorNumber FROM tblDoorData WHERE tblDoorData.BuildingID LIKE = '[Forms]![fmInspectionColumns]![cmboBuildingID].Value'"
The errors I'm receiving are either Missing Match or incorrect Syntax, depending on my trial and errors methods regarding the WHERE clause.
	View 2 Replies
    View Related
  
    
	
    	
    	Sep 29, 2014
        
        I have an update sql statement that isn't quite working properly. 
My where clause has 3 criteria. 
*print = -1
*stDocCriteria (project_num and client_id)
Below is what the code looks like. 
Code:
updateSQL = "update tblTimedTasks set printed =-1, invoice_date = Now() where print = -1 and " & stDocCriteria
Add watch: so you guys can see "stDocCriteria" 
Code:
updateSQL = "update tblTimedTasks set printed =-1, invoice_date = Now() where print =-1 and ([project_num]= '140012' And [client_id] = 87)"
I want to only updates records that meet all three criteria. The above sql not only updates all records that satisfy stDocCriteria regardless if print is -1(true) or 0(false).
	View 10 Replies
    View Related
  
    
	
    	
    	Sep 18, 2014
        
        I am trying to open a form using the where clause to max of a table field.I cannot get the syntax correct.
Code:
 
 DoCmd.OpenForm "frmInput", , , Max(tblClients.ClientID) AS MaxOfClientID FROM tblClients
	View 4 Replies
    View Related
  
    
	
    	
    	Dec 10, 2014
        
        I am trying to dynamically change the IN sql from within VBA using parameters. for some reason i have no luck, no errors shows up, but it's  actually not picking up the criteria. 
Code:
THE SQL IN STATEMENT
In (select RemID from [ReminderAssignees] Where RemDate between [Date1] and [Date2] And [sDismiss] )));
Code:
THE VBA CODE
    qdf.Parameters("date1") = Date1
    qdf.Parameters("date2") = Date2
    Select Case iDismissed
        Case 0, 1
            qdf.Parameters("sDismiss") = "1=1"
        Case 2
            qdf.Parameters("sDismiss") = "(not isdate(Dismiss) or Dismiss > #" & Now & "#)"
        Case 3
            qdf.Parameters("sDismiss") = " isdate(Dismiss) and  Dismiss < #" & Now & "#"
    End Select
    
    qdf.Execute
	View 6 Replies
    View Related
  
    
	
    	
    	Jul 21, 2015
        
        I would like to open a form to a specific date that is taken from another form.  Date field format is short date and looks like yyyy.mm.dd 
I have figured it out that it only works if date format is yyyy/mm/dd
I know format function can do this, but i do not know how to write the code with correct syntax.
For example i have tried:
DoCmd.OpenForm "TreatmentsTB1", , , "DOV= #"& Format(2015.01.11,"yyyy/mm/dd")&"#"
it does not work.
	View 3 Replies
    View Related
  
    
	
    	
    	Oct 31, 2013
        
        I am having trouble opening Form 2 to the same record as the record in Form 1.  Form 1 is a continuous form of questions.  When certain response is given, I want to be able to add more information to the "additionalcomments" column for that record.  I want to have the additional comments pop up in a new form.
Form 1 is based off of a query with no unique ID.  I need the second form to open on Eval_Number and Question_Number.  I have tried...
Code:
If Me.Response = 0 Then
DoCmd.OpenForm "frmadditionalcomments", acNormal, , "[Eval_Number] =" & Forms!ESVWL1Trainee!subfrmreponses.Eval_Number And [Question_Number] = " & Forms!ESVWL1Trainee!subfrmreponses.Question_Number "
End If
and this tells me the object doesn't support the method.  Is the SQL incorrect?  Is it the way its setup?  
	View 5 Replies
    View Related
  
    
	
    	
    	Jun 16, 2015
        
        I want to that the WHERE clause for a SQL statement that I am using options on a form to build. I intend to use the clause in opening a datasheet form.
This is the code I have for getting the substring
Code:
 
Dim intPos As Integer
Dim tempString As String
Dim BaseQueryFormStr As String 
 'BaseQueryFormStr is used to reopen the BaseMasterQueryFrm with the specified parameters
 tempString = "WHERE"
 intPos = InStr(1, strSQL, tempString, vbTextCompare)
BaseQueryFormStr = Left(strSQL, intPos - 1)
 MsgBox (BaseQueryFormStr)
The value of intPos remains=0 and when the program hits the second to last line I get "run-time error 5"
	View 10 Replies
    View Related
  
    
	
    	
    	Dec 20, 2013
        
        I am trying to calculate annual percentiles of a large set of data and I have only been successful at retrieving the percentile of the entire data set (and not by the grouping).  See provided example database for code/query.  Query1 is what I want to happen to make the Percentiles table.
	View 14 Replies
    View Related
  
    
	
    	
    	Jun 26, 2014
        
        Connecting Access FE to SQL SERVER BE Connection is fine. I can open and close it and other queries work fine. I have only one problem with the SQL in one query
Code:
With rstRPT
If FirstRecord = True Then
.Open "SELECT Min([" & SourceTbl & "].[3Order ID]) AS MinOf3OrderID " & _
[Code].....
 why it wants to see the variable as a column name?
	View 1 Replies
    View Related
  
    
	
    	
    	Aug 25, 2014
        
        Windows 7
Access 2013
I've been trying to work up a where clause that is generated by a button click event on a report.  The workflow that i'm trying to obtain is as follows: 
1) A report is run to determine the remaining work orders that need to be processed. 
2) A button that is placed on that report is to be clicked, taking the user to the form associated with that work order, so it can be processed.
What i've been able to do so far is capture the unique ID for the work order and then print that in a message box.  I can then open the form.
What i haven't been able to accomplish thus far is to open the form to the correct work order.
Things I've tried : I started trying to use the macro with the search for record option and using the where clause. Not successful.  I am a little more comfortable in using vba so i switched to that pretty quickly.
Code:
Private Sub btnJobEntry_Click()
'GOAL: open the work order form to the correct entry
'METHOD: store the uniqueID to a variable, then use that in the open command's where clause
Dim strJobID As String
'store the unique ID in the variable
[Code] ....
I've put the strJobID variable in both the filter and where clause sections of the DoCmd but it just opens the form to the first entry.  I'm fairly confident i'm not applying the filter/where clause correctly by using the incorrect syntax.
	View 3 Replies
    View Related
  
    
	
    	
    	May 10, 2005
        
        why wont my DB reconise this script
	View 3 Replies
    View Related
  
    
	
    	
    	Sep 30, 2005
        
        Does anyone know what a QueryDef Type of 3 is?
If I run the following code, as well as returning all queries in the db, it also returns a few that are of Type=3.
For Each qd In db.QueryDefs
    Debug.Print qd.Name & " - " & qd.Type
Next
For the Type 3 ones, the qd.Name returns something like
~sq_rREPORTNAME     
where REPORTNAME is the name of a report in the database .
However, it's only a couple of reports that appear this way.
Where or what is a Type 3 - even if I view Hidden & System objects I can't see them!
	View 1 Replies
    View Related
  
    
	
    	
    	Sep 26, 2005
        
        Hello everybody,
I'm looking for solution to this. I've already searched in this forum a lot of healines for this problem but none of them really helps me.
I know that We're not suposed to change static Querys and bla bla bla because they static and bla bla bla bla BUT....
the thing is...
I have this form with a lot of filters for a report. I Want to change the join fields and parameters according to what the user chose in the form and then run the report.
The Report Record source property needs to be populated with a query object.
to do that I need to some how load the query and change its sql.
Dim Q as QueryDef
set q = CurrentDB.QueryDef("MYQUERY")
I don't know what property I can use, MS HELP doesn't help actually
when I type "Q."  after the dot the list of properties doesn't show.
Thank you !
	View 1 Replies
    View Related
  
    
	
    	
    	Sep 28, 2005
        
        I am really stuck. I have spent two days searcinh different forums trying to solve my problem. I am trying to create an UPDATE q to my Access database. But I get either the: "Syntax error in query. Incomplete query clause" or "Syntax error in UPDATE query".
First of all here's the URL: www.innotec-as.no/login/Kunder
Login U/P either: "alfen"  or "thomas".
The page opening up shows the user info, U/P and adress.
viewing the information is working perfectly - but editing it..no way.
When editing and submiting the data the above errors occour.
Try that and you'll also see the SQL I am trying to execute.
The CODE is as follows:
         SQLtemp = "UPDATE 'Brukere' SET"
SQLtemp = SQLtemp & " 'navn' = '" & request("Navn") & "', "
SQLtemp = SQLtemp & " 'epst' = '" & request("Epst") & "', "
SQLtemp = SQLtemp & " 'Pass' = '" & request("Pass") & "', "
SQLtemp = SQLtemp & " 'Firma' = '" & request("Firma") & "', "
SQLtemp = SQLtemp & " 'BAdresse' = '" & request("BAdresse") & "', "
SQLtemp = SQLtemp & " 'BPostAdr' = '" & request("BPostAdr") & "', "
SQLtemp = SQLtemp & " 'PAdresse' = '" & request("PAdresse") & "', "
SQLtemp = SQLtemp & " 'PPostAdr' = '" & request("PPostAdr") & "', "
SQLtemp = SQLtemp & "WHERE 'Bnavn' = '" & request("Bnavn") & "'"
Response.Write(SQLtemp)
Response.End()
conn.Execute(SQLtemp)
rs.Update[/COLOR]
The finished SQL statement looks like this:
 UPDATE 'Brukere' SET 'navn' = 'Alf Byman', 'epst' = 'alf@baccara.no', 'Pass' = 'alfen', 'Firma' = '', 'BAdresse' = '', 'BPostAdr' = '', 'PAdresse' = 'sdfg', 'PPostAdr' = '', WHERE 'Bnavn' = 'alfen'
I have tried to user single quotes, doubble quotes, brackets etc. nothing works.
The code I use for connection is as follows:
<!--#include file="../adovbs.inc"-->
<%
dim conn, rs, SQLtemp
' DSNless connection to Access Database
set conn = server.CreateObject ("ADODB.Connection")
rs="DRIVER={Microsoft Access Driver (*.mdb)}; "
rs=rs & "PWD=uralfjellet; DBQ=" & server.mappath("../../../../db/kunder.mdb")
conn.Open rs
I'll be very HAPPY for some expert help on this.
	View 1 Replies
    View Related
  
    
	
    	
    	Aug 3, 2013
        
        Is there a way for a SQL QueryDef object in Access to look up the name of itself in the SQL and return that as a value in the result set? Ex:
Code:
SELECT [foo],
       [bar],
       [something]
       @NameOfQueryDef
FROM [table]
	View 3 Replies
    View Related
  
    
	
    	
    	Jul 19, 2006
        
        Hello
Any hellp would be appericated.
I have a pass thorugh query that connets to a Oracle database with a where clause with a between start date and end date.
I need the start date and End Date to come from a form within MS Access.
Is this possible? if so how do I code the where clause to get the start and end date parameters from the form?
	View 3 Replies
    View Related
  
    
	
    	
    	Oct 13, 2006
        
        I need to append data from Table 2 into Table 1 where the Name and RefID fields in Table 2 have different values to the same fields in Table 1.
Does this make sense?
Ok, more clarification. I have a load of employees in a table (Table 1) They have the fields UniqueID, RefID, and Name.  All links go through UniqueID, the name field has duplicates, and the RefID is the internal employee number and can be null where the 'employee' is a contractor.
Now, I have been handed an updated copy of that table (Table 2) in a spreadsheet.  I need to load in all the records that are new in the spreadsheet to Table 1.  The awkward part is that there is no uniqueID in Table 2.  I cannot delete and reload all because i need to retain the original UniqueIDs in table 1 as they have linked data based on those IDs.
Can someone tell me how I can identify the new records in table 2 and then upload them to table 1.
Cheers guys and girls
	View 2 Replies
    View Related
  
    
	
    	
    	Sep 28, 2007
        
        Morning all, 
Am trying to create a really simple form where the user can select one of five fields, an operator (just =, Not, <, and >)  and the values are pulled from whatever field is chosen. 
I have the form down and can populate the values list based on the field however now i need to use the values in these boxes to create a WHERE clause. 
I'm really new to SQL and have only done a couple of online tutorials but i think im on the right lines? 
DoCmd.RunSQL "SELECT * FROM qryLinkMasterPrimary WHERE " + cboFields.Value + " " + cboOperator.Value + " " + cboValues.Value
Is this even slightly close? I've tried searching the internet and everything i find is waaaaay too complicated for me to get my head round. 
Any help is greatly appreciated
Mike Harkess
	View 14 Replies
    View Related
  
    
	
    	
    	May 18, 2015
        
        I understand I cannot easily run a SELECT * WHERE ...  query in VBA ?
I want to run a simple Select query but use variables from the Form vba for the WHERE clause selections.
	View 14 Replies
    View Related