Modules & VBA :: Filling Excel Template Cells / Save Then Send On Outlook
			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 Replies
  
    
	ADVERTISEMENT
    	
    	Jul 20, 2015
        
        I have a few problems and I want them to be able to be done from switchboard:
1.  Is there a way for me to export a particular report (after selecting  it) to a closed excel template, that is formatted? It would open the  excel template (that has a logo and column headings), export data to  below the column headings, then save the file with a unique name?
2.  Also, a way to import data from an excel file, after allowing the user  to select file? Only data below the column headings mentioned above.  Same data will be appended to existing table.
	View 1 Replies
    View Related
  
    
	
    	
    	Jul 2, 2015
        
        I have a form with fields that contain the address/postcode etc of the person in question, and I also have a template letter that needs to have said persons address/postcode etc at the sending stage after a button is clicked.
	View 9 Replies
    View Related
  
    
	
    	
    	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 3 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
  
    
	
    	
    	Jul 13, 2013
        
        A client wants to e-mail newsletters using a non-default Outlook account.  The code below does everything the client needs except setting the SendUsingAccount.  In debug I can see that the correct account is assigned, yet all of my testing results in e-mails where the From line is the default account.  The test setup uses my own isolated SMTP server, so when I look at the e-mails sent the sender is the default account.  The default account's Sent folder shows the sent mail, which is not what we want.  
Code:
Sub prepEmail()
Dim frm As Form, startDate As Date, endDate As Date
Dim rs As DAO.Recordset, strSQL As String, intNewsLetter As Integer
Dim rsEmail As DAO.Recordset, rsNewsletters As DAO.Recordset
Dim OlApp As Object, ol As Object
Dim olMail As Object, olAcct, olAcctTemp
[code]...
	View 3 Replies
    View Related
  
    
	
    	
    	Feb 3, 2014
        
        I'd like a command button to open Outlook and create a new email message with the To and Subject fields already populated with what I want, is there anyway to do this?
	View 1 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
  
    
	
    	
    	Oct 13, 2014
        
        I want to send an e-mail with a report as attachment.On the internet i have found two options, and both are not the best solutions.
1. option
Code:
DoCmd.SendObject acSendReport, sReport, acFormatPDF, sMailAdres
With this construction I don't have enough control over the mail, and worse, I get an Outlook message  when the mail is sending which I have to answer.
2. option
Code:
Dim oMail As MailItem
Dim oAtt As Attachment
Set oApp = CreateObject("Outlook.application")
Set oMail = oApp.CreateItem(olMailItem)
DoCmd.OpenReport ReportName:=sReport, View:=acViewPreview, WindowMode:=acHidden
Set rpt = Reports(sReport)
[code]...
with this construction I have to enter an existing report.pdf on my filesystem (bold line), but I want to pass the rpt object straight to the mail as an attachment.
	View 2 Replies
    View Related
  
    
	
    	
    	Jan 4, 2014
        
        Is there a way of doing the above? I have several distribution lists (some >100 recipients) defined in Outlook, and would like to use the Docmd. Send Object command to send messages to one or several of them. I cannot find a way of defining a distribution list as any of the To, Cc or Bcc parameters.
	View 2 Replies
    View Related
  
    
	
    	
    	Aug 18, 2014
        
        I am using Access 2010 . I need to format cells inside the Excel spreadsheet
Here is my code:
Dim ApXL As Object
Dim xlWBk As Object
Dim xlWSh As Object
Dim intColumn As Long
Set ApXL = CreateObject("Excel.Application")
[Code] .....
The code "With xlWSh.Selection" returns a run-time error 438 - Object does not support this property or method
When coding, when entering a "bang" ("."), Access normally returns the next piece of code. The code above does not! How to I correct this?
I do have a reference to Microsoft Excel 14.0 Object library....
	View 3 Replies
    View Related
  
    
	
    	
    	Mar 24, 2014
        
        I'm trying to have a command button send info on the form straight to Outlook as a meeting. So far, the code below works apart from the address bit. I need the code to automatically add the same 2 email addresses as recepients everytime.
 
Error message highlights the red line below with the following message: 
 
Runtime error '438'
Object doesn't support this property or method
 
I'm new to VBA, so don't understand what is wrong here. The reference is set, I've tried different permutations of the "To:" & "Recipients.Add" for the email address with no joy.
Code:
Private Sub cmdSend_Click()
    Dim outApp As Object
    Set outApp = CreateObject("Outlook.application")
    Set outmail = outApp.CreateItem(olappointmentitem)
 
[Code] .....
	View 10 Replies
    View Related
  
    
	
    	
    	Mar 7, 2014
        
        I have spent the day using Access 2010 and attempting to move information from a parameterized query into specific cells in an excel template. It runs smoothly until I attempt to reference the query at which point I run into th error "Too few parameters. Expected 1." Currently my reference code looks like this:
 
