Modules & VBA :: Export Filtered Query In Subform To Excel
			Aug 26, 2014
				I was having a wee look around the Export Threads and came across the following VBA Code I thought would be handy to export a Query to a new Excel workbook, and although it did export to excel, it didn't filter the query to show only the things I was wanting. Now I've managed to have it not work at all! 
 
Code:
Private Sub cmdOK_Click()
'Step 1: Declare your variables
Dim MyDatabase As DAO.Database
Dim MyQueryDef As DAO.QueryDef
Dim MyRecordset As DAO.Recordset
Dim strSQL As String
Dim i As Integer
[code]...
	
	View Replies
  
    
	ADVERTISEMENT
    	
    	Apr 7, 2014
        
        VBA code to filter the table :
Code:
Dim db As Database
    Dim rst As DAO.Recordset
    Dim strSQL As String
    Dim flnm As String
    Dim appXl As Excel.Application
    Dim bookXl As Excel.Workbook
    Const wrksheetName As String = "Welder Performance Overall"
    
[Code] ....
if i use DoCmd.OutputTo function, its export the whole table to excel. how can i filter this table ? 
Environment : Ms.Access 2010
	View 12 Replies
    View Related
  
    
	
    	
    	Jan 30, 2014
        
        I have a query that is filtered on a form (Forms!qRosterReport!SessionID) that I need to export to XML. I can export the query unfiltered but get an error with the filtered export. I am ok with Macros but very limited with VBA. 
	View 3 Replies
    View Related
  
    
	
    	
    	Jul 8, 2015
        
        I am currently working on a form that exports a query that changes after a user set filter is applied, and am able to get the filter to apply and the query to export. The problem I am having is that the worksheet that the query is copied into retains all previous data, and if the earlier query export included more records, they remain as they were, is there any way of getting them to be blank.
I want to export my query onto a worksheet that has current data, need to delete current data or delete worksheet so that only the selected data is shown.
My code currently is:
Private Sub Command67_Click()
   Dim strWhere As String
   Dim strFile As String   
   Const strcStub = "SELECT NomT.shkFirstName, NomT.shkSurName, NomT.shkCompanyName, NomT.shkAdd1, NomT.shkAdd2, NomT.shkPostCode, NomT.shkRegion, NomT.shkCountry, NomT.shkAdd3" & " FROM NomT" & vbCrLf
    With Me.FilterSub.Form
[Code] .....
	View 4 Replies
    View Related
  
    
	
    	
    	Oct 9, 2013
        
         how to grab the recordset after a user has filtered a datasheet and export it to EXCEL with VBA from a Button on a form.
I've figured out how to export a pre-defined query to excel with all the fields I need.  I was hoping to be able to grab the filters from the datasheet form and pass them to the query.
I have a main form with a bound Datasheet subform.  The export button is on the main form and I need to grab the filtered data from the datahsheet subform.
	View 1 Replies
    View Related
  
    
	
    	
    	Feb 10, 2014
        
        My subform is filtered via using VBA.
e.g.
Code:
strFilter = "[FK_D_TO_ID] = " & passProgram & " AND [isPending] = " & Me.txtIsPending & " AND [isApproved] = " & Me.txtIsApproved 
Me.sfrmContainer.Form.RecordSource = "qry_WorksheetFund_Status_TollFree"
Me.sfrmContainer.Form.Filter = strFilter
Me.sfrmContainer.Form.FilterOn = True
It works as I expect to see in my Subform. Now I want to export the results out to excel.
The problem is that I want to only export what is actually being viewed on the subform.  Not the underlying query that it uses which has many more columns that are not displayed on the subform.
Is it possible to use the result being displayed on the subform and make that into a temporary table and export that to EXCEL?
	View 4 Replies
    View Related
  
    
	
    	
    	Jan 9, 2014
        
        I have a form with a subform. In the form header I have combo boxes for the user to filter data. I want to add a button that they would click to export the filtered records to a table. I have the following code and get the message that records were exported successfully but when I open the table they are not there. I don't get any errors when I compile the code but I also don't get any results in the immediate window either. 
 
Code:
Private Sub cmdAddToTable_Click()
    'Dim tmpRS As DAO.Recordset
    'Dim tmpSQL As String
 
[code]...
	View 3 Replies
    View Related
  
    
	
    	
    	Apr 8, 2014
        
        I export data via vba from access to excel.
 
Here my VBA.
 
Code:
Dim xlApp As Object ' Excel.Application
Dim xlBook As Object ' Excel.Workbook
Dim xlSheet As Object ' Excel.Worksheet
Dim rst As DAO.Recordset
[Code] ....
How can i do it that by exporting the data to excel, that it will skip one row.
 
Example: 
 
I have the following querry
 
country/date   apr may jun jul aug sep oct nov dec jan feb mar
 
AT                  
BE
 
