Modules & VBA :: Filter A Report Via Unbound Form
			Apr 22, 2014
				When I have a value in "WorkCenter" everything works great and graph looks fine. When I leave blank in order to see all records, I get a blank graph.
 
Here's the code:
 
Private Sub Open_Downtime_Graph_Click()
Dim strCriteria As String
If IsNull(Me.WorkCenter) Then
strCriteria = "[WorkCenter] Like '*'"
[Code] .....
	
	View Replies
  
    
	ADVERTISEMENT
    	
    	Feb 10, 2014
        
        I'm trying to hash two scripts I've found into 1 functioning filter, however I'm still relatively new to vba and can't figure out how to get this working.
 
I'm trying to use Allen Browne's Search Criteria:
 
with another snippete of code I found here:
 
Code:
'Purpose:   This module illustrates how to create a search form, _
where the user can enter as many or few criteria as they wish, _
and results are shown one per line.
[Code]....
It's the date part I'm having trouble with, the rest of the search criteria work fine without the date, but I can't get it working when I try to modify and merge the date sections of each code.
 
Also I'm using a listbox for the "Yesterday";"Last 4 days";"Last 9 days" and not a combo box.
	View 2 Replies
    View Related
  
    
	
    	
    	Apr 14, 2015
        
        I am trying to open a report (rptGMX-IRG) that includes a sub-report (srptRG) based on criteria that is set with two unbound fields on a form (frmGMXbook).  This form has two dropdown boxes (cboGMX_No & cboMachSize) and a command button.  The first dropdown box includes data located in the main form and the second dropdown includes data that is part of the sub-report.
 
I can get the report to open properly when I enter data into both fields on frmGMXbook.
 
However, the problem I am having is the inability to have one or both fields be "Like '*'" and show all associated records.
 
Here is the code I have on the command button.
 
Private Sub GMX_Preview_Click()    
    Dim strCriteria As String
    If IsNull(Me.cboGMX_No) Then
        strCriteria = "[cboGMX_No] Like '*'"
    Else
       strCriteria = "[GMX_No] ='" & Me.cboGMX_No.Value & "'"
[Code] ....
	View 1 Replies
    View Related
  
    
	
    	
    	Aug 29, 2013
        
        I have a report [Report1] that gets its data from a query [Query1]. On [Report1] there is an unbound text box [EnterEndDate] that I want to use as a filter for the report criteria, and have it filter the report to show every report row with the value in the [EndDate] field greater than what the user entered in [EnterEndDate].
 
There is no need to save the value used in [EnterEndDate].  It will be entered after the report is run and changed on demand while the report is open for the user to see different date ranges.
	View 2 Replies
    View Related
  
    
	
    	
    	Aug 16, 2014
        
        I am able to filter a data on a continuous form using drop downs and then the following code attached to a cmdbutton to create a report of the filtered data.
Code:
Private Sub Command30_Click()
Dim strWhere As String
If Me.Dirty Then Me.Dirty = False
If Me.FilterOn Then strWhere = Me.Filter
DoCmd.OpenReport "rptconveyorerrors", acViewReport, , strWhere
End Sub
On the same form where I filter the data i can sort it by clicking the headings aswell, however when i generate the report using the above VBA it doesn't take the sort with it and just generates it without the sort.
I am using the following VBA to sort my form
Code:
Me.OrderByOn = True
If Me.OrderBy = "[empname] DESC" Then
    Me.OrderBy = "[empname] ASC"
Else
    Me.OrderBy = "[empname] DESC"
End If
Me.Refresh
I thought it may be possible to use the following sort of VBA to pass the sort however i cant get it to work:
Code:
Private Sub Command30_Click()
Dim strOrder As String
Dim strWhere As String
If Me.Dirty Then Me.Dirty = False
If Me.FilterOn Then strWhere = Me.Filter
If Me.OrderByOn Then strOrder=Me.OrderByOn
	View 1 Replies
    View Related
  
    
	
    	
    	May 27, 2015
        
        I need to add an additional filter to my unbound form and can't seem to get the syntax right - 
I have a text field in my form "[B Style]" that has either a "Y" or "N"
I want to add a checkbox on my main form where, if checkbox=True then [B Style]="Y"
Private Sub ckBStyle_Click()
Dim stFilter As String
Dim stDocName As String
stDocName = "Modify_OpenItems"
If Me.ckBStyle.Value = True Then
DoCmd.OpenForm stDocName, , , ("[B Style]" = "Y")
Else: DoCmd.OpenForm stDocName
End If
End Sub
stDocName is opening but is completely blank.
Incorrect syntax?
	View 1 Replies
    View Related
  
    
	
    	
    	May 2, 2014
        
        I'm trying to figure out how to filter a report using a check box. 
 