Dim T As Recordset
Set T = CurrentDb.OpenRecordset("SELECT [8D Data].ID, [8D Data].[Customer Closed], [8D Data].[Days Open], " & _
      "[8D Data].[Open Date] , [8D Data].[QN #], [8D Data].[Last Report Date], " & _
      "Leaders.[Leader Name] , Leaders.[Leader Title], Leaders.[Leader Phone #], " & _
      "Leaders.[Leader Email], [8D Data].[Part Description], [8D Data].[Customer P/N], " & _
      "[8D Data].Customer , [8D Data].[Vehicle Year], [8D Data].[Problem Description]" & _
      "FROM [8D Data] INNER JOIN Leaders ON ([8D Data].Lead = Leaders.ID)" & _
      "WHERE ((([8D Data].ID)=[Enter QCR #]));")
	View 4 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
  
    
	
    	
    	Jan 28, 2015
        
        I am writing the following code that will first of all display column headers dynamically using "Headers" field data from Access table and then find out the sum(volume) using column header and first column values. The following code works fine to display headers dynamically in Excelsheet from Access table but doesn't display sum(volume) in all the corresponding cells. As I can't attach the Access table so I have stored data from Access table to sheet named "Access Data" as attached. The sheet2 named "Report" should populate total volume .
Code:
Public Function Inputdata()
  Dim cn As ADODB.Connection
  Dim rs As ADODB.Recordset
  Dim r As Long
  Dim i As Integer
 
[code]...
	View 2 Replies
    View Related
  
    
	
    	
    	Apr 29, 2014
        
        I am able to use DoCmd.TransferSpreadsheet to export data from Access to Excel, however, I want to be able transfer data into a specific sheet within an Excel template (e.g. Tasking.xls), that will then save under a different name (e.g. Tasking 20140429.xls). The other sheets within the Excel template contain pivots etc. so they will need updating during this process. The Excel template should just close down and remain in its original format.
 
This process will occur once a week so the dates will have to change accordingly.
	View 7 Replies
    View Related
  
    
	
    	
    	Jun 25, 2014
        
        Any definitive way of exporting a query to an Excel file and then saving it as a new file without saving over the original.
I've tried to remove any confidential info from the code below so it's not exactly the same.
Code:
Dim XLApp As Excel.Application
Dim XLSheet As Excel.Worksheet
Dim tmpRS As DAO.Recordset
Dim strFolder as String
strFolder = ("C:Profiles"& [Name] & "")
[Code] ....
The error seems to be with the SQL statement although that may just be the first error that it got to. I read that you can't refer to a Query if it has a criteria and that you have to write the SQL directly into the code. 
	View 13 Replies
    View Related
  
    
	
    	
    	Jun 12, 2015
        
        I have this UDF in my excel template that changes a set of numbers in to letters corresponding a code.
For example the code is "EUCHARISTO" it would simply mean 
E=1, U=2, C=3, H=4, A=5, R=6, I=7, S=8, T=9, O=0 and by default the tenths position (".0")=X the hundredths position (.0"0") = Y and If a number repeats it becomes G.
Examples
12.50 = EUAY
123.00 = EUCXY
12.25 = EUGA
99.00 = TGXY
99.50 = TGAY
999.00 = TGTXY
999.99= TGTGT
Here's the UDF:
Code:
  
Function LetterCode(ByVal Numbers As String, Letters As String) As String
  Dim X As Long
  Numbers = Format(Numbers, "0.00") * 100
  Letters = UCase(Right(Letters, 1) & Left(Letters, Len(Letters) - 1))
  If Numbers Like "*0" Then Mid(Numbers, Len(Numbers)) = "Y"
[Code] ...
Also, where best to put this code, In a query or in a module.
	View 6 Replies
    View Related
  
    
	
    	
    	Dec 4, 2013
        
        I have 2 form, form1 and form 2 (picture attached)
In Form 1 
(main form) there are "reference" field with key pressed event
then call form 2 (list of reference that user can choose)
In form 2
the problem is, when "enter" key pressed (keypress event), selection will move to next record
so the data that transferred to form 1 is wrong (next record)
The question is : how to save current record in form 2 before enter and send the data to form 1
	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
  
    
	
    	
    	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
  
    
	
    	
    	Jun 20, 2015
        
        How to open a pre filled excel template in read and write mode from msaccess vba and insert data from msaccess tables into specific columns in excel. 
Rename the tabs in excel sheet based on a specific column in the access data.
Each row in the table will go to a seperate tab in excel.
Save the excel template after populating the necessary data into different tabs.
	View 3 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
  
    
	
    	
    	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
  
    
	
    	
    	Dec 18, 2014
        
        After I have run all my access queries is it possible to send a conditionally formatted excel worksheet all in access using vba?
	View 1 Replies
    View Related