Skip to content

Commit

Permalink
Fix issues with HTML bodies
Browse files Browse the repository at this point in the history
  • Loading branch information
jimhester committed Apr 1, 2016
1 parent cec565a commit d5db6a7
Showing 1 changed file with 2 additions and 2 deletions.
4 changes: 2 additions & 2 deletions R/mime.R
Original file line number Diff line number Diff line change
Expand Up @@ -193,7 +193,7 @@ as.character.mime <- function(x, newline="\r\n") {
)
headers <- format_headers(x$header, newline = newline)

paste0(headers, sep, encoded_body, end)
paste0(headers, encoded_body, end)
}

parse_content_type <- function(header) {
Expand Down Expand Up @@ -221,7 +221,7 @@ format_headers <- function(headers, newline) {
if(length(keep_headers) %==% 0L){
return(NULL)
}
paste0(paste(sep = ": ", collapse = newline, names(keep_headers), keep_headers), newline)
paste0(paste(sep = ": ", collapse = newline, names(keep_headers), keep_headers), newline, newline)
}

with_defaults <- function(defaults, ...){
Expand Down

0 comments on commit d5db6a7

Please sign in to comment.