I have created a form, which if you push an industry labled button on that form it will show you the report with what work was done for that industry.
 
Now I'm trying to modify it so that I have a group of check boxes; each check box being a different office location the company has. 
 
What I want to make happen is if say out of office A. B. C. and D., A. and D. are checked and I hit the button of a specific industry it will bring me up a report of office A. and D. Combined for that industry.
 
From what I've figured I can create a bunch of reports of all the different possiblities and link those to that senerio, but that seems tedious and ridiculous.
 
Is there a way I can code VBA to do this for me? Or am I going to have to go through the proccess of creating a bunch of different querries and reports beyond what I have now to pull up an industry.
	View 8 Replies
    View Related
  
    
	
    	
    	Apr 16, 2015
        
        I have a text box in a report that was calculated,
  
 =IIf([RemainingGrantFunds]<([Grant_Amount]*0.2),"1","0")
  
 So, if certain criteria are met, either a 1 or a 0 will be shown.
  
 Then in my OpenReport VBA I have,
  
 DoCmd.OpenReport stDocName, acPreview, , "ExpiryTag = 1"
  
 'ExpiryTag' is the name of the text box from above.
  
When it equals 1, I want the report to show those records. I have done this for other reports and it worked so easily, and for some reason it just doesn't want to work on this report. I believe the difference is that the text box is calculated in the report and not in the query (for this report I can not calculate it in the query). I think it might have something to do with the output of the 1 and 0 
  
 i.e. "1" versus '1' or just 1.
  
 I have also tried every iteration of "ExpiryTag = 1" 
  
 i.e. "ExpiryTag = '1'" or "[ExpiryTag] = 1" etc.
	View 4 Replies
    View Related
  
    
	
    	
    	Oct 29, 2013
        
        My code is creating a pdf file that includes everybody's  reports instead of just that faculty member's reports. 
Once I get it to generate the correct reports, I then have to figure out how to automatically email them.
Public Sub something3()
Dim db As Database
Dim rs As DAO.Recordset
Set db = CurrentDb
[Code] ....
One other thing is that I can't get the &".pdf" to work on the end of the filename.
	View 10 Replies
    View Related
  
    
	
    	
    	Oct 25, 2005
        
        I have set up a query to give me details of employees names, the business they work for and where they work.
If I run it without criteria I get all of my records, as you would expect.  
However, I want to be able to select parameters from combo boxes and then run a specific report of employees by location. I did have this working by accident a while ago but have changed quite a lot since then. 
I have set up an unbound form with three combo boxes - Business, Business Unit and Location. Then a button for preview and print report linking to my report template. 
I have refernced the controls in the relevant columns of my query as: [Forms]![FormName]![Control].
When I run the query I get nothing back and I don't understand why.
	View 9 Replies
    View Related
  
    
	
    	
    	May 20, 2015
        
        I have a button that opens a report. The code behind the button builds the filter criteria for the report based on some selections in a list box. 
Code:
DoCmd.openReport "Report", acViewPreview, "", GetCriteria
For VarItem = 0 To Me.List2.listcount - 1
        strCriteria = strCriteria & "([ProjectNo]= '" & Me.List2.Column(1, VarItem) & "' And [ClientID] = " & Me.List2.Column(0, VarItem) & ") Or "        
Next VarItem
    If strCriteria <> "" Then
    strCriteria = Left(strCriteria, Len(strCriteria) - 4)
Else
    strCriteria = "True"
End If
GetCriteria = strCriteria
This is what the filter would look like with values after running the report (taken from filter bar in report properties):
([ProjectNo]= '150002' And [ClientID] = 206) Or ([ProjectNo]= '150003' And [ClientID] = 79)
Problem is that i only get records for ([ProjectNo]= '150002' And [ClientID] = 206). I this seems only filter ONE set of criteria ignoring all the others. What am i doing wrong?
	View 5 Replies
    View Related
  
    
	
    	
    	Feb 25, 2015
        
        I have vba code 
PHP Code:
    DoCmd.OpenReport "MonthlyData2", acPreview, , " YEAR(CourseDate) = '" & Me.txtCourseDateMonth & "' " 
this works sucessfuly how can I add the following to the code so it filters month and year?
 
PHP Code:
'" MONTH(CourseDate) = '" & Me.txtCourseDateYear & "' " 
	View 5 Replies
    View Related
  
    
	
    	
    	Dec 15, 2014
        
        I have a report, on a control tab, on a main form.
