Modules & VBA :: Attach Multiple Items To Outlook Email
			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 Replies
  
    
		
ADVERTISEMENT
    	
    	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
  
    
	
    	
    	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
  
    
	
    	
    	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
  
    
	
    	
    	Jan 30, 2007
        
         hello once again 
Scenario:
I currently have a form that the users can browse through listings of items for sale. While going through the records, they can mark with a checkbox of which items to include in a report to send in an email. The check box is currently part of the listings table, and i then run a query to pull items with the box checked, then put those in to a report, then they can email. 
Problem:
about 5 users use this database, so if one user is selecting items that they want it's going to cause a problem for another user to select only the items he wants since it is all updating to the same table. Ex, if I select items 2 and 3 and another person selects items 4 and 5, when I click to show the report, its going to show items 2,3,4,5. Make sense?
Solution:
Since there are only 5 users, I made them all aware of this, and also created a reset selected email checkbox button, that sets the checkbox back to unchecked so the next person can select their own items and email. There has to be a better way to fault proof this, I just can't think of one. Any ideas would be greatly appreciated!
	View 2 Replies
    View Related
  
    
	
    	
    	Jul 30, 2014
        
        I'm trying to make it so when a subform is updated, it will email the contents of that subform to me. I've got it all working, except for the content of the email part. 
Code:
Sub SendRepReassignment()
Dim oOutlook As Outlook.Application
Dim oEmailItem As MailItem
Dim objOutlookAttach As Outlook.Attachment
On Error Resume Next
Err.Clear
[code]...
	View 3 Replies
    View Related
  
    
	
    	
    	Jun 16, 2013
        
        I am making a new database. And I want to confirm that I can do all the following in Access 2007 and how is best to do it.
1) A form where I can define:a unique Email Number starting at 1.
a directory eg "C:UsersPaulDesktop101 - Brick House"
an email address.
a Recipient Name
a Category for the email. Choosing either "Working" or "Complete". This would be part of the email subject.
2) a button which onclick lists all the files in the defined directory to a box on the form.
3) a button which onclick exports a report containing the list of files to PDF. Then attaches a zip of these files and the PDF report to an email in Outlook for revision before sending.
4)In Outlook the subject would be:
"The Directory Name" - "The Category" - "The Email Number"
"101 - Brick House - Working - Email 1"
5)In Outlook the body would simply be the subject of the email followed by the filenames of the 2 attached files, ie the PDF report and the zip.
	View 7 Replies
    View Related
  
    
	
    	
    	Nov 26, 2013
        
        I am a College Instructor and I would like to make a Database that will regularly email me a list of Students who are approaching the mid-point of their Program.Is it possible to program Access to email a list with Student Names, Registration Numbers, etc, etc. by a given date?
As of right now I have a Database with all of the students' pertinent information but I have to manually comb through the Database each week to see which students will require a Mid-Term interview that week. 
	View 7 Replies
    View Related
  
    
	
    	
    	Aug 15, 2015
        
        I have been trying to get this to work but without success.
My original source was [URL] ....
The code looks good apart from the fact that the Inspector was not Dimensioned.  Anyway, here is my code which fails as the error message is that objSel is not set.
Code:
Dim MyOutlook As Outlook.Application
Dim MyMail As Outlook.MailItem
Set MyOutlook = New Outlook.Application
Set MyMail = MyOutlook.CreateItemFromTemplate(DLookup("TemplateFolder", "Company Details") & "eMail Template bm4.oft")
    
    MyMail.To = strTarget
    MyMail.Subject = "Test"
    
[Code] .....
	View 1 Replies
    View Related
  
    
	
    	
    	Aug 16, 2014
        
        I have this VBA code:
