blob: 9d4146e95b1b0c94103ac826347d414b2d022a30 [file] [log] [blame]
Hao Zhue0a36a82015-11-23 15:35:20 -05001#' Rmarkdown Format
2#'
3#' @description If the export format of the Rmarkdown document exist,
4#'
5#' @importFrom rmarkdown metadata
6#'
7#' @export
8
9rmd_format <- function(){
10 rmd_output_metadata <- metadata$output
Hao Zhuc1f38412017-02-23 12:13:48 -050011 # rmd_fmt <- ifelse(
12 # is.null(rmd_output_metadata),
13 # "markdown", ifelse(
14 # rmd_output_metadata %in% c("html_document", "rmarkdown::html_vignette"),
15 # "html",ifelse(
16 # rmd_output_metadata %in% c("pdf_document", "rmarkdown::tufte_handout"),
17 # "latex", "markdown"
18 # )))
19 return(names(rmd_output_metadata))
20}
21
22#' Load a LaTeX package
23#'
24#' @description Load a LaTeX package using R code. Just like `\\usepackage{}`
25#' in LaTeX
26#'
27#' @param name The LaTeX package name
28#' @param options The LaTeX options for the package
Hao Zhu78e61222017-05-24 20:53:35 -040029#'
30#' @examples usepackage_latex("xcolor")
Hao Zhuc1f38412017-02-23 12:13:48 -050031#' @export
32usepackage_latex <- function(name, options = NULL) {
33 invisible(knit_meta_add(list(latex_dependency(name, options))))
Hao Zhue0a36a82015-11-23 15:35:20 -050034}
Hao Zhu62cdde52017-05-20 22:16:03 -040035
36# Find the right xml section. Since xml_child + search name will result in a
37# crash (at least on my machine), here is a helper function.
38xml_tpart <- function(x, part) {
39 xchildren <- xml_children(x)
40 children_names <- xml_name(xchildren)
Hao Zhufc14c9b2017-05-22 14:03:22 -040041 if(!part %in% children_names) return(NULL)
Hao Zhu62cdde52017-05-20 22:16:03 -040042 return(xchildren[[which(children_names == part)]])
43}
44
45positions_corrector <- function(positions, group_header_rows, n_row) {
46 pc_matrix <- data.frame(row_id = 1:n_row)
47 pc_matrix$group_header <- pc_matrix$row_id %in% group_header_rows
48 pc_matrix$adj <- cumsum(pc_matrix$group_header)
49 pc_matrix$old_id <- cumsum(!pc_matrix$group_header)
50 pc_matrix$old_id[duplicated(pc_matrix$old_id)] <- NA
51 adjust_numbers <- pc_matrix$adj[pc_matrix$old_id %in% positions]
52 return(adjust_numbers + positions)
53}
Hao Zhu73604282017-06-11 22:08:48 -040054
55latex_row_cells <- function(x) {
56 strsplit(x, " \\& ")
57}
Hao Zhu2a87e8e2017-06-14 15:49:33 -040058
Hao Zhu2ce42b92017-06-15 17:15:33 -040059regex_escape <- function(x, double_backslash = FALSE) {
60 if (double_backslash) {
61 x <- gsub("\\\\", "\\\\\\\\", x)
62 }
63 x <- gsub("\\$", "\\\\\\$", x)
64 x <- gsub("\\(", "\\\\(", x)
65 x <- gsub("\\)", "\\\\)", x)
66 x <- gsub("\\[", "\\\\]", x)
67 x <- gsub("\\[", "\\\\]", x)
68 x <- gsub("\\{", "\\\\{", x)
69 x <- gsub("\\}", "\\\\}", x)
70 x <- gsub("\\*", "\\\\*", x)
71 return(x)
72}
Hao Zhu96a50b52017-06-14 18:09:35 -040073
Hao Zhuf2dfd142017-07-24 14:43:28 -040074as_kable_xml <- function(x) {
75 tmp <- tempfile(fileext = ".xml")
76 write_xml(x, tmp, options = "no_declaration")
77 out <- readLines(tmp)
78 out <- paste(out, collapse = "\n ")
79 out <- structure(out, format = "html", class = "knitr_kable")
80 return(out)
81}