On the form are two buttons: one to show all items, and one to filter them based on a boolean field called showitem.
The buttons work with the code below.
What I want to do but cannot seem to figure out is to have the report default to no filter.
The bound query has no criteria.
I'm trying to set the filter property via the on open or on load event and even if I isolate the report, cannot seem to reach it. 
Code:
Private Sub b_hide_items_Click()
    Me.Profile_Timeline_wNotes_subreport.Report.Filter = "timeline.showItem <> 1"
    Me.Profile_Timeline_wNotes_subreport.Report.FilterOn = True
    Me.Profile_Timeline_wNotes_subreport.Requery
End Sub
Private Sub b_show_all_Click()
    Me.Profile_Timeline_wNotes_subreport.Report.Filter = "timeline.showItem = 0"
    Me.Profile_Timeline_wNotes_subreport.Report.FilterOn = False
    Me.Profile_Timeline_wNotes_subreport.Requery
End Sub
	View 14 Replies
    View Related
  
    
	
    	
    	Oct 23, 2014
        
        I am trying to filter a report based on two user inputted dates, but can't seem to figure it out.  I've played around with quotation marks, and # but can't seem to figure the syntax out.  
Code:
Me.OrderBy = "Date Submitted"
Me.OrderByOn = True
Dim Date1 As Date
Dim Date2 As Date
Date1 = UserInput
Date2 = UserInput
DoCmd.ApplyFilter WhereCondition:="[Date Submitted] > Date1 and < Date2"
	View 11 Replies
    View Related
  
    
	
    	
    	Feb 5, 2015
        
        Access 2007
Unbound Form
I have a onclick tied to a label (for decoration purposes) that when clicked it launches VBA that essentially updates a form.  All that part works except it will not recognize any changed value of the field I was last in?
Just to try to explain best as I can what happens.
- Form gets opened
- I change field (quantity field) 
- I click the Label
- It reverts to pre-existing value.
if I click off of the text field first then do the onclick - it recognizes just fine.  
	View 7 Replies
    View Related
  
    
	
    	
    	May 8, 2014
        
        I have form named SearchForm and there is unbound subform named Search_blank. Depending on button in menu is used source object of Search_blank. One of the source objects is form named MeasureForm and it has subforms named MeasureForm_sf1 and MeasureForm_sf2. How can I reference public sub in MeasureForm_sf1 from SearchForm? How can I reference public sub in MeasureForm_sf1 form MeasureForm_sf2?
There might be a problem with unbound form. I tried reference public sub named GetLastVal from SearchForm that is in MeasureForm: 
Code  :   Me!Search_blank.Form.GetLastVal
and it was working. Than I tried reference public sub named GetLastVal2 from SearchForm that is in MeasureForm_sf1: 
Code  :   Me!Search_blank.Form!MeasureForm_sf1.Form.GetLastVal2
and I got RunTime error 2465, cannot find MeasureForm_sf1
	View 4 Replies
    View Related
  
    
	
    	
    	Apr 1, 2013
        
        what i have is a form with a report inside of it (i just drug it in and dropped it). the report filters off of a field in the form. So upon opening the form, the report filters correctly. however as i browse through the form records, the report doesn't update. i can't figure out how to get it to update with the form its on. i've tried report.requery in the form_current area but it doesn't seem to re-apply the filter.
	View 2 Replies
    View Related
  
    
	
    	
    	Mar 10, 2014
        
        I have a form, which is bound to a table, with an unbound textbox.
I am trying to get the number of months an employee has/had worked.
In the table are two dates, Company Start Date, and Resignation Date.
There are three scenarios in which I need to calculate the months:No Resignation Date
A Resignation Date in the future
A Resignation Date in the Past
See attached PDF
The Employees are under a one-year contract which ends the day before the one-year anniversary.
I originally tried using DateDiff in the Control Source, but the IIF seamed too limited for my needs.
Code:
 
If [Resignation Date] = "" Then
 If Month([Nichii Gakkan Start]) = Month(Date) Then
  If Day([Nichii Gakkan Start]) < Day(Date) Then
  MIS = DateDiff("m", [Nichii Gakkan Start], Date) - 1
  
[Code] ....
 MIS = The name of the textbox in question.
	View 6 Replies
    View Related
  
    
	
    	
    	Jun 24, 2013
        
        I have created a forum that all fields are unbound. On completing it is written to the table using a RunSQL command. This writes to the table with no problem but when it does so it is creating another entry with zero content. This is the save steps with open new form
Code:
Private Sub SaveRecordAddNew_Click()   
        Call PreSaveCheck
        If Me.saveCheck = False Then
            Exit Sub
        Else
            Call WriteToTable