Option Compare Database
Option Explicit
Private Const URL_CDOCONFIG As String = ""
Public Function SendEmail(ByVal sTo As String, ByVal sFrom As String, _
        Optional ByVal sCC As String = "", Optional ByVal sBCC As String = "", _
        Optional ByVal sSubject As String = "", Optional ByVal sBody As String = "", _
[Code] ....
It is being called with the following macro:
SendEmail("gregory.west@dbwsys.mb.ca","vba@dbwsys.  mb.ca","","","Subject line","Body of eMail here")
But I get this error message.
The "SendUsing" configuration value is invalid.
	View 1 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
  
    
	
    	
    	Nov 25, 2013
        
        How I could initiate a search from MS Access on an Outlook folder for an email addresss.
I would like to to work just as if you were using the outlook 'Try searching in All Mail Items'
	View 11 Replies
    View Related
  
    
	
    	
    	Jul 23, 2015
        
        What i would like to do is replace the DoCmd.OutputTo line with a DoCmd.SentTo line to email the reports to the appropriate faculty instead of just saving them in the folder.
I used this line but it did not work: DoCmd.SendObject (acSendReport, , acFormatPDF, "vtblfaculty.email&'@xxx.edu'","me@xxx.edu",,"test  ","this is a test",-1,,)I have been working on this forever!
Public Sub something3()
Dim db As Database
Dim rs As DAO.Recordset
Set db = CurrentDb
Set rs = db.OpenRecordset("SELECT DISTINCT tblsection.Faculty,  left(vtblfaculty.firstname,1)&vtblfaculty.lastname AS fn,  vtblfaculty.email FROM vtblfaculty INNER JOIN tblsection ON  tblsection.faculty=vtblfaculty.faculty WHERE term=" &  Forms!frmimport!cbxTerm)
[code]...
	View 6 Replies
    View Related
  
    
	
    	
    	Jun 26, 2014
        
        I would like to create a button that when pressed opens up an outlook email. The email address will be populated by one email address every time. I don't want it to automatically send as the body will need to be filled out by the user. It would be useful if the date and time it was sent could be recorded in the form somewhere too (would this be in a text box?).
	View 3 Replies
    View Related
  
    
	
    	
    	Dec 3, 2013
        
        I'm trying to see if can search outlook exchange from access vba to get email address (using windows user name) .
	View 1 Replies
    View Related
  
    
	
    	
    	Oct 15, 2014
        
        I found a code that will go trough an emailbox and export all emails to a table in access. This part is working OK (except the received date). I also wante to show in the table if the email contains an attachment, but that part is not working at all. The project actually is meant to store the emails on a shared drive and attachments and have the emails in Access so I can see them all and recall the one needed.
 
Code:
Private Sub Command14_Click()
Dim TempRst As DAO.Recordset
Dim rst As DAO.Recordset
[Code].....
	View 8 Replies
    View Related
  
    
	
    	
    	Aug 27, 2014
        
        I'm trying to write a line of VBA code (in an existing Access 2010 DB) that changes the Subject Line of all selected emails in my Outlook Inbox to today's date.
	View 1 Replies
    View Related
  
    
	
    	
    	May 2, 2014
        
        I have vba code set up to automate a query output to email with outlook.  I am having issues with the "TO" field.  I have tried different types of code, such as the following:
1) MyMail.To = MailList.Fields("EmailAddress")
2) MyMail.To = MailList.Fields("EmailAddress") & ";"
Both of these work, but the issue I am having is the "TO" field in the outlook message looks like this:
admin@blahblah#mailto:admin@blahblah#
Why my code is adding the email address twice, I need to get rid of the #mailto:admin@blahblah# but I do not know how or why it keeps adding that end part.  
	View 3 Replies
    View Related
  
    
	
    	
    	Mar 20, 2014
        
        i'm trying to send an Outlook e-mail from Access. Everything works fine except for one thing:
