Modules & VBA :: Vanishing Commas When Exporting Report Into HTML Email Body

Jun 17, 2013

I'm running the following code to generate an email from a report.

Quote:

Function ExportHTML3()
Dim strline, strHTML
Dim OL As Outlook.Application

[Code].....

But I don't really know much VBA and I found that code on the internet, so I can't figure out how it's doing that and if I can stop it. Or is there another way to get the text from the HTML file into the Email body, which brings the bold formatting with it, like the following.

Incident Reference: AA99999

View Replies


ADVERTISEMENT

Modules & VBA :: Insert HTML File Into Body (inside Loop Email)

Apr 30, 2015

What I want to do is inset a html file into the body of the email . I have created a publisher file and saved as html ..say

C: estpub1.html

How do I get this in to the body ?

Code to date below (not the tidiest - but it works)

Private Sub Command0_Click()
Dim MyDb As DAO.Database
Dim rsEmail As DAO.Recordset
Dim OutApp As Object
Dim OutMail As Object
Dim strAttach1 As String

[Code] ......

View 9 Replies View Related

Email HTML Body Code

Aug 27, 2015

I can create PDF's, DOCX's retaining the PDF formatting save them back to different network locations and then retrieve and attach to emails that are generated for different areas, however I have been asked to scrap the attachment and insert the content of the attachment directly into the body of the email. I have had a good browse around the net with no real approach. The code below simply gets the recepients email address adds the subject and then is looking for the .HTMLBody which simply comes through in the body as

"O:divAKLResgroupE - ReportsHTML FilesDRAFT TEST .html".

.To = RScoloumdetail(2) ' Gets Email Address
.CC = ""
.BCC = ""

[code]....

View 2 Replies View Related

General :: HTML Body In Email Sent From Access

Sep 18, 2012

I have a database to send e-mails from access trough Outlook. The issue is that I would like the body of the e-mail to have hyperlinks, colours, bolds and that I can get it from plain text.

This is the code I have:

Dim MyDB As Database
Dim MyRS As Recordset
Dim MyTable As Recordset
Dim objOutlook As Outlook.Application
Dim objOutlookMsg As Outlook.MailItem
Dim objOutlookRecip As Outlook.Recipient
Dim objOutlookAttach As Outlook.Attachment

[Code] ....

How can I make the body to be HTML format, or, can I have a e-mail template storaged in my PC and then indicate to use it whenever the e-mail is sent?

View 4 Replies View Related

Sending Reports With Email Body Having HTML

Nov 20, 2014

I need to send different reports to a bunch of different persons every hour... I had several macros that did it for me, But Then they wanted me to include a e-mail body that was more than 255chars, so i had to go VBA and i have this (for every set of persons and Reports):

Private Sub Command38_Click()
On Error GoTo ErrorHandler
DoCmd.SendObject acReport, "REPORT NAME", "Extension", "EMAILS", "", "SUBJECT", "EMAIL BODY", True, ""
ExitHandler:
Set rs = Nothing
Set db = Nothing
Exit Sub
ErrorHandler:

[code]....

so everything is good, but NOW they want the body of the email to contain another paragraph totally separated from the first one and they want it highlited and also in Red, How can i add Html to this or do i have to use another method?

I have tried this:

Public Sub TestEmail()
Dim appOutLook As Outlook.Application
Dim MailOutLook As Outlook.MailItem
Set appOutLook = CreateObject("Outlook.Application")

[code]...

But it keeps on giving me errors, about objects not being defined.

View 14 Replies View Related

Modules & VBA :: How To Display All Records From Report On Email Body

Nov 16, 2014

With this very simple command, I have the ability to send emails to several clients, reporting many things, quotations etc.

Private Sub Command84_Click()
DoCmd.SendObject , , , , , , "SOMETHING", [SalesGroupingField] & "" & [1], True, ""
End Sub

Now, i want, on the body of the emai, to display many records, it is from Nothwind, how can i display on the body of the email all records from this report?

View 10 Replies View Related

Adding Report Content Into Email Body

Jul 30, 2014

I am trying to work my way into putting the content of my report into the body of an e-mail. I have used the following code to do so but I keep on getting the error: "An Expression You Entered Is the Wrong Data Type for one of the Arguments"

Code:
Private Sub Command278_Click()
On Error GoTo ER
Dim db As Database
Dim rstOpenPurchaseOrders As Recordset
Dim strSQL As String

[Code] .....

View 14 Replies View Related

Access 2010 - VBA Code - Add Report To Body Of Email?

Feb 25, 2013

Access 2010 - add report to body of an email

i have VBA code to create an email and attach an excel file, what i would like is code to add a report called REPORTMISSINGDATES to the body of the email.