[Code] .....
	View 12 Replies
    View Related
  
    
	
    	
    	Jul 16, 2015
        
        I have an unbound form in which a user enters data relating to a credit dispute, and when they hit the Save button I have a sub that is intended to insert that data into a table. This is a bit out of my comfort zone, so I found some code from another forum and adjusted it to my needs. However, I'm getting errors.
The table name is tbl_complaints. The fields from the form are:
txtAcctNumber
txtClient
txtEoscarType
txtEoscarControl
cboMethodReceipt
....
My code is below. 
Private Sub cmdSave_Click()
Dim StrSql As String
On Error GoTo ErrorHandler
StrSql = "INSERT INTO tbl_complaints " _
& "(ACCT_NUMBER, CLIENT_NAME, EOSCAR_TYPE, EOSCAR_CONTROL_NUMBER, METHOD_OF_RECEIPT, 
[Code] ....
The error I get is error number 3075, and it says I'm missing an operator in the section that references cboResponseType, but I can't seem to figure out what I'm missing. My head is spinning from staring at these parentheses and apostrophes for so long.
	View 14 Replies
    View Related
  
    
	
    	
    	Mar 12, 2005
        
        Hi!
I have a continuos form (list of records) with a tool bar with "filter by form buton". This buton allow to users filter the list of records showed by the form by diferent field criterias.
After applied a filter I need a buton in the tool bar to print the filtered records on a report with a specific design: logo company, header, footer, etc.
I don't know how to apply the same filter used by the form to a report. Notice the filter by form continuos change depending the user.
I have not too much experiencie in programming. So I appreciate in advance any help.
Thanks.
	View 1 Replies
    View Related
  
    
	
    	
    	Apr 3, 2005
        
        Please see the attached. I am receiving a fatal error when I attempt filtering my report. It reads "Data Type Mismatch". Can someone take a look at this and tell me what I need to do to make this work ???
	View 1 Replies
    View Related
  
    
	
    	
    	Nov 4, 2006
        
        I have a report "Work Order Details" that that is based on a query and opens along with a form that is used to set filters.  Based on samples I have looked at and reading, I cannot figure out what is missing.  When I select my item form one of 5 unbound combo box 's and click the "Set filter" button, it brings up a paramter box?? If I cancel out the box, I still don't get a result.  Just for the heck of it, I filled in a name in the paramter box, still no luck.  The report property has "Filter On" as YES.  The close button, clear button, and drops downs operate perfectly.
Here is the On Click Event info from my "set filter" button:
Private Sub Command28_Click()
Dim strSQL As String, intCounter As Integer
     'Build SQL String
     For intCounter = 1 To 5
       If Me("Filter" & intCounter) <> "" Then
         strSQL = strSQL & "[" & Me("Filter" & intCounter).Tag & "] " & " = " & Chr(34) & Me("Filter" & intCounter) & Chr(34) & " And "
       End If
     Next
     If strSQL <> "" Then
        'Strip Last " And "
        strSQL = left(strSQL, (Len(strSQL) - 5))
        'Set the Filter property
        Reports![Work Order Details].Filter = strSQL
        Reports![Work Order Details].FilterOn = True
     End If
End Sub
	View 2 Replies
    View Related
  
    
	
    	
    	Apr 19, 2005
        
        Hello all.
I would like to place a "Print Report" button on my primary form that allows a Filter By Selection (OR Filter By Form) first, then when selecting the button will view or print my already-created primary report but only for the records that were selected by the filter.
I looked and looked, but am not sure even what to search for in the forum.  I know this has to be simple.
Form is called PrimaryForm.
Report is called PrimaryReport.
Thank you.
Tom
	View 3 Replies
    View Related
  
    
	
    	
    	Jul 30, 2013
        
        My problem I am having is that in my database you can click around to different customers info on forms and from there you can click on a button to get to another form that lists all of the customers vehicles. From there I have a billing report that I created and I am trying to filter the report to get what I want on there.   
I have been searching around and have found codes to filter reports so that right now I have it when I click on Billing Report it filters by the customers form i am on. But now where i am having some issues is that I am also looking to filter by a yes/no field so that anything clicked yes for that customer will be filtered to show on this report.  
	View 2 Replies
    View Related
  
    
	
    	
    	Jul 24, 2013
        
        I am using a form to filter information so that I can open a report. The report displays information pertaining job costs. Each month the company I work for records their labor, costs, and travel in a form with a year to date amount. Right now, I am having a problem opening up a report for one specific job and a specific month. So what I want the dialogue box to do is to pick from a list of jobs then pick from a list of months, click a button that prompts a preview of the report.
	View 14 Replies
    View Related