blob: adc4b18f71302397d6b223dff4470752c4739c8f [file] [log] [blame]
Hao Zhu8f417202017-05-20 16:37:14 -04001#' Add indentations to row headers
Hao Zhubd95bb22017-05-22 16:08:49 -04002#'
3#' @param kable_input Output of `knitr::kable()` with `format` specified
4#' @param positions A vector of numeric row numbers for the rows that need to
5#' be indented.
6#'
Hao Zhu78e61222017-05-24 20:53:35 -04007#' @examples x <- knitr::kable(head(mtcars), "html")
8#' # Add indentations to the 2nd & 4th row
9#' add_indent(x, c(2, 4))
10#'
Hao Zhu8f417202017-05-20 16:37:14 -040011#' @export
Samia5ca27462020-07-05 16:50:27 -040012add_indent <- function(kable_input, positions, no_of_indent) {
Hao Zhud972e7f2017-05-22 13:27:15 -040013 if (!is.numeric(positions)) {
14 stop("Positions can only take numeric row numbers (excluding header rows).")
15 }
Hao Zhu8f417202017-05-20 16:37:14 -040016 kable_format <- attr(kable_input, "format")
17 if (!kable_format %in% c("html", "latex")) {
Hao Zhu401ebd82018-01-14 17:10:20 -050018 warning("Please specify format in kable. kableExtra can customize either ",
19 "HTML or LaTeX outputs. See https://haozhu233.github.io/kableExtra/ ",
20 "for details.")
Hao Zhu8f417202017-05-20 16:37:14 -040021 return(kable_input)
22 }
23 if (kable_format == "html") {
Samia5ca27462020-07-05 16:50:27 -040024 return(add_indent_html(kable_input, positions, no_of_indent))
Hao Zhu8f417202017-05-20 16:37:14 -040025 }
26 if (kable_format == "latex") {
Samia5ca27462020-07-05 16:50:27 -040027 return(add_indent_latex(kable_input, positions, no_of_indent))
Hao Zhu8f417202017-05-20 16:37:14 -040028 }
29}
30
Hao Zhu62cdde52017-05-20 22:16:03 -040031# Add indentation for LaTeX
Samia5ca27462020-07-05 16:50:27 -040032add_indent_latex <- function(kable_input, positions, no_of_indent) {
Hao Zhud972e7f2017-05-22 13:27:15 -040033 table_info <- magic_mirror(kable_input)
Hao Zhu3fc0e882018-04-03 16:06:41 -040034 out <- solve_enc(kable_input)
Hao Zhu064990d2017-10-17 18:08:42 -040035
36 if (table_info$duplicated_rows) {
37 dup_fx_out <- fix_duplicated_rows_latex(out, table_info)
38 out <- dup_fx_out[[1]]
39 table_info <- dup_fx_out[[2]]
40 }
Hao Zhu8f417202017-05-20 16:37:14 -040041
Hao Zhu37dbe3f2018-05-14 11:16:06 -040042 max_position <- table_info$nrow - table_info$position_offset
Leo83f05132018-05-10 14:12:16 +080043
44 if (max(positions) > max_position) {
Hao Zhu8f417202017-05-20 16:37:14 -040045 stop("There aren't that many rows in the table. Check positions in ",
46 "add_indent_latex.")
47 }
48
Hao Zhu37dbe3f2018-05-14 11:16:06 -040049 for (i in positions + table_info$position_offset) {
Leo83f05132018-05-10 14:12:16 +080050 rowtext <- table_info$contents[i]
Hao Zhu09d01262019-01-07 22:06:22 -050051 out <- sub(paste0(rowtext, "\\\\\\\\"),
52 paste0(latex_indent_unit(rowtext), "\\\\\\\\"),
Quôc Peyroted7e6242018-09-05 14:59:16 +020053 out, perl = TRUE)
Leo83f05132018-05-10 14:12:16 +080054 table_info$contents[i] <- latex_indent_unit(rowtext)
Hao Zhu8f417202017-05-20 16:37:14 -040055 }
Hao Zhu2ce42b92017-06-15 17:15:33 -040056 out <- structure(out, format = "latex", class = "knitr_kable")
Hao Zhu32f43f72017-06-20 18:24:54 -040057 attr(out, "kable_meta") <- table_info
Hao Zhu8f417202017-05-20 16:37:14 -040058 return(out)
59}
60
61latex_indent_unit <- function(rowtext) {
Samia5ca27462020-07-05 16:50:27 -040062 paste0("\\\\hspace\\{",no_of_indent*2,"em\\}", rowtext)
Hao Zhu8f417202017-05-20 16:37:14 -040063}
Hao Zhu62cdde52017-05-20 22:16:03 -040064
65# Add indentation for HTML
Samia5ca27462020-07-05 16:50:27 -040066add_indent_html <- function(kable_input, positions, no_of_indent) {
Hao Zhu62cdde52017-05-20 22:16:03 -040067 kable_attrs <- attributes(kable_input)
68
Hao Zhu558c72f2017-07-24 15:12:00 -040069 kable_xml <- read_kable_as_xml(kable_input)
Hao Zhu62cdde52017-05-20 22:16:03 -040070 kable_tbody <- xml_tpart(kable_xml, "tbody")
71
72 group_header_rows <- attr(kable_input, "group_header_rows")
73 if (!is.null(group_header_rows)) {
74 positions <- positions_corrector(positions, group_header_rows,
75 length(xml_children(kable_tbody)))
76 }
Alan Butlerc81c1fe2018-01-30 11:16:18 -070077
Hao Zhu62cdde52017-05-20 22:16:03 -040078 for (i in positions) {
79 node_to_edit <- xml_child(xml_children(kable_tbody)[[i]], 1)
Alan Butlerc81c1fe2018-01-30 11:16:18 -070080 if (!xml_has_attr(node_to_edit, "indentlevel")) {
Hao Zhu62cdde52017-05-20 22:16:03 -040081 xml_attr(node_to_edit, "style") <- paste(
Samia5ca27462020-07-05 16:50:27 -040082 xml_attr(node_to_edit, "style"), "padding-left: ",paste0(no_of_indent*2,"em;")
Hao Zhu62cdde52017-05-20 22:16:03 -040083 )
Alan Butlerc81c1fe2018-01-30 11:16:18 -070084 xml_attr(node_to_edit, "indentlevel") <- 1
Hao Zhu62cdde52017-05-20 22:16:03 -040085 } else {
Alan Butlerc81c1fe2018-01-30 11:16:18 -070086 indentLevel <- as.numeric(xml_attr(node_to_edit, "indentlevel"))
Hao Zhu62cdde52017-05-20 22:16:03 -040087 xml_attr(node_to_edit, "style") <- sub(
88 paste0("padding-left: ", indentLevel * 2, "em;"),
89 paste0("padding-left: ", (indentLevel + 1) * 2, "em;"),
90 xml_attr(node_to_edit, "style")
91 )
Alan Butlerc81c1fe2018-01-30 11:16:18 -070092 xml_attr(node_to_edit, "indentlevel") <- indentLevel + 1
Hao Zhu62cdde52017-05-20 22:16:03 -040093 }
94 }
Hao Zhuf2dfd142017-07-24 14:43:28 -040095 out <- as_kable_xml(kable_xml)
Hao Zhu62cdde52017-05-20 22:16:03 -040096 attributes(out) <- kable_attrs
Hao Zhuf2100832018-01-11 16:20:29 -050097 if (!"kableExtra" %in% class(out)) class(out) <- c("kableExtra", class(out))
Hao Zhu62cdde52017-05-20 22:16:03 -040098 return(out)
99}