#' Convert tex/markdown/html to docx/tex/html
#'
#' Use \href{pandoc}{http://johnmacfarlane.net/pandoc/} to convert
#' tex/markdown/html to docx (or tex/html) for those colleagues who use docx.
#'
#' @param in.file A character vector of the tex/md file.
#' @param out.file A character vector of the outfile. If \code{"replace"} over
#' writes the original HTML file. Default, \code{NULL}, uses the root name of
#' the \code{in.file} plus a number 2.
#' @param path The path to where the documents reside/should be created.
#' Default is the REPORT directory. This conveniently allows for non paths to
#' be supplied to \code{in.file} and \code{out.file} (i.e., just the file
#' names). Paths can be supplied to \code{in.file} and \code{out.file} by
#' setting \code{path} to \code{NULL}.
#' @param bib.loc Optional path to a .bib resource.
#' @details The user must have pandoc installed and on their path. pandoc can
#' be installed from: \cr \href{http://johnmacfarlane.net/pandoc/installing.html}{http://johnmacfarlane.net/pandoc/installing.html}
#' @note \code{md2docx}, \code{md2tex} and \code{md2pdf} converts markdown
#' (a .md file) not Rmarkdown (.Rmd). Use knitr to knit to HTML first (this
#' creates the .md file).
#' @rdname doc2doc
#' @export
#' @importFrom tools file_ext file_path_sans_ext
#' @examples
#' \dontrun{
#' DOC <- system.file("extdata/doc_library/apa6.qual_tex/doc.tex",
#' package = "reports")
#' BIB <- system.file("extdata/docs/example.bib", package = "reports")
#' tex2docx(DOC, file.path(getwd(), "test.docx"), path = NULL, bib.loc = BIB)
#' }
tex2docx <-
function(in.file = NULL, out.file = NULL, path = QP(),
bib.loc = getOption("bib.loc")) {
if (!is.null(path)) {
WD <- getwd()
on.exit(setwd(WD))
setwd(path)
if (is.null(in.file)) {
in.file <- dir(path)[file_ext(dir(path)) == "tex"]
in.file <- in.file[!in.file %in% "preamble.tex"][1]
}
if (is.null(out.file)) {
out.file <- paste0(file_path_sans_ext(in.file), ".docx")
}
}
action <- paste0(wheresPandoc(), " -s ", shQuote(in.file), " -o ", shQuote(out.file))
if (!is.null(bib.loc)) {
action <- paste0(action, " --bibliography=", shQuote(bib.loc))
}
system(action)
message("docx file generated!")
}
#' @rdname doc2doc
#' @export
tex2html <-
function(in.file = NULL, out.file = NULL, path = QP(),
bib.loc = getOption("bib.loc")) {
if (!is.null(path)) {
WD <- getwd()
on.exit(setwd(WD))
setwd(path)
if (is.null(in.file)) {
in.file <- dir(path)[file_ext(dir(path)) == "tex"]
in.file <- in.file[!in.file %in% "preamble.tex"][1]
}
if (is.null(out.file)) {
out.file <- paste0(file_path_sans_ext(in.file), ".html")
}
}
action <- paste0(wheresPandoc(), " -s ", shQuote(in.file), " -o ", shQuote(out.file))
if (!is.null(bib.loc)) {
action <- paste0(action, " --bibliography=", shQuote(bib.loc))
}
system(action)
message("html file generated!")
}
#' @rdname doc2doc
#' @export
md2docx <-
function(in.file = NULL, out.file = NULL, path = QP(),
bib.loc = getOption("bib.loc")) {
if (!is.null(path)) {
WD <- getwd()
on.exit(setwd(WD))
setwd(path)
if (is.null(in.file)) {
in.file <- dir(path)[file_ext(dir(path)) %in% "md"]
}
if (is.null(out.file)) {
out.file <- paste0(file_path_sans_ext(in.file), ".docx")
}
}
action <- paste0(wheresPandoc(), " -s ", shQuote(in.file), " -o ", shQuote(out.file))
if (!is.null(bib.loc)) {
action <- paste0(action, " --bibliography=", shQuote(bib.loc))
}
system(action)
message("docx file generated!")
}
#' @rdname doc2doc
#' @export
md2html <-
function(in.file = NULL, out.file = NULL, path = QP(),
bib.loc = getOption("bib.loc")) {
if (!is.null(path)) {
WD <- getwd()
on.exit(setwd(WD))
setwd(path)
if (is.null(in.file)) {
in.file <- dir(path)[file_ext(dir(path)) %in% "md"]
}
if (is.null(out.file)) {
out.file <- paste0(file_path_sans_ext(in.file), ".html")
}
}
action <- paste0(wheresPandoc(), " -s ", shQuote(in.file), " -o ", shQuote(out.file))
if (!is.null(bib.loc)) {
action <- paste0(action, " --bibliography=", shQuote(bib.loc))
}
system(action)
message("html file generated!")
}
#' @rdname doc2doc
#' @export
md2tex <-
function(in.file = NULL, out.file = NULL, path = QP(),
bib.loc = getOption("bib.loc")) {
if (!is.null(path)) {
WD <- getwd()
on.exit(setwd(WD))
setwd(path)
if (is.null(in.file)) {
in.file <- dir(path)[file_ext(dir(path)) %in% "md"]
}
if (is.null(out.file)) {
out.file <- paste0(file_path_sans_ext(in.file), ".tex")
}
}
action <- paste0(wheresPandoc(), " -s ", shQuote(in.file), " -o ", shQuote(out.file))
if (!is.null(bib.loc)) {
action <- paste0(action, " --bibliography=", shQuote(bib.loc))
}
system(action)
message("tex file generated!")
}
#' @rdname doc2doc
#' @export
md2pdf <-
function(in.file = NULL, out.file = NULL, path = QP(),
bib.loc = getOption("bib.loc")) {
if (!is.null(path)) {
WD <- getwd()
on.exit(setwd(WD))
setwd(path)
if (is.null(in.file)) {
in.file <- dir(path)[file_ext(dir(path)) == "md"]
}
if (is.null(out.file)) {
out.file <- paste0(file_path_sans_ext(in.file), ".pdf")
}
}
action <- paste0(wheresPandoc(), " -s ", shQuote(in.file), " -o ", shQuote(out.file))
if (!is.null(bib.loc)) {
action <- paste0(action, " --bibliography=", shQuote(bib.loc))
}
system(action)
message("pdf file generated!")
}
## Not exported
md2beamer <-
function(in.file = NULL, out.file = NULL, path = QP(), theme = "Warsaw",
bib.loc = getOption("bib.loc")) {
if (!is.null(path)) {
WD <- getwd()
on.exit(setwd(WD))
setwd(path)
if (is.null(in.file)) {
in.file <- dir(path)[file_ext(dir(path)) == "md"]
}
if (is.null(out.file)) {
out.file <- paste0(file_path_sans_ext(in.file), "_beamer.pdf")
}
}
action <- paste0(wheresPandoc(), " -t beamer ", shQuote(in.file), " -o ", shQuote(out.file))
if (!is.null(bib.loc)) {
action <- paste0(action, " --bibliography=", shQuote(bib.loc))
}
system(action)
message("beamer file generated!")
}
#' @rdname doc2doc
#' @export
html2pdf <-
function(in.file = NULL, out.file = NULL, path = QP(),
bib.loc = getOption("bib.loc")) {
if (!is.null(path)) {
WD <- getwd()
on.exit(setwd(WD))
setwd(path)
if (is.null(in.file)) {
in.file <- dir(path)[file_ext(dir(path)) == "html"]
}
if (is.null(out.file)) {
out.file <- paste0(file_path_sans_ext(in.file), ".pdf")
}
}
action <- paste0(wheresPandoc(), " -s ", shQuote(in.file), " -o ", shQuote(out.file))
if (!is.null(bib.loc)) {
action <- paste0(action, " --bibliography=", shQuote(bib.loc))
}
system(action)
message("pdf file generated!")
}
Add the following code to your website.
For more information on customizing the embed code, read Embedding Snippets.