First we will construct a simple text only message
<- gm_mime() %>%
text_msg gm_to("james.f.hester@gmail.com") %>%
gm_from("me@somewhere.com") %>%
gm_text_body("Gmailr is a very handy package!")
You can convert the message to a properly formatted MIME message using as.character()
.
strwrap(as.character(text_msg))
## [1] "MIME-Version: 1.0\r Date: Mon, 29 Nov 2021 15:58:17 GMT\r To:"
## [2] "james.f.hester@gmail.com\r From: me@somewhere.com\r Content-Type:"
## [3] "multipart/mixed; boundary=0339308a7f57af9e5826d966f9c71561\r \r"
## [4] "--0339308a7f57af9e5826d966f9c71561\r MIME-Version: 1.0\r Date: Mon, 29 Nov"
## [5] "2021 15:58:17 GMT\r Content-Type: text/plain; charset=utf-8;"
## [6] "format=flowed\r Content-Transfer-Encoding: quoted-printable\r \r Gmailr is a"
## [7] "very handy package!\r \r --0339308a7f57af9e5826d966f9c71561--\r"
You can also construct html messages. It is customary to provide a text only message along with the html message, but with modern email clients this is not strictly necessary.
<- gm_mime() %>%
html_msg gm_to("james.f.hester@gmail.com") %>%
gm_from("me@somewhere.com") %>%
gm_html_body("<b>Gmailr</b> is a <i>very</i> handy package!")
You can add attachments to your message in two ways.
gm_attach_file()
. The mime type is automatically guessed by mime::guess_type
, or you can specify it yourself with the type
parameter.write.csv(file = "iris.csv", iris)
<- html_msg %>%
msg gm_subject("Here are some flowers") %>%
gm_attach_file("iris.csv")
gm_attach_part()
to attach the binary data to your file.<- html_msg %>%
msg gm_attach_part(part = charToRaw("attach me!"), name = "please")
You can also add use attached images in HTML by setting the Content ID feature of mime emails. This can be done by referencing the image via a <img src=cid:xyz>
tag using the id
argument of send_file()
. The tag value can by any unique identifier. E.g. here is an example of including a ggplot2 image
# First create a plot to send, and save it to mtcars.png
$gear <- as.factor(mtcars$gear)
mtcars
png("mtcars.png", width = 400, height = 400, pointsize = 12)
with(mtcars,
plot(hp,
mpg,col = as.factor(gear),
pch = 19,
xlab = "Horsepower",
ylab = "Miles / gallon"
)
)legend("topright", title = "# gears",
pch = 19,
col = seq_along(levels(mtcars$gear)),
legend = levels(mtcars$gear)
)dev.off()
## quartz_off_screen
## 2
# Next create an HTML email that references the plot as 'foobar'
<- gm_mime() %>%
email gm_to('someaddress@somewhere.com') %>%
gm_from("someaddress@somewhere.com") %>%
gm_subject("Cars report") %>%
gm_html_body(
'<h1>A plot of <b>MotorTrend</b> data <i>(1974)</i></h1>
<br><img src="cid:foobar">') %>%
gm_attach_file("mtcars.png", id = "foobar")
You can upload any mime message into your gmail drafts using gm_create_draft()
. Be sure to give yourself at least compose
permissions first.
gm_create_draft(file_attachment)
This inserts the message directly into your mailbox, bypassing gmail’s default scanning and classification algorithms.
gm_insert_message(file_attachment)
This imports the email as though it was a normal message, with the same scanning and classification as normal email.
gm_insert_message(file_attachment)
gm_send_draft()
sends an email using the draft_id
of an existing draft (possibly created with gm_create_draft()
).
<- gm_drafts()
my_drafts
gm_send_draft(gm_id(my_drafts, "draft_id")[1])
You can also send an email message directly from a mime
object using gm_send_message()
.
gm_send_message(file_attachment)
It is possible to have a high-functioning Google account that does not have Gmail enabled. For example, your account might be fully operational with respect to Google Drive and yet have no mail capabilities. Such an account cannot be used with the Gmail API and therefore with gmailr
. However, you will still be able to complete the gmailr
authorization process via gmail_auth()
. The problem will only reveal itself upon the first attempt to use the API and it will look something like this:
Error in gmailr_POST(c("messages", "send"), user_id, class = "gmail_message", :
Gmail API error: 400
Mail service not enabled
You can confirm the account’s lack of mail capability by visiting https://mail.google.com/mail/ while logged in. If you don’t already have Gmail, this link gives you the option of adding mail to your existing account or creating a new, mail-capable account.