this is the code i have so far, which works and adds everythng i wqant except the main body of the email.

Private Sub Command31_Click()
On Error GoTo Command31_Click_Err
Dim Email As String
Dim name As Variant
Dim EMPloy As Variant
Dim month As Variant
month = MonthName([Forms]![STAFFATTENDANCEMenu]![StaffMonth])
EMPloy = Forms!staffattendancezone!Staff
name = DLookup("[STAFFNAME]", "[QRYSTAFFNAME]", "[ASA] = Forms!staffattendancezone!Staff")
Email = (Forms!STAFFATTENDANCEAdjust!Email)
DoCmd.SendObject acQuery, "STAFFATTENDANCEZONECheckEmployee", "ExcelWorkbook(*.xlsx)", [email], "", "", "" & "Attendance Errors", "THIS IS WHERE I WANT THE REPORT TO GO" _
End Sub

View 1 Replies View Related

Modules & VBA :: Include Query In Body Of Email

Jan 30, 2014

I have a query table in Access 2007 with requests pending an individuals review and approval. I would like to create an automatic email each day to that individual which includes the actual query table impeded as part of the body of the email (not as an attachment).

View 1 Replies View Related

Modules & VBA :: Using Query To Put Data In Email Body?

Apr 22, 2015

I'm trying to put multiple records of data from a subform in a single e-mail, and my Outlook calendar. I have a contracting business, and on my Orders form (which details a single client), I have a sub-form that lists all the items to be done at that client's home (a different record for each work item). When I send an e-mail, or post the appointment to the Outlook calendar, I am trying to list all those records in the body of the e-mail, and/or in the Notes section of the appointment. I created the query to call the records, but have not figured out a way to use it in the code.

View 14 Replies View Related

Modules & VBA :: Send Two Reports In Email Body?

Jan 15, 2015

With the code below , I send the report: “ESERT4H”, in email body. How I could add yet another report on the same body of the email ?

DoCmd.OutputTo acOutputReport, "ESERT4H", "HTML(*.html)", "D:Access empESERT4H.html", False, "", 0, acExportQualityScreen
Dim Out As Outlook.Application
Dim NS As Outlook.NameSpace
Dim Folder As MAPIFolder
Dim Mens As MailItem

[Code] ....

View 7 Replies View Related

Modules & VBA :: Adding NameStr In Email Body

Jul 16, 2014

NameStr As String

I have made a name string

Now I would like to add the nameStr near "Dear " how can i do this?

strbody = "<H3><B>Dear [I want the placed nameStr here] </B></H3>" & _
bodyStr & _
"<br><br><B>Thank you</B>"

View 1 Replies View Related

Modules & VBA :: How To Import Email Body Into Access Table

Sep 11, 2013

I want to import email data into my access table. The email format is always same and the fields in the email match with the fileds in my table.

View 1 Replies View Related

Modules & VBA :: Count Of Serial Number In Email Body

Jul 15, 2013

I am attempting to modify some code that is used for reading content in an Outlook mail and need to catch and move the email if certain content is duplicated in the email.

The code reads the email that is in the attached image format:

As seen, this email contains 2 devices, but the Serial No in both is duplicated.

In the code, I need to capture this and rather than reading the contents, I need to just move this email to a separate "Manual" folder to be dealt with separately, so not to write the information to the database.

The current code is as follows:

Option Explicit
Private ns As Outlook.Namespace
Private sEmailAddress As String
Private sPerson As String
Private dReceived As Date

[Code] .....

View 4 Replies View Related

Modules & VBA :: How To Insert Carriage Returns In Body Text Of Email

Sep 9, 2013

I have developed a private sub which automatically creates an email when a button is pushed.

The code is working well, but I need to insert Carriage Returns in the Body Text of the email just before the word "Please" where it appears in two places. Is this possible?

The code for the private sub is below.

Private Sub PublishROI_Click()
On Error GoTo Err_PublishROI_Click
DoCmd.SendObject acSendReport, "PSR_Rcd_of_Investigation_Rpt_Publish", acFormatPDF, Me.txtEmail & ";" & Me.txtRMEmail, Me.StorageEmail, , _
Me.txtPSRNum, _

[Code] ....

View 3 Replies View Related

Modules & VBA :: Fetch Combobox Text In Email Body Of Outlook?

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

Modules & VBA :: Body Of Outlook Email - Left Justify String

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

Modules & VBA :: Send Query Results In Table In Body Of Email

May 24, 2014

I have created some code to get the records of a query and it puts them in the body of the email but it doesn't format it well for example the email looks like

James | halliwell | 31
Leanne | smith |27
Alexis | smith |8

I would like it to be in a table is this possible,

