Modules & VBA :: How To Attach PDF Report To Existing Outlook Template
			May 20, 2015
				Am working in MS Access 2013 and I have a form with a button, I need the button to doattach automatically the pdf-report to the email template(i don't want to attach the pdf to a new email)
Right now the command open the E-mail template and create the pdf-report in the desktop
Code:
Private Sub Command18_Click()
    
    Dim oApp As Outlook.Application
    Dim oMsg As Outlook.MailItem
    Dim oAttachment As Outlook.attachment 
    Set oApp = New Outlook.Application
[Code] .....
	
	View Replies
  
    
	ADVERTISEMENT
    	
    	Aug 6, 2015
        
        I am currently in the process of creating a form that will allow you to enter details for an email sent, select a number of documents from a list box and then open the mail message pre-written with attachments. The attachments reside in a list box currently, and I am attempting to use a "For Each" with item selected.column(3) as the file path, as column(3) contains the filepath from the table.
Currently my code is:
Private Sub OutlookBut_Click()
Dim olApp As Object
Dim objMail As Object
Dim varItm As Variant
On Error Resume Next
    Set olApp = GetObject(, "Outlook.Application")
[Code] ....
When this code runs, outlook will open as a process when it is closed, but then freeze and not allow me to see it or access it in anyway. If Outlook is opened Microsoft office usually gets angry at me and decides to throw error messages at me.
	View 2 Replies
    View Related
  
    
	
    	
    	Jul 13, 2013
        
        I have the code below which takes information from a form on access and sends it over to the correct place on an excel spreadsheet template. This works fine but I then need it to save and send on outlook. 
 
The issue I am having is that the saved document is not attaching to the e-mail. The subject etc all work fine but the excel spreadsheet just doesn't attach. When I go into the folder I have specified for the document to be saved in it isn't there either. :0(
 
The code for the e-mail "callmail" function works perfectly for word documents but I don't know if it is different for an excel file. 
Code:
 
Private Sub Command154_Click()
 On Error Resume Next
    Dim appExcel As Excel.Application
    Dim wbook As Excel.Workbook
    Dim wsheet As Excel.Worksheet
    Set appExcel = New Excel.Application
[Code] .....
	View 4 Replies
    View Related
  
    
	
    	
    	Nov 2, 2014
        
        getting to grips with the code a bit more now, but now I cannot get the report which is generated to attach to the email
running ms access 2010
	View 1 Replies
    View Related
  
    
	
    	
    	Dec 5, 2014
        
        I have a subroutine that works well for sending emails.  A need has arisen to, in some cases, send an Access report as a PDF attachment. I know how to do this using the SendObject method, but that won't work in this app. I also don't want to have to first save the report as a pdf file. I think I'm close, but I don't know the syntax for passing the report name as the Source parameter in the Attachments.Add method.
Code:
                    If strEmailAddress = "jsmith" Then
                        .Attachments.Add  source:=MyReportName, type:=acFormatPDF
                    End If
                    On Error GoTo SendErr
                    .Send
                    On Error GoTo 0
	View 4 Replies
    View Related
  
    
	
    	
    	Apr 28, 2012
        
        We have a shared personnel access database for our department.  Another department is wanting to use the same database.  Is there a way to go about deleting all the info and making a template to give the other dept to use? 
	View 5 Replies
    View Related
  
    
	
    	
    	Nov 15, 2005
        
        Hi there,
I am not the best in Access, I will admit. But need a function to open up a MS Outlook template (.oft file) within Access which is hosted on an internal server. Anyone help with quick steps on how to do this, It would be greatly apprciated.
	View 4 Replies
    View Related
  
    
	
    	
    	Oct 30, 2014
        
        I have a VBA module in my Access 2010 database that will send a report as a PDF via email to a predetermined email address. the only problem using the docmd.sendobject method is i keep getting a pop up that says "A program is trying to send an e-mail on your behalf. If this is unexpected, click Deny and verify your antivirus software is up-to-date." 
 
I have a windows task set up at the same time each day to open this database which runs an autoexec that creates this report and using my VBA module sends the email. i want it to just send the email without any imput from me. I want automation. 
 
Here is my code that i am using to create and send the email
 
"Private Sub Report_Activate()
filename = "Name of file" & Format(Me.Date_time_returned "MMDDYY") & ".pdf"
DoCmd.SetWarnings False
DoCmd.SendObject acSendReport, "Name of file", acFormatPDF, "the destination email address goes here",,, "Request completed and sent " & Format(Me.Date_time_returned, "MMDDYY"), "Subject of email goes here", False
DoCmd.SetWarnings True
End Sub"
	View 4 Replies
    View Related
  
    
	
    	
    	Aug 5, 2014
        
        I have copied a VBA from the net and it is working fine and producing my report on outlook body text but one problem me facing is that it is pasting only first page if the second page is there it is not coming in outlook text body this what i want rest every thing is correct the code is:
Private Sub Command88_Click()
Const ForReading = 1, ForWriting = 2, ForAppending = 3
Dim fs, f
Dim RTFBody, strTo
Dim MyApp As New Outlook.Application
Dim MyItem As Outlook.MailItem
[Code] .....
	View 5 Replies
    View Related
  
    
	
    	
    	Jul 15, 2014
        
         in Access i have made a report with data and now my goal is that if i click on a button the data will be exported to a existing Excel file under the other existing data so in row A6. Is this possible true a VBA code?
	View 2 Replies
    View Related
  
    
	
    	
    	Jul 30, 2013
        
        I have a report (a contract) which I can send as a pdf file.  However, on the printed version of the report, I have the "terms and conditions" on the reverse side.  The "terms" are already printed; the report is merely printed on the reverse side.I've saved the "terms and conditions" file as c:AccessFiles	erms.pdf.  What I would like to do is when I execute the code to send the contract as a pdf attachment via email, the "terms.pdf" file is combined with the report as one pdf file.  Is this possible?
	View 4 Replies
    View Related
  
    
	
    	
    	Aug 30, 2013
        
        I've created a custom ribbon and it works great however I want to create a separate ribbon and attach it to the report. On this particular ribbon, I'd like the export to excel, export to word and print functions to appear ONLY for reports. Not all reports will need to be exported; it depends what the user does. I've created this XML and I'm not receiving any error message. It loads as expected but my group is blank/empty. Still confused.
	View 2 Replies
    View Related
  
    
	
    	
    	Jul 9, 2013
        
        I have a form where I need a button that will export the current record being viewed to a TXT file and attach to email, I want to specify the To, CC, Subject and Body of the email, if possible putting a flag on it also.
 
I'm not doing very well, so far I have 
Code:
Private Sub MailExec_Click()
On Error GoTo Err_MailExec_Click
    Dim stDocName As String
    stDocName = "Executive Incidents"
[Code] ....
This now doesn't seem to be working, if I remote email.To= then it does however this only creates a blank email with attachment.
	View 1 Replies
    View Related
  
    
	
    	
    	Oct 12, 2014
        
        I have hp scanner whose twain driver has the option to scanning in the pdf document.
Microsoft WIA 2.0 have save scanned document only to graphical format.
I want automated (on click any button control) to scan multipage document from glass source or ADF to pdf document and attach it to attachment field.
I'm found VB Module for accessing TWAIN compatible scanner but it is call twain software and scan to bmp format with assigned name of file.
Me need it also only use the pdf format .
	View 7 Replies
    View Related
  
    
	
    	
    	Apr 21, 2015
        
        I need to create a word file (it needs to be word) based on template (not a very complicated template)  max 1 to 1 and 1/2 pages long. 
the  word doc needs to be named  from the recordset  but for now  assume 12345.doc and the next one will be 12346.doc  etc (I have a unique number system  - available from tables  /query .
i can either make the word doc  in code  or use a template (template would be better) recordset  could have 20-30 in it  each time i run it -  but to be run every week
second half is how to email this out. i had in mind  a email  system 
 email to . test@testhotmail.xyz
file attach =  this folder where the docs are store and  attach 12345
in a loop 
so either 
 create word file - email word file  in a loop each time or create all the word files and then send them individual 
	View 4 Replies
    View Related
  
    
	
    	
    	Jul 8, 2015
        
        I have some code that loops the clone recordset of my subform and generates a email with attachments. I have mainform and continuous subform within the subform I have field called address this holds paths to files and another field called send and this is a yes/no field 
  
Now what I'm trying to do is loop through the subform if send field is true then attach file from the address path but if send field is false then do not attach file 
  
Code:
Dim olApp       As Outlook.Application
    Dim olMail      As Outlook.MailItem
    Dim olAttach    As Outlook.Attachment
    Dim rstAttach   As DAO.Recordset
     
    Set olApp = New Outlook.Application
    Set olMail = olApp.CreateItem(olMailItem)
  
[Code] ....
	View 14 Replies
    View Related
  
    
	
    	
    	Aug 11, 2015
        
        I have been tasked with setting up a certificate request database. I have an Access 2032 FE & SQL 2012 BE.  I need to store PDF documents from all our branches.
I have been working on this for the past 3 working days and I have seen a great deal about saving the file path to the database vs saving the actual document  in the DB. The documents would be located on each users computer.
I have a Form with all the information that is required by the certification department.  On the form is a button (Called InsertID(ID in this case is the persons Identity Docuement)) and the button is linked to a table called dbo_CertificationSupportingDocuments. The table is referenced to the Main Certificate Request table.
The dbo_CertificationSupportingDocuments table is structured as follows:
Code:
[CertSupportingDocID] [numeric](18, 0) IDENTITY(1,1) NOT NULL,
[CertificateRequestNumber] [numeric](18, 0) NOT NULL,
[RequestBlob] [varbinary](max) NULL,
[RequestFileName] [nvarchar](50) NULL,
[RequestFileExtension] [nchar](10) NULL,
[RequestFileMimeType] [nvarchar](50) NULL
When I click the button I get a Run Time error 3075 "Syntax error (Missing operator) in query operator.
The code I am using is:
Code:
Dim fd As FileDialog
Dim strFileWPath As String
Dim FileNoExt As String
Dim FileExt As String
Dim StrSQL As String
Dim db As Database
[Code] ....
I have been looking at this code for so long that I cannot see what is wrong.
	View 14 Replies
    View Related
  
    
	
    	
    	Nov 24, 2014
        
        I have an Access 2013 database which will generate a pdf report and attach it to an email using the code:
Code:
DoCmd.SendObject acSendReport, "Report Name", acFormatPDF, Nz(To email address, a), , , "Email Subject", "Email body", True
I would also like to automatically attach on the server to this email.  Such a file stored such as servernamesharefilename.pdf.  Is it possible to do this?
	View 14 Replies
    View Related
  
    
	
    	
    	Aug 15, 2014
        
        I have developed an Access Database for my Co-Op work term workplace, and everything seems to be running smoothly with the exception of the report generation phase.  The company I am at has a set template for all reports (Clients column always goes in a specific place on the page, and the report always contains the same categories in the same locations; things like that).  The problem is that, every time I go to make a new report, I have to re-format and re-make the report.  Is it possible to save a report`s format so that, when I go to make a new report, it automatically applies that format to the data being used?
	View 3 Replies
    View Related
  
    
	
    	
    	Jan 13, 2014
        
        I was thinking today if it is possible to fill Access reports based on a specific Word template? I don't want to populate a Word file with Access data as users of my app might not all have Word. Or is there another solution using a WYSIWYG editor where users can format everything according to their needs? That would be fantastic.
	View 2 Replies
    View Related
  
    
	
    	
    	Jun 27, 2015
        
        I have an access form. It has 
 -Two textboxes with client first and last name
-Two textboxes with a contact 'email1' and 'email2' for the client
-A combobox with a list of templates to use for the email.
-A checkbox to include a copy of the statement on the email.
 I want the user to be able to press a button which does the following
 -Sends an email to both 'email1' and 'email2'.
-Attaches a secific report as PDF if the user has selected the checkbox
-The body of the email includes a greeting line using the clients name from the record.
-The body of the message includes below the greeting line a html email template depending on the users combobox selection.
	View 3 Replies
    View Related
  
    
	
    	
    	Jun 11, 2013
        
        I would like to create a table containing email templates for use around various applications and interfaces. I would also like the user to be able to create the text for these templates, but as well as the dynamic text. So a user might create a record as such:
Email_Template_ID: 1234
Email_Name: "Payment notification"
Email_Subject: "Project ID: {Project_ID} - Payment made"
Email_Body:
"Dear {Title} {Surname}
We have recently made a payment of {Amount}. Please check your bank account in the next two days. This relates to Project ID: {Project_ID}, {Project Name}.
Best wishes
Payment Team"
So a user, with sufficient knowledge of certain field names, would be able to drop in the dynamic content as they deem appropriate. The VBA would then replace anything in curly brackets with the genuine field name.
I could possibly start with Replace(Email_Body, "{", "' & [") and repeat it for the end curly bracket, but I'm sure VBA would just render this as Dear ' & [Title] & ' etc. without interpreting it as Dear Mr...
I hope I've explained myself OK. To look at it another way, in Excel there is a function called INDIRECT() which allows Excel to interpret a cell reference as the actual content of the cell...
	View 1 Replies
    View Related
  
    
	
    	
    	Jun 19, 2013
        
        I have info on my access form which is located here....
 
Code  :  Forms![Front Page]![Site 2 Owner]
and here 
 
Code  :  Forms![Front Page]![Postcode S2]
I would like to export this information into cells B2 & C2( individually and respectively) on the excel spreadsheet which I have saved as a template here...
Code  :  C:UsersmedesktopAutoExcel Auto
Is this easily achievable? To be honest I will be using it to fill in about 12 cells but how it would be done for the first two i can just modify it as necessary.
	View 6 Replies
    View Related
  
    
	
    	
    	Jul 20, 2014
        
        I created a form with lots of conditional formatting that did pretty much everything I wanted it to do. The only problem is that it takes about 4 full minutes for the form to open.
As an experiment I am reluctantly now trying to display the results in Excel. I have created a template xls sheet and all I want to do is, on the press of a button, copy the results from my query and paste them in to cell a1 of my spreadsheet.
I found the following code online which I am trying to adapt. 
Code:
 Private Sub update_tracker_Click()
Dim XL As Excel.Application
Dim wbTarget As Workbook
 Dim qdfResults As QueryDef
Dim rsResults As Recordset
 'Set up refernce to the query to export
[Code] ....
 My limited knowledge however results in a couple of errors. 
The first error User defined type not defined error appears at the very first line of my code 
Code:
 Dim XL As Excel.Application
 The next error occurs as I am not sure how to reference the query to export. The query is called 2014 Resources and outputs also to a form called 2014 Resources.
	View 11 Replies
    View Related
  
    
	
    	
    	Apr 29, 2014
        
        I'm using the below to merge an access form into a word template (it's a starter for 10).
That works fine. What I need to do is save the word template as HTML so I can then upload it to my website.
Dim wordApp1 As Word.Application
    Dim docPath1 As String
    Dim fileName1 As String
    Dim PageName As String
    PageName = Forms!Frm_Page_Create![Page]
    docPath1 = Application.CurrentProject.Path & "Merges"
[code]....
	View 1 Replies
    View Related
  
    
	
    	
    	May 6, 2014
        
        I'm using Access to create some web page templates. To Do this I have a memo field called "Description" into which I'm entering text. Example:
This is an obvious description example
What I need to be able to do is put a "<p>" before each sentence and a "</p>" at the end of each sentence. Examle
<p>This is an obvious description example</p>
The information is stored in a form page, and the text have paragraphs.
	View 1 Replies
    View Related