It starts with A4 to J4 and then it will skip the row K4.
	View 2 Replies
    View Related
  
    
	
    	
    	Apr 22, 2014
        
        i export a union query to excel by the following code: 
 
Code:
Private Sub Befehl0_Click()
'bersicht aufrufen
Dim xlApp As Object ' Excel.Application
Dim xlBook As Object ' Excel.Workbook
Dim xlSheet As Object ' Excel.Worksheet
Dim rst As DAO.Recordset
[code]....
How can i delte the first row of the querry? without doing a new querry?
	View 7 Replies
    View Related
  
    
	
    	
    	Jul 18, 2013
        
        Im trying to export a query to specific columns in excel and im using this code.
  
Code:
 
Dim objXL As Object
Dim xlWB As Object
Dim xlWS As Object
[Code].....
I tried it on other querys and it works but doesn't work on this specific one. I get an error on the "set rst = currentDb" line. And to my knowledge it doesn't work because I have a between two dates filter in it. So when I run it, I get an error saying I have too few parameters, expecting 2. 
 
Also it seems to be exporting the lookup id's not the value when exporting(on the query that it did work on)
	View 5 Replies
    View Related
  
    
	
    	
    	Jan 25, 2014
        
        I am trying to export a table in access based on a unique field  called Group_Name. Say my table has 100 records. 10 of those records belong to Group1, 10 belong to Group 2, and so on. What I want to do is export those groups individually to an excel file and have that file named somting like Group1_Premium Detail Report.
 
Here is the Code I have so far. I have a feeling I am close. When I run the code it does not seem to like strrsql2  
 
Dim strsql As String
Dim strsql2 As String
Dim strfilename As String
Dim strpath As String
strpath = "C:UsersDesktopHome"
[Code] ....
	View 6 Replies
    View Related
  
    
	
    	
    	Jul 8, 2014
        
        I have a form with a list of names. When a specific name is selected from the list, a button is clicked and a query is run with the specific name as the criteria/filter.
I've written code to export these same query results to an Excel sheet, and I want the Excel file name saved with the name selected in the form.
Below is the code that I've written that doesn't work. 
Code:
Dim strFileName As String
strFileName = SelectedItems(Me.lstName)
DoCmd.OutputTo acOutputQuery, "qryFocal_Sheet", acFormatXLS, "C:JRSWorkEquityFY2015" & strFileName & ".xls"
	View 7 Replies
    View Related
  
    
	
    	
    	Jul 19, 2014
        
        have a query which I would like to export to excel 2010 and would like separate files saved using a unique field called [Brokerage]. The code below exports the query however does not export separate worksheets as I am missing something perhaps the OutputTo function.
 
Private Sub Commission_Excel_Click()
Dim db As DAO.Database
    Dim rs As DAO.Recordset
    Dim MyFileName As String
    Dim temp As String
    Dim mypath As String
    
[code]....
	View 14 Replies
    View Related
  
    
	
    	
    	Oct 13, 2014
        
        In VBA I have set a timer on a form to run a query and export to a specific folder as an excel file. 
If I open the database as 'File Open' and open the form and let the timer run it exports perfectly. 
As soon as I put the database into runtime - the Timer code kicks in and starts running but as soon as it hits the export line. It stops and then does nothing
I have tried several combinations of either:
-  docmd.runsavedimportexport "Query"
-  docmd.outputTo acquery etc ...
	View 3 Replies
    View Related
  
    
	
    	
    	Feb 26, 2014
        
        I have an access program that is stored on a SharePoint site. I want to be able to export report to the computer even if I just open the access program as read only. Here's my code:
Code:
Private Sub btnExport_Click()
On Error GoTo btnExport_Click_Err
Dim db As DAO.Database
Dim strSQL As String
Dim qdfTemp As DAO.QueryDef
Dim qryFilter As DAO.QueryDef
[code]...
	View 2 Replies
    View Related
  
    
	
    	
    	Jul 24, 2014
        
        I am a relative newbie to VBA, and not very familiar with loops, but I need to add a loop to my function that exports a query with criteria contained in a bound ComboBox on a form. I've gotten my code to work fine without the loop, but I would like to export one file for each item "Team_ID" contained in the ComboBox without the user having to manually select and re-run the function each time. Here is what my code currently looks like:
Code:
Option Compare Database
Option Explicit
Public Function CreateQCChartsforReports() As Boolean
Dim qdf As DAO.QueryDef
Dim strSQLStatic As String
Dim BookName As String
Dim BookName2 As String
Dim intCounter As Integer
Dim cboCode As ComboBox
[code]....
	View 1 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
  
    
	
    	
    	Mar 12, 2014
        
        What I want to do instead is open an existing .XLSM wokrbook delete or update the 7 sheets it creates and replace them with the new query results from access.
