Modules & VBA :: Export Subform Filter To Excel
			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 Replies
  
    
		
ADVERTISEMENT
    	
    	Nov 21, 2013
        
        I have a table (tblMaster).  In the table is a field called Agency.  The table is 200,000+ records and there are around 35 Agencies. The table grows monthly, with potentially new Agencies added all the time.
What I have been asked to do is to have a button on a Form which, when clicked, exports to Excel a separate workbook with all the table data for each Agency in the table.
I have suggested a combo-box on the Form that passes the Agency name to a query and then exports (so they could have control of which Agency to export) but no - they just want one click, spool through the table and create the 35 (or so) exports.
	View 4 Replies
    View Related
  
    
	
    	
    	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 1 Replies
    View Related
  
    
	
    	
    	May 20, 2005
        
        First off I apoligise if this is a clear answer. I have looked on the internet for the last two days and can't seem to find this anywhere, either that or I am just entereing the search parameters in wrong  :confused: 
I have filtered selection in a form which I want to export to excel.
Simple enough  ;) : Created a macro with the export to command. This dus everything I want to do.
Well not quite.  :rolleyes: 
How do I select the fields I want to export.Something like Select Id, name, adres from query soandso
Hopefully there is a simple solution to this. If there any existing posts. Could you post the link for me. 
Thank your for your time,
Kind regards,
	View 14 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
  
    
	
    	
    	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
  
    
	
    	
    	Aug 21, 2013
        
        Is there a command that I can use to export a spreadsheet to Excel...
 
I could use docmd.transferspreadsheet
 
however that would also mean i would need an input window where users would need to manually put in the location they wish to save to...
 
Instead, could i not get a "SaveAs" command window or a file browser at least for them to search that way?
Alternatively, If it was possible to use VBA to pop up the "Export - Excel Spreadsheet" window, that would be just as good.
	View 2 Replies
    View Related
  
    
	
    	
    	May 15, 2014
        
        I have a query tool that allows users to create their own custom queries. Basically, it's a form that allows the user to check boxes for the fields they want to see. The code behind it simply hides the fields in the query for which the user has not checked the box. That works very well.
My problem is I would like to have a command button that will export the query to excel. The OutputTo and TransferSpreadsheet commands will just export the whole query into excel regardless of whether or not the field is checked. I'm looking for a way to only export the columns the user has checked. Is this possible, and if not is there a workaround that would do something similar?
	View 7 Replies
    View Related
  
    
	
    	
    	Feb 27, 2014
        
        I have a database, which analyze rent contracts. 
 
I export each rent contract to excel by the following code. 
 
Each contract gets each spreadsheet. So right now i export all contracts. 
 
Code:
Private Sub Befehl1_Click()
    Dim xlApp As Object         'Excel.Application
    Dim xlBook As Object        'Excel.Workbook
    Dim xlSheet As Object       'Excel.Worksheet
    Dim rstID As DAO.Recordset, tmpStr As String
    Dim rstGr As DAO.Recordset, strSQL As String
 
 [Code] .....
 
Is it possible that, before the exports starts that an import box shows up and the user can enter special contracts by SUWID number? 
 
For example 5,6,7 and 10. 
	View 11 Replies
    View Related
  
    
	
    	
    	Jun 18, 2014
        
        I have a Listbox named List5 and a search textbox named txtProperty and a table name sms , after i search in textbox the results in listbox . i would link to inport the results in listbox to excel but the code i have export the whole table to excel .
