blob: e50261e1b10782a9e468f5aed395da276d85f60e [file] [log] [blame]
Hao Zhuf7994dd2017-02-27 16:58:42 -05001#' Add a header row on top of current header
2#'
3#' @description Tables with multiple rows of header rows are extremely useful
4#' to demonstrate grouped data. This function takes the output of a `kable()`
5#' function and adds an header row on top of it. This function can work with
6#' both `HTML` and `LaTeX` outputs
7#'
8#' @param kable_input Output of `knitr::kable()` with `format` specified
9#' @param header A (named) character vector with `colspan` as values. For
10#' example, `c(" " = 1, "title" = 2)` can be used to create a new header row
11#' for a 3-column table with "title" spanning across column 2 and 3. For
12#' convenience, when `colspan` equals to 1, users can drop the ` = 1` part.
13#' As a result, `c(" ", "title" = 2)` is the same as `c(" " = 1, "title" = 2)`.
14#'
Hao Zhuc1f38412017-02-23 12:13:48 -050015#' @export
16add_header_above <- function(kable_input, header = NULL) {
17 kable_format <- attr(kable_input, "format")
18 if (!kable_format %in% c("html", "latex")) {
19 stop("Please specify output format in your kable function. Currently ",
20 "generic markdown table using pandoc is not supported.")
21 }
22 if (kable_format == "html") {
23 return(htmlTable_add_header_above(kable_input, header))
24 }
25 if (kable_format == "latex") {
26 return(pdfTable_add_header_above(kable_input, header))
27 }
28}
29
30# HTML
31htmlTable_add_header_above <- function(kable_input, header = NULL) {
32 if (is.null(header)) return(kable_input)
Hao Zhu9b45a182017-02-27 18:17:46 -050033 table_info <- magic_mirror(kable_input)
Hao Zhuc1f38412017-02-23 12:13:48 -050034 kable_xml <- read_xml(as.character(kable_input), options = c("COMPACT"))
Hao Zhu62cdde52017-05-20 22:16:03 -040035 kable_xml_thead <- xml_tpart(kable_xml, "thead")
Hao Zhuc1f38412017-02-23 12:13:48 -050036
37 header <- standardize_header_input(header)
38
39 header_rows <- xml_children(kable_xml_thead)
40 bottom_header_row <- header_rows[[length(header_rows)]]
41 kable_ncol <- length(xml_children(bottom_header_row))
42 if (sum(header$colspan) != kable_ncol) {
43 stop("The new header row you provided has a different total number of ",
44 "columns with the original kable output.")
45 }
46
47 new_header_row <- htmlTable_new_header_generator(header)
48 xml_add_child(kable_xml_thead, new_header_row, .where = 0)
Hao Zhu9b45a182017-02-27 18:17:46 -050049 out <- structure(as.character(kable_xml), format = "html",
50 class = "knitr_kable")
51 attr(out, "original_kable_meta") <- table_info
Hao Zhu6a076462017-03-01 12:59:01 -050052 return(out)
Hao Zhuc1f38412017-02-23 12:13:48 -050053}
54
55standardize_header_input <- function(header) {
56 header_names <- names(header)
57
58 if (is.null(header_names)) {
59 return(data.frame(header = header, colspan = 1, row.names = NULL))
60 }
61
62 names(header)[header_names == ""] <- header[header_names == ""]
63 header[header_names == ""] <- 1
64 header_names <- names(header)
65 header <- as.numeric(header)
66 names(header) <- header_names
67 return(data.frame(header = names(header), colspan = header, row.names = NULL))
68}
69
70htmlTable_new_header_generator <- function(header_df) {
71 header_items <- apply(header_df, 1, function(x) {
72 paste0('<th style="text-align:center;" colspan="', x[2], '">',
73 x[1], '</th>')
74 })
75 header_text <- paste(c("<tr>", header_items, "</tr>"), collapse = "")
76 header_xml <- read_xml(header_text, options = c("COMPACT"))
77 return(header_xml)
78}
79
80# Add an extra header row above the current header in a LaTeX table ------
81pdfTable_add_header_above <- function(kable_input, header = NULL) {
82 table_info <- magic_mirror(kable_input)
83 header <- standardize_header_input(header)
84 hline_type <- switch(table_info$booktabs + 1, "\\\\hline", "\\\\toprule")
85 out <- sub(hline_type,
86 paste0(hline_type, "\n",
87 pdfTable_new_header_generator(header, table_info$booktabs)),
88 as.character(kable_input))
89 out <- structure(out, format = "latex", class = "knitr_kable")
Hao Zhu9b45a182017-02-27 18:17:46 -050090 attr(out, "original_kable_meta") <- table_info
Hao Zhuc1f38412017-02-23 12:13:48 -050091 return(out)
92}
93
94pdfTable_new_header_generator <- function(header_df, booktabs = F) {
95 if (booktabs) {
96 header_df$align <- "c"
97 } else {
98 header_df$align <- "|c|"
99 header_df$align[1] <- "c|"
100 header_df$align[nrow(header_df)] <- "|c"
101 }
102 header_items <- apply(header_df, 1, function(x) {
103 # if(x[2] == 1) return(x[1])
104 paste0('\\\\multicolumn{', x[2], '}{', x[3], '}{', x[1], "}")
105 })
106 header_text <- paste(paste(header_items, collapse = " & "), "\\\\\\\\")
107 cline_end <- cumsum(header_df$colspan)
108 cline_start <- c(0, cline_end) + 1
109 cline_start <- cline_start[-length(cline_start)]
Hao Zhuc05e1812017-02-25 01:45:35 -0500110 cline_type <- switch(booktabs + 1,
111 "\\\\cline{",
112 "\\\\cmidrule(l{2pt}r{2pt}){")
Hao Zhuc1f38412017-02-23 12:13:48 -0500113 cline <- paste0(cline_type, cline_start, "-", cline_end, "}")
114 cline <- cline[trimws(header_df$header) != ""]
115 cline <- paste(cline, collapse = " ")
116 header_text <- paste(header_text, cline)
117 return(header_text)
118}