Modules & VBA :: Adding Email Address To TO Field In Outlook
			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 Replies
  
    
		
ADVERTISEMENT
    	
    	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
  
    
	
    	
    	Feb 3, 2015
        
        I'm using an unbound text box and a command button to filter a list of contacts on a continuous form.  The continuous form has a query for the record source and the list ends up showing only what is in the strWhere filter
    Me.Filter = strWhere
    Me.FilterOn = True
Is there a way to have Access 2003 take this filtered list and populate the To: field in Outlook or whatever the default mail client is?  Each email needs to be deliminated by ";"
	View 5 Replies
    View Related
  
    
	
    	
    	Aug 21, 2014
        
        My situation is that , I have a sub for sending an email to a single client on the current form. Using a record set works fine, I now wish to have 
.Cc email address which is not part of the Record set ." its to the department head". strEmailAddress = rst![clientEmail] & " ;" & somebody@ntlworld.com
 My question is can I type the somebody email address as indicated in red in the above line? to enable the email to go to both addressees .  
set DoCmd.SendObject , , acFormatRTF, clientEmail, _ , , strSubject, strEMailMsg, False, False? 
I would prefer to use the Do Cmd SendObject is this is achievable
	View 2 Replies
    View Related
  
    
	
    	
    	Oct 15, 2013
        
        I'm working on a database which holds information about clients. This also has a linked table which pulls information from my outlook inbox. Basically what I want is a way to sort the emails into the appropriate contacts page. I have created a sub form which is linked to the contact form and pulls info from the email table. The sub form is linked by the 'from' field in the linked email table to the 'email address' field in the contact form.
This all seems to work exactly as I want when the email address is displayed as the display name of the client however most of the time, the display name in outlook is either the contacts name or their company name.
I suppose my question is this, how can I tell access to pull the email address from outlook instead of the display name? I may be missing something here but this seems like something that should be available as standard doesn't it?
	View 13 Replies
    View Related
  
    
	
    	
    	Nov 21, 2013
        
        Is it possible to send an email after pressing a button to an email address which is within a field? If so where should I start?
	View 6 Replies
    View Related
  
    
	
    	
    	Dec 9, 2013
        
        I am opening a new mail message in outlook using a button in a form.I want to change the "from" email address to a specific inbox (NOT personal email). Even though the email address is switched, after I hit sent and check my sent items - the email is actually sent from my personal email address and not from the inbox email address i wanted it to be sent from. I have access/permission to sent emails from the other inbox.
Is there a way to make sure emails are sent from specific email addresses and not ONLY personal inbox.What I read online is probably because of some "network" connection issues. Is there a way refresh connection between access and outlook? I am not even sure what the problem is.
	View 1 Replies
    View Related
  
    
	
    	
    	Mar 15, 2012
        
        In an ACCESS DATABASE I have 2 fields
-email_address
-language
I want make double click on email_address field and open a specific files msg
example :
double click on gimec.roberto@gmail.com
if the language is ITALIAN open in OUTLOOK file ITALIAN.msg
if the language is RUSSIAN open in OUTLOOK file RUSSIAN.msg
	View 1 Replies
    View Related
  
    
	
    	
    	Jan 19, 2015
        
        I am currently using vb code to send an email in Access on the click of a button. I want the database user to be able to enter the recipient in a text box [ToEmail] which is on form [GroupStockProfiler]. However, I'm unsure how to put this into my code. I currently have the following which doesn't work (unless I put a specific email after 'To'):
 
Private Sub Command414_Click()
Const cdoSendUsingPickup = 1
Const cdoSendUsingPort = 2
Const cdoAnonymous = 0
[code]...
	View 1 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
  
    
	
    	
    	Nov 4, 2014
        
        I have a field which contains various text including an email address which i need to extract.
My research says that I need to use a regex code  but dont know how to get that into Access.
I have attached an example of the file i'm importing into Access.
	View 5 Replies
    View Related
  
    
	
    	
    	Jul 14, 2014
        
        I can already send emails out as PDF files when an email address exists, however, I'm trying to validate whether or not an email address does actually exist.  My problem is, there are four possible locations where an email address could be: MainEmail or Contact1Email or Contact2Email or Email (the last one - Email - is in a separate table).  
Four text boxes exist on the form that is being actioned (the form is based on a query to extract the relevant information) and are available to test for an email address being present. What I'm struggling with is ensuring that the 'To' box in Outlook always gets populated or Outlook chucks a hissy fit.  I have been trying various IF Then Else and Do Loop plus a myriad of other ways but none are reliable, especially if no email address is present which can be the case.
	View 14 Replies
    View Related
  
    
	
    	
    	Sep 4, 2013
        
        I have a table that holds company information for the user - eg farm name, company name, manager, phone number and email address etc. Its simply used to provide headers for reports, so that the same generic database can be used on several farms. There is only one record in this table tblfarmdetails.The second table tblorder is for orders and receipts - I currently have code that allows the user to send an order request by email to the manager, and to also send notice of receipt of goods through to the manager. I would like the code to get the email address from the unrelated table.Can I reference this field in the vba?
Private Sub cmdemailorder_Click()
Dim orderdate As String
Dim stafford As String
Dim item As String
Dim itemamnt As String
[code]....
	View 8 Replies
    View Related
  
    
	
    	
    	Jun 13, 2013
        
        One of my clients has asked me to look at building a way to check if the email addresses they are capturing in my CRM are valid. He want's to go beyond checking for no "@" etc.
From what I've seen, it looks like a reverse DNS check (might be totally wrong) is the way to go. IE: check if the email is valid. I've see a few tools online that can do it one by one (which I could parse to if I had to) - but ideally I'd like to be able to run this from a VBA script.
	View 9 Replies
    View Related
  
    
	
    	
    	Sep 17, 2012
        
        I have a form where the user puts in a email address, eg test @ myserver.net
So the link opens a new mail it has to be prefixed by mailto:
How can I automatically replace the address the user enters with the format mailto:test@myserver.net
	View 3 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
  
    
	
    	
    	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