Modules & VBA :: Save Report As PDF Using Specific Fields To Create Name Of File
Jun 2, 2015
I want to create a Macro saves the report in a specific location, and uses two fields within the report to generate the name of the file. For example, "[Sales Rep Name] + [PayPeriod].pdf" and it should be saved in a predetermined folder.
View Replies
ADVERTISEMENT
Sep 9, 2013
I am trying to create some code for a button in a report that will follow a hyperlink to a specific file. The problem I'm having is that the files that are at the end of the hyperlink can have various extensions (*.doc, *.docx, *.pdf, etc.) I'd like to be able to put a wildcard in the code to allow the opening of the file regardless of the extension.
Code so far:
Private Sub Command6_Click()
Application.FollowHyperlink ("C:UsersjbeggDocumentsAccessTestFolder" & [FileName] & ".*")
End Sub
View 11 Replies
View Related
May 12, 2005
DoCmd.OutputTo acOutputReport, "MD Form",".xls" "C:Documents and SettingsKevanAlderton.THERMOSHIELDDesktop", True
any ideas what is wrong ??
many thanks
View 3 Replies
View Related
May 24, 2014
Trying to make this code work, don't know how to filter as it prints identical all reports.
Private Sub cmdExportPDF_Click()
Dim db As DAO.Database
Dim rs As DAO.Recordset
Dim MyPath As String
MyPath = "C:Reports"
If Len(Dir(MyPath, vbDirectory)) < 1 Then
MkDir (MyPath)
[code]....
View 14 Replies
View Related
Feb 23, 2013
We have a server that we use to run a Microsoft Access application. This application creates folders, subfolders and files on the server.Users are in 4 different offices. Each office has at least 3 computers. Some users also work from home.
Users creates file through word, or scanning a document or by saving an email on their local pc.My problem is that users need to be able to save a file to a specific folder on server.
View 1 Replies
View Related
Jan 10, 2014
I have a few selected reports on an Access 2007 database that users can run. Is there a way for users to view the report, save as a PDF and automatically save a copy to a shared drive by modules/vba coding as an On Click event procedure?
View 4 Replies
View Related
Sep 17, 2011
I want to be able to have a report automatically generate at the beginning of each month and save it as a PDF file and have that report saved to my access database.
View 3 Replies
View Related
Aug 8, 2013
I need code for save dialog file ,and select the file from textbox and save it to the selected location.i have only this code and i dont know what else i can do with this because it just opens the save file dialog !
View 1 Replies
View Related
Jul 25, 2014
how using vba i can take a screenshot of my screen and save the pdf or whatever form its in into a specific folder path.
View 1 Replies
View Related
May 8, 2013
My reports are saved as a PDF at the moment I click the print report button, select cutePDF Writer then manually add the Quote number stored in Field from the Table or form into the file name, then select the location to store the PDF file
Can I make this process automated when I click the print report button to auto select PDF Print, then auto populate the file name with the quote/Inv Number and then save to nominated directory.
View 6 Replies
View Related
Jul 19, 2015
I want to save my report as excel file on the user computer with a click of a button. I have tried this code:
Private Sub Cmd_ReporttoExcel_Click()
DoCmd.OutputTo acOutputReport, "Gastrolog Report", acFormatXLS, "C:UsersXXDocuments" & Format(Date, "yyyymmdd") & ".xls"
End Sub
But it is giving error 2282 - The format in which you are attempting to output the current object is not available.
The other part of this question is :
This is something similar when I didn't have "PDF add in " in access 2007, when I added PDF add in then option to save file in PDF was available in "output to" action of macro. There is nothing like excel add in. However when I can export the data in excel sheet by Export function in access why don't I have option to save file as excel in "output to " action in macro? I want to have this option so that user can click a button in the form rather than in the top ribbon try to find out how to transfer and save the excel sheet.
View 3 Replies
View Related
Nov 6, 2012
I'm trying to save a report to my Desktop as a pdf - adding a date {that I am retrieving from a query} as part of the pdf file name.
I get a
Run-time error '2501' - The OutputTo action was cancelled.
(See screenshot).
Here's the code I'm using. So far - all I've tried to do is run the function from the Visual Basic Editor.
Function SaveReport()
Dim strSQL As String
Dim strPath As String
Dim strFilename As String
'Get the ReportDate.
[Code] .....
View 4 Replies
View Related
Jun 13, 2013
I currently have a working model which opens up a word document template, fills the bookmarks with info from access, saves the file as a preset name and then send the document on Outlook.
What I would like to do is save the document as a variable, preferably as something like " Climbing Request for site (and then to lift the site name from Access form field and insert here) "
E.G " Climbing Request - Newcastle Central Station.doc"
The location of the site name on access is...
Code:
objWord.Selection.Text = Forms![Front Page]![Site 2 Owner]
Currently I save the document using the below code...
Code:
objWord.ActiveDocument.SaveAs2 FileName:="C:UsersmedesktopFrom Colino2test.docx"
This is the last step before "launching" my database automation.
View 6 Replies
View Related
Aug 1, 2013
i'm using a form with an unbound text box to temporarily hold data that i want to use in several other places (all those functions work great). last step is to save the newly created table with a different name (will be used for a mail merge later so must be a separate table or else we'd have to filter thousands of records during each mail merge) and i want to use the data i've temporarily held in my unbound text box within my form as the name in the save as function.
can i specify a variable as a file name within the save as function? is there a better way?
View 4 Replies
View Related
Oct 16, 2014
I want to save NOW() (i.e. Date and time) into an event log file. But I just cannot work out the syntax. My insert statement works fine without the date field in, but fails on a syntax error (3134) when I include it.
strsqlac = "INSERT INTO EventLog ( EventTime, User, EventType, EventMessage, DocRef, AutoSeq, CoCode ) " & _
" Values ( '" & Now() & "', '" & GlobUser & _
"', '" & Mess2 & _
"', '" & Mess1 & _
"', '" & Docref & _
"', " & AutoSeq & _
", '" & CoCode & _
"' );"
... it's the first column, EventTime that is the issue. I have tried several different ways of wrapping it in the VALUES () without success.
My database field EventTime is defined as a General date which Access 2007 tells me will give me date and time. That's what I want.
The Value formats I have tried (currently showing as 'NOW()' above, are ...
#NOW()#
#'NOW()'=
'#NOW()#'
and (as I say) 'NOW()'
View 5 Replies
View Related
May 13, 2014
I would need removing the lines from an .xls file(stored in shared folder) and saving the same. I used the below code and not successful in removing and saving the file stored in the shared area..When I execute the code, Cursor hangs at this line
Set objWB = objXL.Workbooks.Open(filename)
Code:
Set objXL = CreateObject("Excel.Application")
Set objWB = objXL.Workbooks.Open(filename)
Set objWS = objWB.Worksheets("Sheet1")
objWS.Rows("1:6").Delete
[code]...
View 3 Replies
View Related
Sep 5, 2014
I have a table with an attachment field called email, where a .msg file is stored for each record. Looking for code to save this contents of this field in a folder in my drive.
View 1 Replies
View Related
Jun 6, 2013
I have a table with lots of different fields and field types. The two memo fields will not save. I have tried Runcommand and if me.dirty. Neither seems to work.All fields are from one table and I have tried deleting the fields and repopulating them onto the form to reset defaults. The only way the two fields save is if I hit Ctrl-S.
None of the 100+ fields on this one form (yes, it is large, weird part is it fits Normalization upthrough BNSF) have the same problem. They all save fine with or without the extra code. I am using Windows 7 and Access 2010.
View 6 Replies
View Related
Feb 14, 2014
In the footer of my report I have a field that sums the Transaction Amounts - =Sum([Transaction Amount])
I would also like to break the totals down further by Transaction Type Codes.
Something like =Sum([Transaction Amount]) where Transaction Type Code = AL-Exp-Paid
View 4 Replies
View Related
Sep 6, 2013
I am trying the get specific data out of an XML file. I managed to access a nodelist but I need more data.
This is the XML file:
Code:
<Document xmlns="urn:iso:std:iso:20022:tech:xsd:pain.008.001.02" xmlns:xsi="removed due to #posts">
<CstmrDrctDbtInitn>
<GrpHdr>
<MsgId>006-2012-11-09-12:21:47</MsgId>
<CreDtTm>2012-10-12T12:21:47</CreDtTm>
[Code] ....
This is the code to start with:
Private Sub NameSpace_Click()
Dim strFile As String
Dim xDoc As DOMDocument
Set xDoc = New DOMDocument
Dim Nodes As IXMLDOMNodeList
Dim xNode As IXMLDOMNode
[Code] ....
The extra data I need are the IBAN and Ustrd field. But they are on a different level in the XML.
I tried selectSingleNode but no solution yet.
View 1 Replies
View Related
Dec 4, 2013
I want to extract specific data from a text file and place it in my table.The following is an example of the data:
Display Author="All Saints" Title="On & On" Genre="Pop" Color="7693971" Tag="2"
I want to extract the following:
Where the word Author= appears to extract the data between the double quotes, so in the above case I want to extract "All Saints" excluding the double quotes.And then where Title= appears extract "On & On", again excluding the double quotes.So I would end up with data in my table looking something like this
strArtist [Author] strSong [Title] strGenre [Genre] strYear [Year]
All Saints On & On Pop
America Venture Highway Rock 1972
Amillionsons Misty Blue Pop 2002
my table is name tblMusicList, the fields are:
strArtist
strSong
strGenre
strYear
View 4 Replies
View Related
Nov 3, 2006
Hi
Please help me,
I have the form, in this form there is list of value which run query and resulting the report. For example if I have 5 item in list, i have to choose one of then and the query running and the report is print preview.
My question is,
How to export all 5 report to 5 sheet in one excel file.
I know may be the problem in format if I send to excel, but I will fix it in the excel. The most important is, I export the report to excel, each of the report in each of sheet of excel.
Thanks in advance
sorry my english is not good.
View 2 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
Aug 19, 2013
Actually what I am looking to do is have an Access application check some Web site for the presence of a number. This number could be the Serial number of the application and if this number exists to maybe show a message in the aplication or even terminate the application.
A quick and dirty way is for User Serial number 254, to put on a specific page of a Web site say arbitrary file 254.jpg (invisible on the Web site). The application would check for the existence of this file and if it is there, it could take some action. Everything would have to be done in stealth mode.
The following code can tell me if a specific URL exists, in this case [URL]
Code:
Private Sub cmdArbitray_Click()
Dim blnDum As Boolean
blnDum = blnCheckURL("http://www.VisualDentist.com")
' If blnDum = True then it exists
End Sub
Public Function blnCheckURL(ByVal strURL As String) As Boolean
Const FLAG_ICC_FORCE_CONNECTION As Long = &H1
blnCheckURL = (InternetCheckConnection(strURL, FLAG_ICC_FORCE_CONNECTION, 0&) <> 0&)
End Function
1) How can I check for file 254.jpg?
View 1 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 11, 2015
So I press a button on my Form1 and my tbl_customers table is exported onto a specific sheet in a templated Excel file "customer-template" that I have created.
This file has formulas on another sheet that based on the imported data.
The file is then saved to a specific location C:AccessCustomersHistory with the file name based on a date that was criteria from my original form E.g. "customers 11-02-15"
View 3 Replies
View Related