When generating the HTMLBody I use vbNewLine for starting a new line in the string that works fine as long as being in Access. However after displaying it in Outlook there are no any new lines in the mail text; the complete text is one mass. 
I tried to use Chr(13) but had the same result. 
	View 2 Replies
    View Related
  
    
	
    	
    	Sep 29, 2013
        
        I have code that automatically send emails out from an Access Customer Contacts Database. I am using Access and Outlook 2007 but the code needs to work with later versions of Access and Outlook.
 
I have very poor knowledge of coding and usually manage to cobble something together from looking at other code on the net but don't understand most of it.
 
I have the following code which works perfectly except I want to be able to embed an image in the email body (not have the image as an attachment but actually show it in the body of the email). 
 
Most of the code I have found around this topic is too complex for me to understand and utilise within the context of the code I have.
 
Ideally I want to take the image from an attachment field in a table returned by the "tblMailingList_Query".
Code:
Private Sub Command10_Click()
 Dim MyDB As Database
 Dim MyRS As Recordset
 Dim objOutlook As Outlook.Application
 Dim objOutlookMsg As Outlook.MailItem
[Code] .....
	View 2 Replies
    View Related
  
    
	
    	
    	Aug 27, 2014
        
        I have access db sending report with outlook every Monday.
But the problem is if outlook is open when I start the db, email goes in to outgoing folder and msg box of outlook opens saying " outlook will close after countdown if I do not hit the "DO NOT EXIT" button or "EXIT AND SEND LATER" button.
If I hit "EXIT AND SEND LATER" button, it sends next time I open the outlook.
Is it possible to prevent outlook doing this?
	View 14 Replies
    View Related
  
    
	
    	
    	Sep 11, 2014
        
        I wrote VBA code to pull email messages from Outlook in order to create an alert if a message with a specific subject line is not received. I have the system coded to send the alert if the message isn't found before the system encounters a message with a SentOn date/time more than two hours old.
 
The code has worked great for over a year, but now my company is migrating to Win8 and I'm having issues with the code. The machine that normally runs the process uses XP and Access 2007. The code also works on another machine running Windows 7 and Access 2010.
 
The issue I'm having in Win8, with Access 2010, is that the code isn't pulling the most recent message first. Instead, it is selecting a message from about two weeks ago, and then cycling through the other messages from that point. I know there are ways I can code around this, but I don't want to if I don't have to.
Is there a setting that I'm missing? I've included the basic code to pull the email messages below:
 
Code:
   DoCmd.SetWarnings False
   Dim ol As Outlook.Application
   Dim ns As Namespace
   Dim Inbox As MAPIFolder
   Dim Item As Object
   Dim strSubject, strSentDate As String
 
[Code] .....
	View 3 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
  
    
	
    	
    	Apr 25, 2015
        
        I am trying to fetch combobox dropdown text (in the networks label ) into the email body but in vain. 
Whichever networks are selected in the six dropdowns should go to email body  as you can find in the attachment ...
	View 1 Replies
    View Related
  
    
	
    	
    	Mar 5, 2015
        
        I have the following string of text that I currently push out to the body of an Outlook email (using the DoCmd.SendObject function with an Access report):
Code:
sMsgBody = "Please find attached the specified Final Costing Report for WO# " & WO & vbCr & vbCr
sMsgBody = sMsgBody & "Dealer: " & rs.Fields(0).Value & vbCr
sMsgBody = sMsgBody & "Model: " & rs.Fields(1).Value & " : " & rs.Fields(2).Value & " : " & rs.Fields(3).Value & " : " & rs.Fields(4).Value & vbCr
sMsgBody = sMsgBody & "Margin $: " & rs.Fields(5).Value & vbCr
sMsgBody = sMsgBody & "Margin %: " & rs.Fields(6).Value & vbCr
Which is great and works fine! It appears in the email like so:
Original.PNG
Now, it has been requested that the data to be left justified to the widest line... so, in this scenario, it would look like this:
Edit.PNG
I've searched for ways this might be accomplished so it's always left justified to the widest line, but haven't come across any definitive solutions yet.
	View 9 Replies
    View Related