Code:
Public Function SendEmail()
Dim MyDB As DAO.Database
Dim rst As DAO.Recordset
Set MyDB = CurrentDb

[Code] .....

View 3 Replies View Related

Modules & VBA :: Email From Access Form - Random 0 Appear In Message Body

Jun 15, 2014

The code works perfectly except that a random "0" appears in the body of the email. How to correct the code to remove this annoying little "0"?

Private Sub Command62_Click()
Dim strSubject As String
strSubject = Me.LoadNo
DoCmd.SendObject _

[Code] .....

View 1 Replies View Related

Exporting Numbers With Commas After Each

Dec 27, 2005

Hi All:

I am exporting 9-digit ID numbers from access using a macro and the Transport Text and Export Delimited feature.

I wish to have a comma after every ID number that is exported.

Any ideas out there?

Many, many thanks

Regards,

Dion

Dion

View 1 Replies View Related

Modules & VBA :: Sending Email - Carriage Return Not Working In Message Body

Jul 9, 2013

I am sending an email from a button, and it runs a word merge and then attaches that word document and two others two an email. All that works fine, but in the body of the email the carriage return is not working.

I've tried "vbCrLf", "Chr(13)" and "Chr(10)". but none of them are working in this email. I use vbCrLf all of the time in many other emails and it works fine.

Code:

Public Function SendEmailFinancial()
Dim MessageBody, vAttach1, vAttach2, vAttach3, vTo
Dim appOutLook As Outlook.Application
Dim MailOutLook As Outlook.MailItem

[Code] ...

This is what the email is looking like when it comes out:

Project ID: 2013YG00229 Project Title: Toolbox Talks Construction Safety Guides and Mobile App Program Manager: Shana Peschek I am attaching three (3) forms that are needed in order for the State of Washington to process grant payments for your organization for the purposes of carrying out the activities outlined in your final approved application.

View 1 Replies View Related

Modules & VBA :: HTML Format Email With Hyperlink

Aug 20, 2014

I am using the following vba code to create and send an html format email message. The key information in the email is a hyperlink to a network drive folder location using [Directory] as a hyperlink table value to get the address that is stored like this:
K:PipelinesP9 - TEP ProductsMOP AID-1500Final Approved

The email hyperlink that is produced looks like this:

#K:PipelinesP9_-_TEP_ProductsMOP_AID-
Dim appOutLook As Outlook.Application
Dim MailOutLook As Outlook.MailItem
Dim MOPVDB As String
MOPVDB = "H:PGADSBYMOP VALIDATIONTRACKINGMOPVDBMOP Validation DatabaseFE.accdb"
Set appOutLook = CreateObject("Outlook.Application")

[code]...

View 1 Replies View Related

Forms :: Email Using User Selected HTML Template With Optional Report As Attachment

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

Modules & VBA :: Subform In Continuous Records Format - Send Contents Into The Body Of Email

Nov 10, 2014

I have a subform in Continuous Records format (records displayed are determined by controls on the parent). I would like to create a button that prepares an email and copies the contents of that subform in to the body of an email message.

The email. I have a method to create a new email, set To, CC, Subject and even Message Text.

Code:
strTo = txtName
strCC = txtManager
strSubject = "Something"
strMessage = "Hi, please find below list of details from X Y and Z" & vbnewline & vbnewline

That all works. Thats fine

The Records: I have found ways to have them added as an attachment, either the the SendObject and OutputTo method but I would like the list of records to be converted to a text string so I can include it within my strMessage variable, not include it as an attachment.

Code:
strMessage = strMessage & "Subform Records to go here"...

View 7 Replies View Related

Modules & VBA :: Lotus Notes Email In Html Format

Jul 2, 2014

I'm trying to create a lotus notes email through vba that contains data from one of my access tables. Since I'd like the data to be displayed in a tabular fashion, I'm trying to format the body of the email in html.

View 1 Replies View Related

Modules & VBA :: Change HTML Text On Email If Checkbox Selected

Feb 18, 2014

I have the following code which works perfectly BUT I want to be able to add another line of text if users enable a checkbox. I have tried everything I can think of but can't get it to work. When using an "IF check150" statement it just adds the extra text in regardless of selection or not.

Code:

Function Mail_Radio_Outlook6(activedoc As String)
Dim OutApp As Object
Dim OutMail As Object
Dim strbody As String
Dim acc_req As String
Set OutApp = CreateObject("Outlook.Application")

[Code] ....

This is fine most of the time but If a user ticks check150 I want to add another paragraph.

Do I use an IF statement, if so in what format? is it a separate function etc?

I am slowly getting more familiar with Access but still come unstuck on the simplest of things at times.

View 3 Replies View Related







Copyrights 2005-15 www.BigResource.com, All rights reserved