here is my code
''''''''*''''''''*''''''''*''''''''*''''''''*'''''  '''*''''''''*''''''''*'
  ''''''''*''''''''*'''''''' BUTTON 3 ''''''''*''''''''*''''''''*'''''''
  ''' EXPORT THE LIST TO EXCEL AS List5.XLS ''''''''*''''''''*''
  ''''''''*''''''''*''''''''*''''''''*''''''''*'''''  '''*''''''''*''''''''*'
  ''''''''*''''''''*''''''''*''''''''*''''''''*'''''  '''*''''''''*''''''''*'
    
      Dim outputFileName As String
      Dim oXL As Object
      Dim oExcel As Object
      Dim sFullPath As String
      Dim sPath As String
     outputFileName = CurrentProject.Path & "List5.xls"
      
[Code] ....   
	View 3 Replies
    View Related
  
    
	
    	
    	Mar 19, 2014
        
        the access database is about contracts.Each contract has an ID. So starting from ID1 to ID250. Right now i export in via VBA to excel. I have to create before in the excel the 250 tables. If the ID10 is not existing anymore i still have the table 10 left and then i have to delete this table.
 
Code:
 Dim xlSheet As Object       'Excel.Worksheet
    Dim rstID As DAO.Recordset, tmpStr As String
    Dim rstGr As DAO.Recordset, strSQL As String
 
[code]....
	View 3 Replies
    View Related
  
    
	
    	
    	Sep 3, 2013
        
        I've got a table with data about a contract. Each contract has his own ID. For each contract i have Information from SAP, Information from a System called geris and a System called pauschale. No I would like to Export that to Excel. With VBA, I would like to transfer the data for each ID to each spreadsheet.
	View 6 Replies
    View Related
  
    
	
    	
    	Jun 22, 2014
        
         I have Query call "export to excel" these are columns in my query 
employee id
total ex 
date of ex
first name
surname 
which I would like to export to excel file name "access data"
columns in excel
A
employee id
b
total ex 
c
date of ex
d 
first name
e
surname
now my problem is I cant manage to export the data to existing sheet within excel when I export it opens the existing file but create a new sheet / tab but I just want to delete the data in columns A,B,C,D only refresh the data in these columns when the user hits the command button in access on my form and takes the data from my query 
	View 14 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
  
    
	
    	
    	May 14, 2015
        
        I'm attempting to export some table queries to excel using the code I have posted below as a module.I am getting an error saying it cannot find my query.I have used this code to do the above on 2 queries within the same table and it works fine. I don't understand why it would not work for a different query.
 
Option Compare Database
Private Sub exportQueryToExcel()
DoCmd.TransferSpreadsheet acExport, acSpreadsheetTypeExcel9, "CUSTOMER FOCUS", "C:Usersgareth.davies1DesktopTrainingSHAREPOI  NT FEED MASTER.XLSM", True
End Sub
	View 4 Replies
    View Related
  
    
	
    	
    	Jun 8, 2015
        
        I would like to add the "Month" of the information queried to my file name at export if possible. I included my current code and an example of how I would like the title to read.
DoCmd.TransferSpreadsheet acExport, 10, "tblStarzIncentivePayoutExport", "C:StarzExportsIncentive Payouts" & " " & "Ran" & " " & Format(Date, "mm-dd-yyyy")
I would like the file to be named:
Incentive Payouts "Month out of the date ran in the query" Ran 06/08/2015
Is it possible to do?
	View 1 Replies
    View Related
  
    
	
    	
    	Sep 15, 2014
        
        I have a table (tbloutput) which has details of customers and which staff they have been contacted by.
What i want to do is, export the details from this table into an excel sheet using a template that i have set.
What i want to do is create multiple excel outputs using this template depending on the name of the staff. So each staff will have a seperate workbook which was created using that template. And i also want the new workbook to be named for that staff member.
So in short
Table exported to excel workbook and excel workbook named : Blabla staffname.xlsm
	View 1 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
  
    
	
    	
    	Sep 25, 2014
        
        I have a report exporting to excel using late binding techniques. When exported into excel i have numbers for 1,2,3,4 tblPreSiteSurveys. PreSiteSurvey Stop TheClockReason entitie and I am trying to either change the numbers here casting from int to string
1 = a
2 = b
looping through the record set, Or i have a blank field in my SQL for the column "P" and adding the formular to that column, but it only goes into the first row of the record set, which is a expandable table. 
On Error GoTo Command29_Click_Err
    'Utilergy Master Update report
Dim db As DAO.Database
    Dim rs As DAO.Recordset
    Set db = CurrentDb
    Dim UserDate As Date
   
[code]...
	View 12 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