blob: 5fb9adca8aeb68514d67f0acd738161b2c369f82 [file] [log] [blame]
Hao Zhudb04e302015-11-15 16:57:38 -05001#' Magic mirror that returns kable's attributes
2#'
Hao Zhuf7994dd2017-02-27 16:58:42 -05003#' @description Mirror mirror tell me, how does this kable look like?
4#'
5#' @param kable_input The output of kable
Hao Zhu78e61222017-05-24 20:53:35 -04006#'
7#' @examples magic_mirror(knitr::kable(head(mtcars), "html"))
Hao Zhudb04e302015-11-15 16:57:38 -05008#' @export
9
Hao Zhuf7994dd2017-02-27 16:58:42 -050010magic_mirror <- function(kable_input){
11 if (!"knitr_kable" %in% attr(kable_input, "class")) {
Hao Zhudb04e302015-11-15 16:57:38 -050012 warning("magic_mirror may not be able to produce correct result if the",
13 " input table is not rendered by knitr::kable. ")
14 }
Hao Zhu32f43f72017-06-20 18:24:54 -040015 if ("kable_meta" %in% names(attributes(kable_input))) {
16 return(attr(kable_input, "kable_meta"))
Hao Zhu9b45a182017-02-27 18:17:46 -050017 }
Hao Zhuf7994dd2017-02-27 16:58:42 -050018 kable_format <- attr(kable_input, "format")
19 if (kable_format == "latex") {
20 kable_info <- magic_mirror_latex(kable_input)
Hao Zhudb04e302015-11-15 16:57:38 -050021 }
Hao Zhuf7994dd2017-02-27 16:58:42 -050022 if (kable_format == "html") {
23 kable_info <- magic_mirror_html(kable_input)
Hao Zhudb04e302015-11-15 16:57:38 -050024 }
Hao Zhu4adea852015-11-16 16:38:34 -050025 return(kable_info)
Hao Zhudb04e302015-11-15 16:57:38 -050026}
27
Hao Zhu953f3bd2017-07-28 11:43:40 -040028# Magic mirror for latex tables --------------
Hao Zhuf7994dd2017-02-27 16:58:42 -050029magic_mirror_latex <- function(kable_input){
Hao Zhuc05e1812017-02-25 01:45:35 -050030 kable_info <- list(tabular = NULL, booktabs = FALSE, align = NULL,
31 valign = NULL, ncol = NULL, nrow = NULL, colnames = NULL,
Hao Zhud57c2d72017-08-16 22:51:17 -040032 rownames = NULL, caption = NULL, caption.short = NULL,
33 contents = NULL,
Hao Zhuc05e1812017-02-25 01:45:35 -050034 centering = FALSE, table_env = FALSE)
Hao Zhu4adea852015-11-16 16:38:34 -050035 # Tabular
36 kable_info$tabular <- ifelse(
Hao Zhuf7994dd2017-02-27 16:58:42 -050037 grepl("\\\\begin\\{tabular\\}", kable_input),
Hao Zhu4adea852015-11-16 16:38:34 -050038 "tabular", "longtable"
Hao Zhudb04e302015-11-15 16:57:38 -050039 )
Hao Zhu4adea852015-11-16 16:38:34 -050040 # Booktabs
Hao Zhuf7994dd2017-02-27 16:58:42 -050041 kable_info$booktabs <- grepl("\\\\toprule", kable_input)
Hao Zhu4adea852015-11-16 16:38:34 -050042 # Align
43 kable_info$align <- gsub("\\|", "", str_match(
Hao Zhubff01912017-05-23 18:05:00 -040044 kable_input, paste0("\\\\begin\\{",
45 kable_info$tabular,"\\}.*\\{(.*?)\\}"))[2])
46 kable_info$align_vector <- unlist(strsplit(kable_info$align, ""))
Hao Zhuf4b35292017-06-25 22:38:37 -100047 kable_info$align_vector_origin <- kable_info$align_vector
Hao Zhuc05e1812017-02-25 01:45:35 -050048 # valign
49 kable_info$valign <- gsub("\\|", "", str_match(
Hao Zhuf7994dd2017-02-27 16:58:42 -050050 kable_input, paste0("\\\\begin\\{", kable_info$tabular,"\\}(.*)\\{.*?\\}"))[2])
Hao Zhubff01912017-05-23 18:05:00 -040051 kable_info$valign2 <- sub("\\[", "\\\\[", kable_info$valign)
52 kable_info$valign2 <- sub("\\]", "\\\\]", kable_info$valign2)
53 kable_info$valign3 <- sub("\\[", "", kable_info$valign)
54 kable_info$valign3 <- sub("\\]", "", kable_info$valign3)
55 kable_info$begin_tabular <- paste0("\\\\begin\\{", kable_info$tabular, "\\}",
56 kable_info$valign2)
57 kable_info$end_tabular <- paste0("\\\\end\\{", kable_info$tabular, "\\}")
Hao Zhu4adea852015-11-16 16:38:34 -050058 # N of columns
59 kable_info$ncol <- nchar(kable_info$align)
Hao Zhu4adea852015-11-16 16:38:34 -050060 # Caption
Hao Zhud57c2d72017-08-16 22:51:17 -040061 if (str_detect(kable_input, "caption\\[")) {
62 kable_info$caption.short <- str_match(kable_input, "caption\\[(.*?)\\]")[2]
63 kable_info$caption <- str_match(kable_input, "caption.*?\\{(.*?)\\n")[2]
64 } else {
65 kable_info$caption <- str_match(kable_input, "caption\\{(.*?)\\n")[2]
66 }
67 if (kable_info$tabular == "longtable") {
68 kable_info$caption <- str_sub(kable_info$caption, 1, -4)
69 } else {
70 kable_info$caption <- str_sub(kable_info$caption, 1, -2)
71 }
Hao Zhudc4b7142015-11-19 10:37:53 -050072 # N of rows
Hao Zhuf7994dd2017-02-27 16:58:42 -050073 kable_info$nrow <- str_count(kable_input, "\\\\\n") -
Hao Zhudc4b7142015-11-19 10:37:53 -050074 # in the dev version (currently as of 11.2015) of knitr, when longtable is
75 # enabled, caption is moved inside the tabular environment. As a result,
76 # the number of rows should be adjusted.
77 ifelse(
78 kable_info$tabular == "longtable" & !is.na(kable_info$caption) &
Hao Zhuf7994dd2017-02-27 16:58:42 -050079 !str_detect(kable_input, "\\\\begin\\{table\\}\\n\\n\\\\caption"),
Hao Zhudc4b7142015-11-19 10:37:53 -050080 1,0
81 )
Hao Zhu4adea852015-11-16 16:38:34 -050082 # Contents
Hao Zhuf7994dd2017-02-27 16:58:42 -050083 kable_info$contents <- str_match_all(kable_input, "\n(.*)\\\\\\\\")[[1]][,2]
Hao Zhu2ce42b92017-06-15 17:15:33 -040084 kable_info$contents <- regex_escape(kable_info$contents, T)
Hao Zhua3fc0c42017-02-27 12:04:59 -050085 if (kable_info$tabular == "longtable" & !is.na(kable_info$caption)) {
86 kable_info$contents <- kable_info$contents[-1]
87 }
Hao Zhu4adea852015-11-16 16:38:34 -050088 # Column names
89 kable_info$colnames <- str_split(kable_info$contents[1], " \\& ")[[1]]
90 # Row names
91 kable_info$rownames <- str_extract(kable_info$contents, "^[^ &]*")
Hao Zhuc05e1812017-02-25 01:45:35 -050092
Hao Zhuf7994dd2017-02-27 16:58:42 -050093 kable_info$centering <- grepl("\\\\centering", kable_input)
Hao Zhuc05e1812017-02-25 01:45:35 -050094
95 kable_info$table_env <- (!is.na(kable_info$caption) &
96 kable_info$tabular != "longtable")
Hao Zhu4adea852015-11-16 16:38:34 -050097 return(kable_info)
Hao Zhudb04e302015-11-15 16:57:38 -050098}
Hao Zhu8977a8a2015-11-19 16:52:21 -050099
Hao Zhu953f3bd2017-07-28 11:43:40 -0400100# Magic Mirror for html table --------
Hao Zhuf7994dd2017-02-27 16:58:42 -0500101magic_mirror_html <- function(kable_input){
102 kable_info <- list()
Hao Zhu558c72f2017-07-24 15:12:00 -0400103 kable_xml <- read_kable_as_xml(kable_input)
Hao Zhu8977a8a2015-11-19 16:52:21 -0500104 # Caption
Hao Zhuf7994dd2017-02-27 16:58:42 -0500105 kable_info$caption <- xml_text(xml_child(kable_xml, "caption"))
Hao Zhu8977a8a2015-11-19 16:52:21 -0500106 # Contents
Hao Zhu74eb6ad2017-03-04 09:32:37 -0500107 # kable_info$contents <- html_table(read_html(as.character(kable_input)))[[1]]
Hao Zhu8977a8a2015-11-19 16:52:21 -0500108 # colnames
Hao Zhuf7994dd2017-02-27 16:58:42 -0500109 kable_info$colnames <- lapply(xml_children(xml_child(kable_xml, "thead")),
110 xml_children)
111 kable_info$colnames <- kable_info$colnames[[length(kable_info$colnames)]]
112 kable_info$colnames <- trimws(xml_text(kable_info$colnames))
Hao Zhu8977a8a2015-11-19 16:52:21 -0500113 kable_info$ncol <- length(kable_info$colnames)
Hao Zhuf7994dd2017-02-27 16:58:42 -0500114 kable_info$nrow_header <- length(xml_children(xml_child(kable_xml, "thead")))
115 kable_info$nrow_body <- nrow(kable_info$contents)
116 kable_info$table_class <- xml_attr(kable_xml, "class")
117 kable_info$table_style <- xml_attr(kable_xml, "style")
Hao Zhu8977a8a2015-11-19 16:52:21 -0500118 return(kable_info)
119}
120
Hao Zhu26234122017-02-22 15:34:33 -0500121