I love this code below because it works really well but now I have a new requirement. I have a workbook that has a "dashboard" sheet that looks at the sheets from acccess and summerizes the data. So, I'd like Access to open that "template" excel workbook and delete the old sheets and put in the new ones..The required sheets to keep are called "Metrics", "Validation" and "Mara"
What I was trying to do for the past few hours was another work around which was to have Access run this code, then excel run some code to import the "dashboard" formulas but I can't get it to copy to another workbook because it links to the OLD workbook..Here is the working code that needs modding:
 
Code:
Option Compare Database
 Public Function ExportAdvanced()
 Dim strWorksheet As String
 Dim strWorkSheetPath As String
 Dim appExcel As Excel.Application
 Dim sht As Excel.Worksheet
 Dim wkb As Excel.Workbook
 Dim Rng As Excel.Range
 Dim strTable As String
 Dim strRange As String
 Dim strSaveName As String
 Dim strPrompt As String
 Dim strTitle As String
 Dim strDefault As String
 
[code]...
	View 3 Replies
    View Related
  
    
	
    	
    	Aug 25, 2013
        
        i want to export a table to excel , open this file and execute a macro from another file.
the code i have now is :
Code:
DoCmd.OpenTable "Overzichtaanwezigheid", acViewNormal
 DoCmd.RunCommand acCmdExportExcel
 DoCmd.Close acTable, "Overzichtaanwezigheid"
 Dim XL As Object
 Set XL = CreateObject("Excel.Application")
 XL.Workbooks.Open ("C:UsersErwinDocumentsOverzichtaanwezigheid.xlsx")
 XL.Visible = True
 XL.Run "d:	est.xlsm!Macro3"
Opening the excel file goes ok, running the macro however not.
	View 1 Replies
    View Related
  
    
	
    	
    	Mar 6, 2006
        
        is ther any way to send the filtered subform's data to an Excel sheet?, I did som searching, but i can't locate anything specific
to what i am trying to do.
I have currently this code, but it is a huge dump of the database, and none of the form filters, my current MDB has the main form and it narrows down the search by clicking on the next forms links. 
and on the last open form it will show a filtered result in a datasheet. this is what i am trying to export to Excel.
Code:Private Sub Command17_Click()Dim strqur As StringDim wurds As Stringwurds = "D:Documents and SettingsMy Documentsdownloadsmyfile.xls"strsql = "sortedby"DoCmd.TransferSpreadsheet acExport, acSpreadsheetTypeExcel9, strsql, wurds, TrueEnd Sub
is there any way to snd the filtered results to Excel? my brain hurst from scouring the forums.
	View 3 Replies
    View Related
  
    
	
    	
    	Apr 25, 2013
        
        I am using Excel and Access 2010.
I have an excel spreadsheet with 8 tabs. They are all in the same format and column order. They are employees grouped by region. My ultimate goal is to merge all of these onto one excel tab, relatively instantly. I created a master tab and tried doing array formulas and Vlookups, it worked but my spreadsheet was way too slow.
My solution? Import and link them to an Access database, step complete. Create an XML export then import into Excel. 
My problem? The only way to update the excel tab with the combined tabs is to save the excel file after changes, go back into Access, re-export to XML, then go back into excel and refresh the data.
My questions, is there any way to automate this process to the point that I can change excel, save, then hit refresh on my excel tab with the XML import to auto-update? 
	View 7 Replies
    View Related
  
    
	
    	
    	Aug 30, 2014
        
        I'm trying to create a button that will export the filtered records on the screen to an Excel file.
I'm using strWhere as my where string and found this code in one of the posts from this forum, but unfortunately, I can't get it output only the filtered records.  It outputs all records instead.  
Dim db As dao.Database, qdf As QueryDef, mySQL As String
Dim strWHERE As String 
Const strSQL = "SELECT * FROM [Action Register] "
[Code].....
	View 11 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
  
    
	
    	
    	Dec 11, 2013
        
        I'm exporting a query to Excel, and I want to be able to conditionally format certain rows of the export using Access VBA.  Is this possible?
	View 1 Replies
    View Related
  
    
	
    	
    	Aug 18, 2014
        
        I have a main form with two subforms. I'm trying to get my code so that it allows me to put 1 subform on one tab and the other spreadsheet on the other tab.Heres my code:
Code:
Option Compare Database
Public Function Send2Excel(frm As Form, Optional strSheetName As String)
' frm is the name of the form you want to send to Excel
' strSheetName is the name of the sheet you want to name it to
[code]...
It won't let me pass more than one subform when I call Send2Excel, so I have to list it twice, which opens two excel files.
	View 14 Replies
    View Related
  
    
	
    	
    	Jan 31, 2014
        
        I have 2 databases, mymacros.mdb and otherdb.mdb
I am writing some vba code in mymacros.mdb to try and export a table from otherdb to excel. I do this becuase there is a new copy of otherdb created on a daily basis.
I have tried using docmd.output and docmd.transferspreadsheet to achieve this but dont know how to specify that the table I am exporting is in the otherdb.mdb file.
	View 5 Replies
    View Related