From 44566fff7a4d035edf09b55236889e4912f951ab Mon Sep 17 00:00:00 2001 From: Richard Iannone Date: Wed, 3 Jul 2024 14:06:25 -0400 Subject: [PATCH 01/13] Ensure col width for group row col is settable --- R/modify_columns.R | 3 ++- 1 file changed, 2 insertions(+), 1 deletion(-) diff --git a/R/modify_columns.R b/R/modify_columns.R index 3a498cedb0..cbacdeee5b 100644 --- a/R/modify_columns.R +++ b/R/modify_columns.R @@ -554,7 +554,8 @@ cols_width <- function( resolve_cols_c( expr = !!cols, data = .data, - excl_stub = FALSE + excl_stub = FALSE, + excl_group = FALSE ) columns <- base::setdiff(columns, columns_used) From ee0cd9516cc04b8792fecdd193bec2aa0b854899 Mon Sep 17 00:00:00 2001 From: Richard Iannone Date: Wed, 3 Jul 2024 14:08:03 -0400 Subject: [PATCH 02/13] Add logic to set width to row group as column Also, ensure that ordering of columns in matches real ordering (row_group first, stub second, everything else after that). --- R/utils_render_html.R | 30 +++++++++++++++++++++++++++--- 1 file changed, 27 insertions(+), 3 deletions(-) diff --git a/R/utils_render_html.R b/R/utils_render_html.R index 18c1529f48..6389c05650 100644 --- a/R/utils_render_html.R +++ b/R/utils_render_html.R @@ -270,9 +270,33 @@ get_table_defs <- function(data) { option = "table_width" ) - widths <- boxh[boxh$type %in% c("default", "stub"), , drop = FALSE] - # ensure that stub is first - widths <- widths[order(widths$type, decreasing = TRUE), "column_width", drop = TRUE] + # Determine whether the row group is placed in the stub + row_group_as_column <- + dt_options_get_value( + data = data, + option = "row_group_as_column" + ) + + types <- c("default", "stub", if (row_group_as_column) "row_group" else NULL) + + widths <- boxh[boxh$type %in% types, , drop = FALSE] + + # Ensure that the `widths` df rows are sorted such that the `"row_group"` row + # is first (only if it's located in the stub), then `"stub"`, and then + # everything else + if ("stub" %in% widths[["type"]]) { + stub_idx <- which(widths$type == "stub") + othr_idx <- base::setdiff(seq_len(nrow(widths)), stub_idx) + widths <- dplyr::slice(widths, stub_idx, othr_idx) + } + + if ("row_group" %in% widths[["type"]] && row_group_as_column) { + row_group_idx <- which(widths$type == "row_group") + othr_idx <- base::setdiff(seq_len(nrow(widths)), row_group_idx) + widths <- dplyr::slice(widths, row_group_idx, othr_idx) + } + + widths <- widths[seq_len(nrow(widths)), "column_width", drop = TRUE] widths <- unlist(widths) # Stop function if all length dimensions (where provided) From 0b810db993e10ffedcb8c141029395ccce9b503c Mon Sep 17 00:00:00 2001 From: Richard Iannone Date: Wed, 3 Jul 2024 15:15:26 -0400 Subject: [PATCH 03/13] Update tests of `cols_width()` --- tests/testthat/test-cols_width.R | 6 +++--- 1 file changed, 3 insertions(+), 3 deletions(-) diff --git a/tests/testthat/test-cols_width.R b/tests/testthat/test-cols_width.R index 0c7d36c4db..c4e42afe73 100644 --- a/tests/testthat/test-cols_width.R +++ b/tests/testthat/test-cols_width.R @@ -137,7 +137,7 @@ test_that("cols_width() stores values correctly", { dplyr::mutate(column_width = unlist(column_width)), dplyr::tibble( var = c(paste0("col_", 1:4), "row", "group"), - column_width = c(paste0((1:4 * 100), "px"), "400px", "") + column_width = c(paste0((1:4 * 100), "px"), "400px", "400px") ) ) @@ -168,7 +168,7 @@ test_that("cols_width() stores values correctly", { dplyr::mutate(column_width = unlist(column_width)), dplyr::tibble( var = c(paste0("col_", 1:4), "row", "group"), - column_width = c(rep("100px", 5), "") + column_width = rep("100px", 6) ) ) @@ -183,7 +183,7 @@ test_that("cols_width() stores values correctly", { dplyr::mutate(column_width = unlist(column_width)), dplyr::tibble( var = c(paste0("col_", 1:4), "row", "group"), - column_width = c(rep("100px", 5), "") + column_width = c(rep("100px", 5), "50px") ) ) From 4276a10e017f19ee196877e8c0d055aaad13d127 Mon Sep 17 00:00:00 2001 From: Richard Iannone Date: Wed, 3 Jul 2024 15:15:31 -0400 Subject: [PATCH 04/13] Update fmt_fraction.md --- tests/testthat/_snaps/fmt_fraction.md | 6 +++--- 1 file changed, 3 insertions(+), 3 deletions(-) diff --git a/tests/testthat/_snaps/fmt_fraction.md b/tests/testthat/_snaps/fmt_fraction.md index 648e85cbc1..811cfc5d65 100644 --- a/tests/testthat/_snaps/fmt_fraction.md +++ b/tests/testthat/_snaps/fmt_fraction.md @@ -24,21 +24,21 @@ Code . Output - [1] "\\begingroup\n\\fontsize{12.0pt}{14.4pt}\\selectfont\n\\begin{longtable}{>{\\raggedright\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}|>{\\raggedleft\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}>{\\raggedleft\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}>{\\raggedleft\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}>{\\raggedleft\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}>{\\raggedleft\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}>{\\raggedleft\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}>{\\raggedleft\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}>{\\raggedleft\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}}\n\\toprule\n & low & med & high & halves & quarters & eighths & sixteenths & hundredths \\\\ \n\\midrule\\addlinespace[2.5pt]\n\\multicolumn{9}{l}{0 to 1} \\\\[2.5pt] \n\\midrule\\addlinespace[2.5pt]\n0.0001 & 0 & 0 & 0 & 0 & 0 & 0 & 0 & 0 \\\\ \n0.0010 & 0 & 0 & \\textsuperscript{1}\\!/\\textsubscript{999} & 0 & 0 & 0 & 0 & 0 \\\\ \n0.0100 & 0 & \\textsuperscript{1}\\!/\\textsubscript{99} & \\textsuperscript{1}\\!/\\textsubscript{100} & 0 & 0 & 0 & 0 & \\textsuperscript{1}\\!/\\textsubscript{100} \\\\ \n0.1000 & \\textsuperscript{1}\\!/\\textsubscript{9} & \\textsuperscript{1}\\!/\\textsubscript{10} & \\textsuperscript{1}\\!/\\textsubscript{10} & 0 & 0 & \\textsuperscript{1}\\!/\\textsubscript{8} & \\textsuperscript{2}\\!/\\textsubscript{16} & \\textsuperscript{10}\\!/\\textsubscript{100} \\\\ \n0.2500 & \\textsuperscript{1}\\!/\\textsubscript{4} & \\textsuperscript{1}\\!/\\textsubscript{4} & \\textsuperscript{1}\\!/\\textsubscript{4} & \\textsuperscript{1}\\!/\\textsubscript{2} & \\textsuperscript{1}\\!/\\textsubscript{4} & \\textsuperscript{2}\\!/\\textsubscript{8} & \\textsuperscript{4}\\!/\\textsubscript{16} & \\textsuperscript{25}\\!/\\textsubscript{100} \\\\ \n0.4000 & \\textsuperscript{2}\\!/\\textsubscript{5} & \\textsuperscript{2}\\!/\\textsubscript{5} & \\textsuperscript{2}\\!/\\textsubscript{5} & \\textsuperscript{1}\\!/\\textsubscript{2} & \\textsuperscript{2}\\!/\\textsubscript{4} & \\textsuperscript{3}\\!/\\textsubscript{8} & \\textsuperscript{6}\\!/\\textsubscript{16} & \\textsuperscript{40}\\!/\\textsubscript{100} \\\\ \n0.5000 & \\textsuperscript{1}\\!/\\textsubscript{2} & \\textsuperscript{1}\\!/\\textsubscript{2} & \\textsuperscript{1}\\!/\\textsubscript{2} & \\textsuperscript{1}\\!/\\textsubscript{2} & \\textsuperscript{2}\\!/\\textsubscript{4} & \\textsuperscript{4}\\!/\\textsubscript{8} & \\textsuperscript{8}\\!/\\textsubscript{16} & \\textsuperscript{50}\\!/\\textsubscript{100} \\\\ \n0.6000 & \\textsuperscript{3}\\!/\\textsubscript{5} & \\textsuperscript{3}\\!/\\textsubscript{5} & \\textsuperscript{3}\\!/\\textsubscript{5} & \\textsuperscript{1}\\!/\\textsubscript{2} & \\textsuperscript{2}\\!/\\textsubscript{4} & \\textsuperscript{5}\\!/\\textsubscript{8} & \\textsuperscript{10}\\!/\\textsubscript{16} & \\textsuperscript{60}\\!/\\textsubscript{100} \\\\ \n0.7500 & \\textsuperscript{3}\\!/\\textsubscript{4} & \\textsuperscript{3}\\!/\\textsubscript{4} & \\textsuperscript{3}\\!/\\textsubscript{4} & 1 & \\textsuperscript{3}\\!/\\textsubscript{4} & \\textsuperscript{6}\\!/\\textsubscript{8} & \\textsuperscript{12}\\!/\\textsubscript{16} & \\textsuperscript{75}\\!/\\textsubscript{100} \\\\ \n0.9000 & \\textsuperscript{8}\\!/\\textsubscript{9} & \\textsuperscript{9}\\!/\\textsubscript{10} & \\textsuperscript{9}\\!/\\textsubscript{10} & 1 & 1 & \\textsuperscript{7}\\!/\\textsubscript{8} & \\textsuperscript{14}\\!/\\textsubscript{16} & \\textsuperscript{90}\\!/\\textsubscript{100} \\\\ \n0.9900 & 1 & \\textsuperscript{98}\\!/\\textsubscript{99} & \\textsuperscript{99}\\!/\\textsubscript{100} & 1 & 1 & 1 & 1 & \\textsuperscript{99}\\!/\\textsubscript{100} \\\\ \n0.9990 & 1 & 1 & \\textsuperscript{998}\\!/\\textsubscript{999} & 1 & 1 & 1 & 1 & 1 \\\\ \n0.9999 & 1 & 1 & 1 & 1 & 1 & 1 & 1 & 1 \\\\ \n\\midrule\\addlinespace[2.5pt]\n\\multicolumn{9}{l}{0 to -1} \\\\[2.5pt] \n\\midrule\\addlinespace[2.5pt]\n-0.0001 & 0 & 0 & 0 & 0 & 0 & 0 & 0 & 0 \\\\ \n-0.0010 & 0 & 0 & -\\textsuperscript{1}\\!/\\textsubscript{999} & 0 & 0 & 0 & 0 & 0 \\\\ \n-0.0100 & 0 & -\\textsuperscript{1}\\!/\\textsubscript{99} & -\\textsuperscript{1}\\!/\\textsubscript{100} & 0 & 0 & 0 & 0 & -\\textsuperscript{1}\\!/\\textsubscript{100} \\\\ \n-0.1000 & -\\textsuperscript{1}\\!/\\textsubscript{9} & -\\textsuperscript{1}\\!/\\textsubscript{10} & -\\textsuperscript{1}\\!/\\textsubscript{10} & 0 & 0 & -\\textsuperscript{1}\\!/\\textsubscript{8} & -\\textsuperscript{2}\\!/\\textsubscript{16} & -\\textsuperscript{10}\\!/\\textsubscript{100} \\\\ \n-0.2500 & -\\textsuperscript{1}\\!/\\textsubscript{4} & -\\textsuperscript{1}\\!/\\textsubscript{4} & -\\textsuperscript{1}\\!/\\textsubscript{4} & -\\textsuperscript{1}\\!/\\textsubscript{2} & -\\textsuperscript{1}\\!/\\textsubscript{4} & -\\textsuperscript{2}\\!/\\textsubscript{8} & -\\textsuperscript{4}\\!/\\textsubscript{16} & -\\textsuperscript{25}\\!/\\textsubscript{100} \\\\ \n-0.4000 & -\\textsuperscript{2}\\!/\\textsubscript{5} & -\\textsuperscript{2}\\!/\\textsubscript{5} & -\\textsuperscript{2}\\!/\\textsubscript{5} & -\\textsuperscript{1}\\!/\\textsubscript{2} & -\\textsuperscript{2}\\!/\\textsubscript{4} & -\\textsuperscript{3}\\!/\\textsubscript{8} & -\\textsuperscript{6}\\!/\\textsubscript{16} & -\\textsuperscript{40}\\!/\\textsubscript{100} \\\\ \n-0.5000 & -\\textsuperscript{1}\\!/\\textsubscript{2} & -\\textsuperscript{1}\\!/\\textsubscript{2} & -\\textsuperscript{1}\\!/\\textsubscript{2} & -\\textsuperscript{1}\\!/\\textsubscript{2} & -\\textsuperscript{2}\\!/\\textsubscript{4} & -\\textsuperscript{4}\\!/\\textsubscript{8} & -\\textsuperscript{8}\\!/\\textsubscript{16} & -\\textsuperscript{50}\\!/\\textsubscript{100} \\\\ \n-0.6000 & -\\textsuperscript{3}\\!/\\textsubscript{5} & -\\textsuperscript{3}\\!/\\textsubscript{5} & -\\textsuperscript{3}\\!/\\textsubscript{5} & -\\textsuperscript{1}\\!/\\textsubscript{2} & -\\textsuperscript{2}\\!/\\textsubscript{4} & -\\textsuperscript{5}\\!/\\textsubscript{8} & -\\textsuperscript{10}\\!/\\textsubscript{16} & -\\textsuperscript{60}\\!/\\textsubscript{100} \\\\ \n-0.7500 & -\\textsuperscript{3}\\!/\\textsubscript{4} & -\\textsuperscript{3}\\!/\\textsubscript{4} & -\\textsuperscript{3}\\!/\\textsubscript{4} & -1 & -\\textsuperscript{3}\\!/\\textsubscript{4} & -\\textsuperscript{6}\\!/\\textsubscript{8} & -\\textsuperscript{12}\\!/\\textsubscript{16} & -\\textsuperscript{75}\\!/\\textsubscript{100} \\\\ \n-0.9000 & -\\textsuperscript{8}\\!/\\textsubscript{9} & -\\textsuperscript{9}\\!/\\textsubscript{10} & -\\textsuperscript{9}\\!/\\textsubscript{10} & -1 & -1 & -\\textsuperscript{7}\\!/\\textsubscript{8} & -\\textsuperscript{14}\\!/\\textsubscript{16} & -\\textsuperscript{90}\\!/\\textsubscript{100} \\\\ \n-0.9900 & -1 & -\\textsuperscript{98}\\!/\\textsubscript{99} & -\\textsuperscript{99}\\!/\\textsubscript{100} & -1 & -1 & -1 & -1 & -\\textsuperscript{99}\\!/\\textsubscript{100} \\\\ \n-0.9990 & -1 & -1 & -\\textsuperscript{998}\\!/\\textsubscript{999} & -1 & -1 & -1 & -1 & -1 \\\\ \n-0.9999 & -1 & -1 & -1 & -1 & -1 & -1 & -1 & -1 \\\\ \n\\midrule\\addlinespace[2.5pt]\n\\multicolumn{9}{l}{1 to 2} \\\\[2.5pt] \n\\midrule\\addlinespace[2.5pt]\n1.0001 & 1 & 1 & 1 & 1 & 1 & 1 & 1 & 1 \\\\ \n1.0010 & 1 & 1 & 1\\textsuperscript{1}\\!/\\textsubscript{999} & 1 & 1 & 1 & 1 & 1 \\\\ \n1.0100 & 1 & 1\\textsuperscript{1}\\!/\\textsubscript{99} & 1\\textsuperscript{1}\\!/\\textsubscript{100} & 1 & 1 & 1 & 1 & 1\\textsuperscript{1}\\!/\\textsubscript{100} \\\\ \n1.1000 & 1\\textsuperscript{1}\\!/\\textsubscript{9} & 1\\textsuperscript{1}\\!/\\textsubscript{10} & 1\\textsuperscript{1}\\!/\\textsubscript{10} & 1 & 1 & 1\\textsuperscript{1}\\!/\\textsubscript{8} & 1\\textsuperscript{2}\\!/\\textsubscript{16} & 1\\textsuperscript{10}\\!/\\textsubscript{100} \\\\ \n1.2500 & 1\\textsuperscript{1}\\!/\\textsubscript{4} & 1\\textsuperscript{1}\\!/\\textsubscript{4} & 1\\textsuperscript{1}\\!/\\textsubscript{4} & 1\\textsuperscript{1}\\!/\\textsubscript{2} & 1\\textsuperscript{1}\\!/\\textsubscript{4} & 1\\textsuperscript{2}\\!/\\textsubscript{8} & 1\\textsuperscript{4}\\!/\\textsubscript{16} & 1\\textsuperscript{25}\\!/\\textsubscript{100} \\\\ \n1.4000 & 1\\textsuperscript{2}\\!/\\textsubscript{5} & 1\\textsuperscript{2}\\!/\\textsubscript{5} & 1\\textsuperscript{2}\\!/\\textsubscript{5} & 1\\textsuperscript{1}\\!/\\textsubscript{2} & 1\\textsuperscript{2}\\!/\\textsubscript{4} & 1\\textsuperscript{3}\\!/\\textsubscript{8} & 1\\textsuperscript{6}\\!/\\textsubscript{16} & 1\\textsuperscript{40}\\!/\\textsubscript{100} \\\\ \n1.5000 & 1\\textsuperscript{1}\\!/\\textsubscript{2} & 1\\textsuperscript{1}\\!/\\textsubscript{2} & 1\\textsuperscript{1}\\!/\\textsubscript{2} & 1\\textsuperscript{1}\\!/\\textsubscript{2} & 1\\textsuperscript{2}\\!/\\textsubscript{4} & 1\\textsuperscript{4}\\!/\\textsubscript{8} & 1\\textsuperscript{8}\\!/\\textsubscript{16} & 1\\textsuperscript{50}\\!/\\textsubscript{100} \\\\ \n1.6000 & 1\\textsuperscript{3}\\!/\\textsubscript{5} & 1\\textsuperscript{3}\\!/\\textsubscript{5} & 1\\textsuperscript{3}\\!/\\textsubscript{5} & 1\\textsuperscript{1}\\!/\\textsubscript{2} & 1\\textsuperscript{2}\\!/\\textsubscript{4} & 1\\textsuperscript{5}\\!/\\textsubscript{8} & 1\\textsuperscript{10}\\!/\\textsubscript{16} & 1\\textsuperscript{60}\\!/\\textsubscript{100} \\\\ \n1.7500 & 1\\textsuperscript{3}\\!/\\textsubscript{4} & 1\\textsuperscript{3}\\!/\\textsubscript{4} & 1\\textsuperscript{3}\\!/\\textsubscript{4} & 2 & 1\\textsuperscript{3}\\!/\\textsubscript{4} & 1\\textsuperscript{6}\\!/\\textsubscript{8} & 1\\textsuperscript{12}\\!/\\textsubscript{16} & 1\\textsuperscript{75}\\!/\\textsubscript{100} \\\\ \n1.9000 & 1\\textsuperscript{8}\\!/\\textsubscript{9} & 1\\textsuperscript{9}\\!/\\textsubscript{10} & 1\\textsuperscript{9}\\!/\\textsubscript{10} & 2 & 2 & 1\\textsuperscript{7}\\!/\\textsubscript{8} & 1\\textsuperscript{14}\\!/\\textsubscript{16} & 1\\textsuperscript{90}\\!/\\textsubscript{100} \\\\ \n1.9900 & 2 & 1\\textsuperscript{98}\\!/\\textsubscript{99} & 1\\textsuperscript{99}\\!/\\textsubscript{100} & 2 & 2 & 2 & 2 & 1\\textsuperscript{99}\\!/\\textsubscript{100} \\\\ \n1.9990 & 2 & 2 & 1\\textsuperscript{998}\\!/\\textsubscript{999} & 2 & 2 & 2 & 2 & 2 \\\\ \n1.9999 & 2 & 2 & 2 & 2 & 2 & 2 & 2 & 2 \\\\ \n\\midrule\\addlinespace[2.5pt]\n\\multicolumn{9}{l}{-1 to -2} \\\\[2.5pt] \n\\midrule\\addlinespace[2.5pt]\n-1.0001 & -1 & -1 & -1 & -1 & -1 & -1 & -1 & -1 \\\\ \n-1.0010 & -1 & -1 & -1\\textsuperscript{1}\\!/\\textsubscript{999} & -1 & -1 & -1 & -1 & -1 \\\\ \n-1.0100 & -1 & -1\\textsuperscript{1}\\!/\\textsubscript{99} & -1\\textsuperscript{1}\\!/\\textsubscript{100} & -1 & -1 & -1 & -1 & -1\\textsuperscript{1}\\!/\\textsubscript{100} \\\\ \n-1.1000 & -1\\textsuperscript{1}\\!/\\textsubscript{9} & -1\\textsuperscript{1}\\!/\\textsubscript{10} & -1\\textsuperscript{1}\\!/\\textsubscript{10} & -1 & -1 & -1\\textsuperscript{1}\\!/\\textsubscript{8} & -1\\textsuperscript{2}\\!/\\textsubscript{16} & -1\\textsuperscript{10}\\!/\\textsubscript{100} \\\\ \n-1.2500 & -1\\textsuperscript{1}\\!/\\textsubscript{4} & -1\\textsuperscript{1}\\!/\\textsubscript{4} & -1\\textsuperscript{1}\\!/\\textsubscript{4} & -1\\textsuperscript{1}\\!/\\textsubscript{2} & -1\\textsuperscript{1}\\!/\\textsubscript{4} & -1\\textsuperscript{2}\\!/\\textsubscript{8} & -1\\textsuperscript{4}\\!/\\textsubscript{16} & -1\\textsuperscript{25}\\!/\\textsubscript{100} \\\\ \n-1.4000 & -1\\textsuperscript{2}\\!/\\textsubscript{5} & -1\\textsuperscript{2}\\!/\\textsubscript{5} & -1\\textsuperscript{2}\\!/\\textsubscript{5} & -1\\textsuperscript{1}\\!/\\textsubscript{2} & -1\\textsuperscript{2}\\!/\\textsubscript{4} & -1\\textsuperscript{3}\\!/\\textsubscript{8} & -1\\textsuperscript{6}\\!/\\textsubscript{16} & -1\\textsuperscript{40}\\!/\\textsubscript{100} \\\\ \n-1.5000 & -1\\textsuperscript{1}\\!/\\textsubscript{2} & -1\\textsuperscript{1}\\!/\\textsubscript{2} & -1\\textsuperscript{1}\\!/\\textsubscript{2} & -1\\textsuperscript{1}\\!/\\textsubscript{2} & -1\\textsuperscript{2}\\!/\\textsubscript{4} & -1\\textsuperscript{4}\\!/\\textsubscript{8} & -1\\textsuperscript{8}\\!/\\textsubscript{16} & -1\\textsuperscript{50}\\!/\\textsubscript{100} \\\\ \n-1.6000 & -1\\textsuperscript{3}\\!/\\textsubscript{5} & -1\\textsuperscript{3}\\!/\\textsubscript{5} & -1\\textsuperscript{3}\\!/\\textsubscript{5} & -1\\textsuperscript{1}\\!/\\textsubscript{2} & -1\\textsuperscript{2}\\!/\\textsubscript{4} & -1\\textsuperscript{5}\\!/\\textsubscript{8} & -1\\textsuperscript{10}\\!/\\textsubscript{16} & -1\\textsuperscript{60}\\!/\\textsubscript{100} \\\\ \n-1.7500 & -1\\textsuperscript{3}\\!/\\textsubscript{4} & -1\\textsuperscript{3}\\!/\\textsubscript{4} & -1\\textsuperscript{3}\\!/\\textsubscript{4} & -2 & -1\\textsuperscript{3}\\!/\\textsubscript{4} & -1\\textsuperscript{6}\\!/\\textsubscript{8} & -1\\textsuperscript{12}\\!/\\textsubscript{16} & -1\\textsuperscript{75}\\!/\\textsubscript{100} \\\\ \n-1.9000 & -1\\textsuperscript{8}\\!/\\textsubscript{9} & -1\\textsuperscript{9}\\!/\\textsubscript{10} & -1\\textsuperscript{9}\\!/\\textsubscript{10} & -2 & -2 & -1\\textsuperscript{7}\\!/\\textsubscript{8} & -1\\textsuperscript{14}\\!/\\textsubscript{16} & -1\\textsuperscript{90}\\!/\\textsubscript{100} \\\\ \n-1.9900 & -2 & -1\\textsuperscript{98}\\!/\\textsubscript{99} & -1\\textsuperscript{99}\\!/\\textsubscript{100} & -2 & -2 & -2 & -2 & -1\\textsuperscript{99}\\!/\\textsubscript{100} \\\\ \n-1.9990 & -2 & -2 & -1\\textsuperscript{998}\\!/\\textsubscript{999} & -2 & -2 & -2 & -2 & -2 \\\\ \n-1.9999 & -2 & -2 & -2 & -2 & -2 & -2 & -2 & -2 \\\\ \n\\midrule\\addlinespace[2.5pt]\n\\multicolumn{9}{l}{Exact Numbers} \\\\[2.5pt] \n\\midrule\\addlinespace[2.5pt]\n-1.0000 & -1 & -1 & -1 & -1 & -1 & -1 & -1 & -1 \\\\ \n0.0000 & 0 & 0 & 0 & 0 & 0 & 0 & 0 & 0 \\\\ \n1.0000 & 1 & 1 & 1 & 1 & 1 & 1 & 1 & 1 \\\\ \n\\midrule\\addlinespace[2.5pt]\n\\multicolumn{9}{l}{Not Numbers} \\\\[2.5pt] \n\\midrule\\addlinespace[2.5pt]\nNA & NA & NA & NA & NA & NA & NA & NA & NA \\\\ \nNaN & NaN & NaN & NaN & NaN & NaN & NaN & NaN & NaN \\\\ \nInf & Inf & Inf & Inf & Inf & Inf & Inf & Inf & Inf \\\\ \n-Inf & -Inf & -Inf & -Inf & -Inf & -Inf & -Inf & -Inf & -Inf \\\\ \n\\bottomrule\n\\end{longtable}\n\\endgroup\n" + [1] "\\begingroup\n\\fontsize{12.0pt}{14.4pt}\\selectfont\n\\begin{longtable}{>{\\raggedright\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}|>{\\raggedleft\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}>{\\raggedleft\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}>{\\raggedleft\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}>{\\raggedleft\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}>{\\raggedleft\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}>{\\raggedleft\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}>{\\raggedleft\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}>{\\raggedleft\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}}\n\\toprule\n & low & med & high & halves & quarters & eighths & sixteenths & hundredths \\\\ \n\\midrule\\addlinespace[2.5pt]\n\\multicolumn{9}{>{\\raggedright\\arraybackslash}m{750.000000pt}}{0 to 1} \\\\[2.5pt] \n\\midrule\\addlinespace[2.5pt]\n0.0001 & 0 & 0 & 0 & 0 & 0 & 0 & 0 & 0 \\\\ \n0.0010 & 0 & 0 & \\textsuperscript{1}\\!/\\textsubscript{999} & 0 & 0 & 0 & 0 & 0 \\\\ \n0.0100 & 0 & \\textsuperscript{1}\\!/\\textsubscript{99} & \\textsuperscript{1}\\!/\\textsubscript{100} & 0 & 0 & 0 & 0 & \\textsuperscript{1}\\!/\\textsubscript{100} \\\\ \n0.1000 & \\textsuperscript{1}\\!/\\textsubscript{9} & \\textsuperscript{1}\\!/\\textsubscript{10} & \\textsuperscript{1}\\!/\\textsubscript{10} & 0 & 0 & \\textsuperscript{1}\\!/\\textsubscript{8} & \\textsuperscript{2}\\!/\\textsubscript{16} & \\textsuperscript{10}\\!/\\textsubscript{100} \\\\ \n0.2500 & \\textsuperscript{1}\\!/\\textsubscript{4} & \\textsuperscript{1}\\!/\\textsubscript{4} & \\textsuperscript{1}\\!/\\textsubscript{4} & \\textsuperscript{1}\\!/\\textsubscript{2} & \\textsuperscript{1}\\!/\\textsubscript{4} & \\textsuperscript{2}\\!/\\textsubscript{8} & \\textsuperscript{4}\\!/\\textsubscript{16} & \\textsuperscript{25}\\!/\\textsubscript{100} \\\\ \n0.4000 & \\textsuperscript{2}\\!/\\textsubscript{5} & \\textsuperscript{2}\\!/\\textsubscript{5} & \\textsuperscript{2}\\!/\\textsubscript{5} & \\textsuperscript{1}\\!/\\textsubscript{2} & \\textsuperscript{2}\\!/\\textsubscript{4} & \\textsuperscript{3}\\!/\\textsubscript{8} & \\textsuperscript{6}\\!/\\textsubscript{16} & \\textsuperscript{40}\\!/\\textsubscript{100} \\\\ \n0.5000 & \\textsuperscript{1}\\!/\\textsubscript{2} & \\textsuperscript{1}\\!/\\textsubscript{2} & \\textsuperscript{1}\\!/\\textsubscript{2} & \\textsuperscript{1}\\!/\\textsubscript{2} & \\textsuperscript{2}\\!/\\textsubscript{4} & \\textsuperscript{4}\\!/\\textsubscript{8} & \\textsuperscript{8}\\!/\\textsubscript{16} & \\textsuperscript{50}\\!/\\textsubscript{100} \\\\ \n0.6000 & \\textsuperscript{3}\\!/\\textsubscript{5} & \\textsuperscript{3}\\!/\\textsubscript{5} & \\textsuperscript{3}\\!/\\textsubscript{5} & \\textsuperscript{1}\\!/\\textsubscript{2} & \\textsuperscript{2}\\!/\\textsubscript{4} & \\textsuperscript{5}\\!/\\textsubscript{8} & \\textsuperscript{10}\\!/\\textsubscript{16} & \\textsuperscript{60}\\!/\\textsubscript{100} \\\\ \n0.7500 & \\textsuperscript{3}\\!/\\textsubscript{4} & \\textsuperscript{3}\\!/\\textsubscript{4} & \\textsuperscript{3}\\!/\\textsubscript{4} & 1 & \\textsuperscript{3}\\!/\\textsubscript{4} & \\textsuperscript{6}\\!/\\textsubscript{8} & \\textsuperscript{12}\\!/\\textsubscript{16} & \\textsuperscript{75}\\!/\\textsubscript{100} \\\\ \n0.9000 & \\textsuperscript{8}\\!/\\textsubscript{9} & \\textsuperscript{9}\\!/\\textsubscript{10} & \\textsuperscript{9}\\!/\\textsubscript{10} & 1 & 1 & \\textsuperscript{7}\\!/\\textsubscript{8} & \\textsuperscript{14}\\!/\\textsubscript{16} & \\textsuperscript{90}\\!/\\textsubscript{100} \\\\ \n0.9900 & 1 & \\textsuperscript{98}\\!/\\textsubscript{99} & \\textsuperscript{99}\\!/\\textsubscript{100} & 1 & 1 & 1 & 1 & \\textsuperscript{99}\\!/\\textsubscript{100} \\\\ \n0.9990 & 1 & 1 & \\textsuperscript{998}\\!/\\textsubscript{999} & 1 & 1 & 1 & 1 & 1 \\\\ \n0.9999 & 1 & 1 & 1 & 1 & 1 & 1 & 1 & 1 \\\\ \n\\midrule\\addlinespace[2.5pt]\n\\multicolumn{9}{>{\\raggedright\\arraybackslash}m{750.000000pt}}{0 to -1} \\\\[2.5pt] \n\\midrule\\addlinespace[2.5pt]\n-0.0001 & 0 & 0 & 0 & 0 & 0 & 0 & 0 & 0 \\\\ \n-0.0010 & 0 & 0 & -\\textsuperscript{1}\\!/\\textsubscript{999} & 0 & 0 & 0 & 0 & 0 \\\\ \n-0.0100 & 0 & -\\textsuperscript{1}\\!/\\textsubscript{99} & -\\textsuperscript{1}\\!/\\textsubscript{100} & 0 & 0 & 0 & 0 & -\\textsuperscript{1}\\!/\\textsubscript{100} \\\\ \n-0.1000 & -\\textsuperscript{1}\\!/\\textsubscript{9} & -\\textsuperscript{1}\\!/\\textsubscript{10} & -\\textsuperscript{1}\\!/\\textsubscript{10} & 0 & 0 & -\\textsuperscript{1}\\!/\\textsubscript{8} & -\\textsuperscript{2}\\!/\\textsubscript{16} & -\\textsuperscript{10}\\!/\\textsubscript{100} \\\\ \n-0.2500 & -\\textsuperscript{1}\\!/\\textsubscript{4} & -\\textsuperscript{1}\\!/\\textsubscript{4} & -\\textsuperscript{1}\\!/\\textsubscript{4} & -\\textsuperscript{1}\\!/\\textsubscript{2} & -\\textsuperscript{1}\\!/\\textsubscript{4} & -\\textsuperscript{2}\\!/\\textsubscript{8} & -\\textsuperscript{4}\\!/\\textsubscript{16} & -\\textsuperscript{25}\\!/\\textsubscript{100} \\\\ \n-0.4000 & -\\textsuperscript{2}\\!/\\textsubscript{5} & -\\textsuperscript{2}\\!/\\textsubscript{5} & -\\textsuperscript{2}\\!/\\textsubscript{5} & -\\textsuperscript{1}\\!/\\textsubscript{2} & -\\textsuperscript{2}\\!/\\textsubscript{4} & -\\textsuperscript{3}\\!/\\textsubscript{8} & -\\textsuperscript{6}\\!/\\textsubscript{16} & -\\textsuperscript{40}\\!/\\textsubscript{100} \\\\ \n-0.5000 & -\\textsuperscript{1}\\!/\\textsubscript{2} & -\\textsuperscript{1}\\!/\\textsubscript{2} & -\\textsuperscript{1}\\!/\\textsubscript{2} & -\\textsuperscript{1}\\!/\\textsubscript{2} & -\\textsuperscript{2}\\!/\\textsubscript{4} & -\\textsuperscript{4}\\!/\\textsubscript{8} & -\\textsuperscript{8}\\!/\\textsubscript{16} & -\\textsuperscript{50}\\!/\\textsubscript{100} \\\\ \n-0.6000 & -\\textsuperscript{3}\\!/\\textsubscript{5} & -\\textsuperscript{3}\\!/\\textsubscript{5} & -\\textsuperscript{3}\\!/\\textsubscript{5} & -\\textsuperscript{1}\\!/\\textsubscript{2} & -\\textsuperscript{2}\\!/\\textsubscript{4} & -\\textsuperscript{5}\\!/\\textsubscript{8} & -\\textsuperscript{10}\\!/\\textsubscript{16} & -\\textsuperscript{60}\\!/\\textsubscript{100} \\\\ \n-0.7500 & -\\textsuperscript{3}\\!/\\textsubscript{4} & -\\textsuperscript{3}\\!/\\textsubscript{4} & -\\textsuperscript{3}\\!/\\textsubscript{4} & -1 & -\\textsuperscript{3}\\!/\\textsubscript{4} & -\\textsuperscript{6}\\!/\\textsubscript{8} & -\\textsuperscript{12}\\!/\\textsubscript{16} & -\\textsuperscript{75}\\!/\\textsubscript{100} \\\\ \n-0.9000 & -\\textsuperscript{8}\\!/\\textsubscript{9} & -\\textsuperscript{9}\\!/\\textsubscript{10} & -\\textsuperscript{9}\\!/\\textsubscript{10} & -1 & -1 & -\\textsuperscript{7}\\!/\\textsubscript{8} & -\\textsuperscript{14}\\!/\\textsubscript{16} & -\\textsuperscript{90}\\!/\\textsubscript{100} \\\\ \n-0.9900 & -1 & -\\textsuperscript{98}\\!/\\textsubscript{99} & -\\textsuperscript{99}\\!/\\textsubscript{100} & -1 & -1 & -1 & -1 & -\\textsuperscript{99}\\!/\\textsubscript{100} \\\\ \n-0.9990 & -1 & -1 & -\\textsuperscript{998}\\!/\\textsubscript{999} & -1 & -1 & -1 & -1 & -1 \\\\ \n-0.9999 & -1 & -1 & -1 & -1 & -1 & -1 & -1 & -1 \\\\ \n\\midrule\\addlinespace[2.5pt]\n\\multicolumn{9}{>{\\raggedright\\arraybackslash}m{750.000000pt}}{1 to 2} \\\\[2.5pt] \n\\midrule\\addlinespace[2.5pt]\n1.0001 & 1 & 1 & 1 & 1 & 1 & 1 & 1 & 1 \\\\ \n1.0010 & 1 & 1 & 1\\textsuperscript{1}\\!/\\textsubscript{999} & 1 & 1 & 1 & 1 & 1 \\\\ \n1.0100 & 1 & 1\\textsuperscript{1}\\!/\\textsubscript{99} & 1\\textsuperscript{1}\\!/\\textsubscript{100} & 1 & 1 & 1 & 1 & 1\\textsuperscript{1}\\!/\\textsubscript{100} \\\\ \n1.1000 & 1\\textsuperscript{1}\\!/\\textsubscript{9} & 1\\textsuperscript{1}\\!/\\textsubscript{10} & 1\\textsuperscript{1}\\!/\\textsubscript{10} & 1 & 1 & 1\\textsuperscript{1}\\!/\\textsubscript{8} & 1\\textsuperscript{2}\\!/\\textsubscript{16} & 1\\textsuperscript{10}\\!/\\textsubscript{100} \\\\ \n1.2500 & 1\\textsuperscript{1}\\!/\\textsubscript{4} & 1\\textsuperscript{1}\\!/\\textsubscript{4} & 1\\textsuperscript{1}\\!/\\textsubscript{4} & 1\\textsuperscript{1}\\!/\\textsubscript{2} & 1\\textsuperscript{1}\\!/\\textsubscript{4} & 1\\textsuperscript{2}\\!/\\textsubscript{8} & 1\\textsuperscript{4}\\!/\\textsubscript{16} & 1\\textsuperscript{25}\\!/\\textsubscript{100} \\\\ \n1.4000 & 1\\textsuperscript{2}\\!/\\textsubscript{5} & 1\\textsuperscript{2}\\!/\\textsubscript{5} & 1\\textsuperscript{2}\\!/\\textsubscript{5} & 1\\textsuperscript{1}\\!/\\textsubscript{2} & 1\\textsuperscript{2}\\!/\\textsubscript{4} & 1\\textsuperscript{3}\\!/\\textsubscript{8} & 1\\textsuperscript{6}\\!/\\textsubscript{16} & 1\\textsuperscript{40}\\!/\\textsubscript{100} \\\\ \n1.5000 & 1\\textsuperscript{1}\\!/\\textsubscript{2} & 1\\textsuperscript{1}\\!/\\textsubscript{2} & 1\\textsuperscript{1}\\!/\\textsubscript{2} & 1\\textsuperscript{1}\\!/\\textsubscript{2} & 1\\textsuperscript{2}\\!/\\textsubscript{4} & 1\\textsuperscript{4}\\!/\\textsubscript{8} & 1\\textsuperscript{8}\\!/\\textsubscript{16} & 1\\textsuperscript{50}\\!/\\textsubscript{100} \\\\ \n1.6000 & 1\\textsuperscript{3}\\!/\\textsubscript{5} & 1\\textsuperscript{3}\\!/\\textsubscript{5} & 1\\textsuperscript{3}\\!/\\textsubscript{5} & 1\\textsuperscript{1}\\!/\\textsubscript{2} & 1\\textsuperscript{2}\\!/\\textsubscript{4} & 1\\textsuperscript{5}\\!/\\textsubscript{8} & 1\\textsuperscript{10}\\!/\\textsubscript{16} & 1\\textsuperscript{60}\\!/\\textsubscript{100} \\\\ \n1.7500 & 1\\textsuperscript{3}\\!/\\textsubscript{4} & 1\\textsuperscript{3}\\!/\\textsubscript{4} & 1\\textsuperscript{3}\\!/\\textsubscript{4} & 2 & 1\\textsuperscript{3}\\!/\\textsubscript{4} & 1\\textsuperscript{6}\\!/\\textsubscript{8} & 1\\textsuperscript{12}\\!/\\textsubscript{16} & 1\\textsuperscript{75}\\!/\\textsubscript{100} \\\\ \n1.9000 & 1\\textsuperscript{8}\\!/\\textsubscript{9} & 1\\textsuperscript{9}\\!/\\textsubscript{10} & 1\\textsuperscript{9}\\!/\\textsubscript{10} & 2 & 2 & 1\\textsuperscript{7}\\!/\\textsubscript{8} & 1\\textsuperscript{14}\\!/\\textsubscript{16} & 1\\textsuperscript{90}\\!/\\textsubscript{100} \\\\ \n1.9900 & 2 & 1\\textsuperscript{98}\\!/\\textsubscript{99} & 1\\textsuperscript{99}\\!/\\textsubscript{100} & 2 & 2 & 2 & 2 & 1\\textsuperscript{99}\\!/\\textsubscript{100} \\\\ \n1.9990 & 2 & 2 & 1\\textsuperscript{998}\\!/\\textsubscript{999} & 2 & 2 & 2 & 2 & 2 \\\\ \n1.9999 & 2 & 2 & 2 & 2 & 2 & 2 & 2 & 2 \\\\ \n\\midrule\\addlinespace[2.5pt]\n\\multicolumn{9}{>{\\raggedright\\arraybackslash}m{750.000000pt}}{-1 to -2} \\\\[2.5pt] \n\\midrule\\addlinespace[2.5pt]\n-1.0001 & -1 & -1 & -1 & -1 & -1 & -1 & -1 & -1 \\\\ \n-1.0010 & -1 & -1 & -1\\textsuperscript{1}\\!/\\textsubscript{999} & -1 & -1 & -1 & -1 & -1 \\\\ \n-1.0100 & -1 & -1\\textsuperscript{1}\\!/\\textsubscript{99} & -1\\textsuperscript{1}\\!/\\textsubscript{100} & -1 & -1 & -1 & -1 & -1\\textsuperscript{1}\\!/\\textsubscript{100} \\\\ \n-1.1000 & -1\\textsuperscript{1}\\!/\\textsubscript{9} & -1\\textsuperscript{1}\\!/\\textsubscript{10} & -1\\textsuperscript{1}\\!/\\textsubscript{10} & -1 & -1 & -1\\textsuperscript{1}\\!/\\textsubscript{8} & -1\\textsuperscript{2}\\!/\\textsubscript{16} & -1\\textsuperscript{10}\\!/\\textsubscript{100} \\\\ \n-1.2500 & -1\\textsuperscript{1}\\!/\\textsubscript{4} & -1\\textsuperscript{1}\\!/\\textsubscript{4} & -1\\textsuperscript{1}\\!/\\textsubscript{4} & -1\\textsuperscript{1}\\!/\\textsubscript{2} & -1\\textsuperscript{1}\\!/\\textsubscript{4} & -1\\textsuperscript{2}\\!/\\textsubscript{8} & -1\\textsuperscript{4}\\!/\\textsubscript{16} & -1\\textsuperscript{25}\\!/\\textsubscript{100} \\\\ \n-1.4000 & -1\\textsuperscript{2}\\!/\\textsubscript{5} & -1\\textsuperscript{2}\\!/\\textsubscript{5} & -1\\textsuperscript{2}\\!/\\textsubscript{5} & -1\\textsuperscript{1}\\!/\\textsubscript{2} & -1\\textsuperscript{2}\\!/\\textsubscript{4} & -1\\textsuperscript{3}\\!/\\textsubscript{8} & -1\\textsuperscript{6}\\!/\\textsubscript{16} & -1\\textsuperscript{40}\\!/\\textsubscript{100} \\\\ \n-1.5000 & -1\\textsuperscript{1}\\!/\\textsubscript{2} & -1\\textsuperscript{1}\\!/\\textsubscript{2} & -1\\textsuperscript{1}\\!/\\textsubscript{2} & -1\\textsuperscript{1}\\!/\\textsubscript{2} & -1\\textsuperscript{2}\\!/\\textsubscript{4} & -1\\textsuperscript{4}\\!/\\textsubscript{8} & -1\\textsuperscript{8}\\!/\\textsubscript{16} & -1\\textsuperscript{50}\\!/\\textsubscript{100} \\\\ \n-1.6000 & -1\\textsuperscript{3}\\!/\\textsubscript{5} & -1\\textsuperscript{3}\\!/\\textsubscript{5} & -1\\textsuperscript{3}\\!/\\textsubscript{5} & -1\\textsuperscript{1}\\!/\\textsubscript{2} & -1\\textsuperscript{2}\\!/\\textsubscript{4} & -1\\textsuperscript{5}\\!/\\textsubscript{8} & -1\\textsuperscript{10}\\!/\\textsubscript{16} & -1\\textsuperscript{60}\\!/\\textsubscript{100} \\\\ \n-1.7500 & -1\\textsuperscript{3}\\!/\\textsubscript{4} & -1\\textsuperscript{3}\\!/\\textsubscript{4} & -1\\textsuperscript{3}\\!/\\textsubscript{4} & -2 & -1\\textsuperscript{3}\\!/\\textsubscript{4} & -1\\textsuperscript{6}\\!/\\textsubscript{8} & -1\\textsuperscript{12}\\!/\\textsubscript{16} & -1\\textsuperscript{75}\\!/\\textsubscript{100} \\\\ \n-1.9000 & -1\\textsuperscript{8}\\!/\\textsubscript{9} & -1\\textsuperscript{9}\\!/\\textsubscript{10} & -1\\textsuperscript{9}\\!/\\textsubscript{10} & -2 & -2 & -1\\textsuperscript{7}\\!/\\textsubscript{8} & -1\\textsuperscript{14}\\!/\\textsubscript{16} & -1\\textsuperscript{90}\\!/\\textsubscript{100} \\\\ \n-1.9900 & -2 & -1\\textsuperscript{98}\\!/\\textsubscript{99} & -1\\textsuperscript{99}\\!/\\textsubscript{100} & -2 & -2 & -2 & -2 & -1\\textsuperscript{99}\\!/\\textsubscript{100} \\\\ \n-1.9990 & -2 & -2 & -1\\textsuperscript{998}\\!/\\textsubscript{999} & -2 & -2 & -2 & -2 & -2 \\\\ \n-1.9999 & -2 & -2 & -2 & -2 & -2 & -2 & -2 & -2 \\\\ \n\\midrule\\addlinespace[2.5pt]\n\\multicolumn{9}{>{\\raggedright\\arraybackslash}m{750.000000pt}}{Exact Numbers} \\\\[2.5pt] \n\\midrule\\addlinespace[2.5pt]\n-1.0000 & -1 & -1 & -1 & -1 & -1 & -1 & -1 & -1 \\\\ \n0.0000 & 0 & 0 & 0 & 0 & 0 & 0 & 0 & 0 \\\\ \n1.0000 & 1 & 1 & 1 & 1 & 1 & 1 & 1 & 1 \\\\ \n\\midrule\\addlinespace[2.5pt]\n\\multicolumn{9}{>{\\raggedright\\arraybackslash}m{750.000000pt}}{Not Numbers} \\\\[2.5pt] \n\\midrule\\addlinespace[2.5pt]\nNA & NA & NA & NA & NA & NA & NA & NA & NA \\\\ \nNaN & NaN & NaN & NaN & NaN & NaN & NaN & NaN & NaN \\\\ \nInf & Inf & Inf & Inf & Inf & Inf & Inf & Inf & Inf \\\\ \n-Inf & -Inf & -Inf & -Inf & -Inf & -Inf & -Inf & -Inf & -Inf \\\\ \n\\bottomrule\n\\end{longtable}\n\\endgroup\n" --- Code . Output - [1] "\\begingroup\n\\fontsize{12.0pt}{14.4pt}\\selectfont\n\\begin{longtable}{>{\\raggedright\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}|>{\\raggedleft\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}>{\\raggedleft\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}>{\\raggedleft\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}>{\\raggedleft\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}>{\\raggedleft\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}>{\\raggedleft\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}>{\\raggedleft\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}>{\\raggedleft\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}}\n\\toprule\n & low & med & high & halves & quarters & eighths & sixteenths & hundredths \\\\ \n\\midrule\\addlinespace[2.5pt]\n\\multicolumn{9}{l}{0 to 1} \\\\[2.5pt] \n\\midrule\\addlinespace[2.5pt]\n0.0001 & 0 & 0 & 0 & 0 & 0 & 0 & 0 & 0 \\\\ \n0.0010 & 0 & 0 & 1/999 & 0 & 0 & 0 & 0 & 0 \\\\ \n0.0100 & 0 & 1/99 & 1/100 & 0 & 0 & 0 & 0 & 1/100 \\\\ \n0.1000 & 1/9 & 1/10 & 1/10 & 0 & 0 & 1/8 & 2/16 & 10/100 \\\\ \n0.2500 & 1/4 & 1/4 & 1/4 & 1/2 & 1/4 & 2/8 & 4/16 & 25/100 \\\\ \n0.4000 & 2/5 & 2/5 & 2/5 & 1/2 & 2/4 & 3/8 & 6/16 & 40/100 \\\\ \n0.5000 & 1/2 & 1/2 & 1/2 & 1/2 & 2/4 & 4/8 & 8/16 & 50/100 \\\\ \n0.6000 & 3/5 & 3/5 & 3/5 & 1/2 & 2/4 & 5/8 & 10/16 & 60/100 \\\\ \n0.7500 & 3/4 & 3/4 & 3/4 & 1 & 3/4 & 6/8 & 12/16 & 75/100 \\\\ \n0.9000 & 8/9 & 9/10 & 9/10 & 1 & 1 & 7/8 & 14/16 & 90/100 \\\\ \n0.9900 & 1 & 98/99 & 99/100 & 1 & 1 & 1 & 1 & 99/100 \\\\ \n0.9990 & 1 & 1 & 998/999 & 1 & 1 & 1 & 1 & 1 \\\\ \n0.9999 & 1 & 1 & 1 & 1 & 1 & 1 & 1 & 1 \\\\ \n\\midrule\\addlinespace[2.5pt]\n\\multicolumn{9}{l}{0 to -1} \\\\[2.5pt] \n\\midrule\\addlinespace[2.5pt]\n-0.0001 & 0 & 0 & 0 & 0 & 0 & 0 & 0 & 0 \\\\ \n-0.0010 & 0 & 0 & -1/999 & 0 & 0 & 0 & 0 & 0 \\\\ \n-0.0100 & 0 & -1/99 & -1/100 & 0 & 0 & 0 & 0 & -1/100 \\\\ \n-0.1000 & -1/9 & -1/10 & -1/10 & 0 & 0 & -1/8 & -2/16 & -10/100 \\\\ \n-0.2500 & -1/4 & -1/4 & -1/4 & -1/2 & -1/4 & -2/8 & -4/16 & -25/100 \\\\ \n-0.4000 & -2/5 & -2/5 & -2/5 & -1/2 & -2/4 & -3/8 & -6/16 & -40/100 \\\\ \n-0.5000 & -1/2 & -1/2 & -1/2 & -1/2 & -2/4 & -4/8 & -8/16 & -50/100 \\\\ \n-0.6000 & -3/5 & -3/5 & -3/5 & -1/2 & -2/4 & -5/8 & -10/16 & -60/100 \\\\ \n-0.7500 & -3/4 & -3/4 & -3/4 & -1 & -3/4 & -6/8 & -12/16 & -75/100 \\\\ \n-0.9000 & -8/9 & -9/10 & -9/10 & -1 & -1 & -7/8 & -14/16 & -90/100 \\\\ \n-0.9900 & -1 & -98/99 & -99/100 & -1 & -1 & -1 & -1 & -99/100 \\\\ \n-0.9990 & -1 & -1 & -998/999 & -1 & -1 & -1 & -1 & -1 \\\\ \n-0.9999 & -1 & -1 & -1 & -1 & -1 & -1 & -1 & -1 \\\\ \n\\midrule\\addlinespace[2.5pt]\n\\multicolumn{9}{l}{1 to 2} \\\\[2.5pt] \n\\midrule\\addlinespace[2.5pt]\n1.0001 & 1 & 1 & 1 & 1 & 1 & 1 & 1 & 1 \\\\ \n1.0010 & 1 & 1 & 1\\ 1/999 & 1 & 1 & 1 & 1 & 1 \\\\ \n1.0100 & 1 & 1\\ 1/99 & 1\\ 1/100 & 1 & 1 & 1 & 1 & 1\\ 1/100 \\\\ \n1.1000 & 1\\ 1/9 & 1\\ 1/10 & 1\\ 1/10 & 1 & 1 & 1\\ 1/8 & 1\\ 2/16 & 1\\ 10/100 \\\\ \n1.2500 & 1\\ 1/4 & 1\\ 1/4 & 1\\ 1/4 & 1\\ 1/2 & 1\\ 1/4 & 1\\ 2/8 & 1\\ 4/16 & 1\\ 25/100 \\\\ \n1.4000 & 1\\ 2/5 & 1\\ 2/5 & 1\\ 2/5 & 1\\ 1/2 & 1\\ 2/4 & 1\\ 3/8 & 1\\ 6/16 & 1\\ 40/100 \\\\ \n1.5000 & 1\\ 1/2 & 1\\ 1/2 & 1\\ 1/2 & 1\\ 1/2 & 1\\ 2/4 & 1\\ 4/8 & 1\\ 8/16 & 1\\ 50/100 \\\\ \n1.6000 & 1\\ 3/5 & 1\\ 3/5 & 1\\ 3/5 & 1\\ 1/2 & 1\\ 2/4 & 1\\ 5/8 & 1\\ 10/16 & 1\\ 60/100 \\\\ \n1.7500 & 1\\ 3/4 & 1\\ 3/4 & 1\\ 3/4 & 2 & 1\\ 3/4 & 1\\ 6/8 & 1\\ 12/16 & 1\\ 75/100 \\\\ \n1.9000 & 1\\ 8/9 & 1\\ 9/10 & 1\\ 9/10 & 2 & 2 & 1\\ 7/8 & 1\\ 14/16 & 1\\ 90/100 \\\\ \n1.9900 & 2 & 1\\ 98/99 & 1\\ 99/100 & 2 & 2 & 2 & 2 & 1\\ 99/100 \\\\ \n1.9990 & 2 & 2 & 1\\ 998/999 & 2 & 2 & 2 & 2 & 2 \\\\ \n1.9999 & 2 & 2 & 2 & 2 & 2 & 2 & 2 & 2 \\\\ \n\\midrule\\addlinespace[2.5pt]\n\\multicolumn{9}{l}{-1 to -2} \\\\[2.5pt] \n\\midrule\\addlinespace[2.5pt]\n-1.0001 & -1 & -1 & -1 & -1 & -1 & -1 & -1 & -1 \\\\ \n-1.0010 & -1 & -1 & -1\\ 1/999 & -1 & -1 & -1 & -1 & -1 \\\\ \n-1.0100 & -1 & -1\\ 1/99 & -1\\ 1/100 & -1 & -1 & -1 & -1 & -1\\ 1/100 \\\\ \n-1.1000 & -1\\ 1/9 & -1\\ 1/10 & -1\\ 1/10 & -1 & -1 & -1\\ 1/8 & -1\\ 2/16 & -1\\ 10/100 \\\\ \n-1.2500 & -1\\ 1/4 & -1\\ 1/4 & -1\\ 1/4 & -1\\ 1/2 & -1\\ 1/4 & -1\\ 2/8 & -1\\ 4/16 & -1\\ 25/100 \\\\ \n-1.4000 & -1\\ 2/5 & -1\\ 2/5 & -1\\ 2/5 & -1\\ 1/2 & -1\\ 2/4 & -1\\ 3/8 & -1\\ 6/16 & -1\\ 40/100 \\\\ \n-1.5000 & -1\\ 1/2 & -1\\ 1/2 & -1\\ 1/2 & -1\\ 1/2 & -1\\ 2/4 & -1\\ 4/8 & -1\\ 8/16 & -1\\ 50/100 \\\\ \n-1.6000 & -1\\ 3/5 & -1\\ 3/5 & -1\\ 3/5 & -1\\ 1/2 & -1\\ 2/4 & -1\\ 5/8 & -1\\ 10/16 & -1\\ 60/100 \\\\ \n-1.7500 & -1\\ 3/4 & -1\\ 3/4 & -1\\ 3/4 & -2 & -1\\ 3/4 & -1\\ 6/8 & -1\\ 12/16 & -1\\ 75/100 \\\\ \n-1.9000 & -1\\ 8/9 & -1\\ 9/10 & -1\\ 9/10 & -2 & -2 & -1\\ 7/8 & -1\\ 14/16 & -1\\ 90/100 \\\\ \n-1.9900 & -2 & -1\\ 98/99 & -1\\ 99/100 & -2 & -2 & -2 & -2 & -1\\ 99/100 \\\\ \n-1.9990 & -2 & -2 & -1\\ 998/999 & -2 & -2 & -2 & -2 & -2 \\\\ \n-1.9999 & -2 & -2 & -2 & -2 & -2 & -2 & -2 & -2 \\\\ \n\\midrule\\addlinespace[2.5pt]\n\\multicolumn{9}{l}{Exact Numbers} \\\\[2.5pt] \n\\midrule\\addlinespace[2.5pt]\n-1.0000 & -1 & -1 & -1 & -1 & -1 & -1 & -1 & -1 \\\\ \n0.0000 & 0 & 0 & 0 & 0 & 0 & 0 & 0 & 0 \\\\ \n1.0000 & 1 & 1 & 1 & 1 & 1 & 1 & 1 & 1 \\\\ \n\\midrule\\addlinespace[2.5pt]\n\\multicolumn{9}{l}{Not Numbers} \\\\[2.5pt] \n\\midrule\\addlinespace[2.5pt]\nNA & NA & NA & NA & NA & NA & NA & NA & NA \\\\ \nNaN & NaN & NaN & NaN & NaN & NaN & NaN & NaN & NaN \\\\ \nInf & Inf & Inf & Inf & Inf & Inf & Inf & Inf & Inf \\\\ \n-Inf & -Inf & -Inf & -Inf & -Inf & -Inf & -Inf & -Inf & -Inf \\\\ \n\\bottomrule\n\\end{longtable}\n\\endgroup\n" + [1] "\\begingroup\n\\fontsize{12.0pt}{14.4pt}\\selectfont\n\\begin{longtable}{>{\\raggedright\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}|>{\\raggedleft\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}>{\\raggedleft\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}>{\\raggedleft\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}>{\\raggedleft\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}>{\\raggedleft\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}>{\\raggedleft\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}>{\\raggedleft\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}>{\\raggedleft\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}}\n\\toprule\n & low & med & high & halves & quarters & eighths & sixteenths & hundredths \\\\ \n\\midrule\\addlinespace[2.5pt]\n\\multicolumn{9}{>{\\raggedright\\arraybackslash}m{750.000000pt}}{0 to 1} \\\\[2.5pt] \n\\midrule\\addlinespace[2.5pt]\n0.0001 & 0 & 0 & 0 & 0 & 0 & 0 & 0 & 0 \\\\ \n0.0010 & 0 & 0 & 1/999 & 0 & 0 & 0 & 0 & 0 \\\\ \n0.0100 & 0 & 1/99 & 1/100 & 0 & 0 & 0 & 0 & 1/100 \\\\ \n0.1000 & 1/9 & 1/10 & 1/10 & 0 & 0 & 1/8 & 2/16 & 10/100 \\\\ \n0.2500 & 1/4 & 1/4 & 1/4 & 1/2 & 1/4 & 2/8 & 4/16 & 25/100 \\\\ \n0.4000 & 2/5 & 2/5 & 2/5 & 1/2 & 2/4 & 3/8 & 6/16 & 40/100 \\\\ \n0.5000 & 1/2 & 1/2 & 1/2 & 1/2 & 2/4 & 4/8 & 8/16 & 50/100 \\\\ \n0.6000 & 3/5 & 3/5 & 3/5 & 1/2 & 2/4 & 5/8 & 10/16 & 60/100 \\\\ \n0.7500 & 3/4 & 3/4 & 3/4 & 1 & 3/4 & 6/8 & 12/16 & 75/100 \\\\ \n0.9000 & 8/9 & 9/10 & 9/10 & 1 & 1 & 7/8 & 14/16 & 90/100 \\\\ \n0.9900 & 1 & 98/99 & 99/100 & 1 & 1 & 1 & 1 & 99/100 \\\\ \n0.9990 & 1 & 1 & 998/999 & 1 & 1 & 1 & 1 & 1 \\\\ \n0.9999 & 1 & 1 & 1 & 1 & 1 & 1 & 1 & 1 \\\\ \n\\midrule\\addlinespace[2.5pt]\n\\multicolumn{9}{>{\\raggedright\\arraybackslash}m{750.000000pt}}{0 to -1} \\\\[2.5pt] \n\\midrule\\addlinespace[2.5pt]\n-0.0001 & 0 & 0 & 0 & 0 & 0 & 0 & 0 & 0 \\\\ \n-0.0010 & 0 & 0 & -1/999 & 0 & 0 & 0 & 0 & 0 \\\\ \n-0.0100 & 0 & -1/99 & -1/100 & 0 & 0 & 0 & 0 & -1/100 \\\\ \n-0.1000 & -1/9 & -1/10 & -1/10 & 0 & 0 & -1/8 & -2/16 & -10/100 \\\\ \n-0.2500 & -1/4 & -1/4 & -1/4 & -1/2 & -1/4 & -2/8 & -4/16 & -25/100 \\\\ \n-0.4000 & -2/5 & -2/5 & -2/5 & -1/2 & -2/4 & -3/8 & -6/16 & -40/100 \\\\ \n-0.5000 & -1/2 & -1/2 & -1/2 & -1/2 & -2/4 & -4/8 & -8/16 & -50/100 \\\\ \n-0.6000 & -3/5 & -3/5 & -3/5 & -1/2 & -2/4 & -5/8 & -10/16 & -60/100 \\\\ \n-0.7500 & -3/4 & -3/4 & -3/4 & -1 & -3/4 & -6/8 & -12/16 & -75/100 \\\\ \n-0.9000 & -8/9 & -9/10 & -9/10 & -1 & -1 & -7/8 & -14/16 & -90/100 \\\\ \n-0.9900 & -1 & -98/99 & -99/100 & -1 & -1 & -1 & -1 & -99/100 \\\\ \n-0.9990 & -1 & -1 & -998/999 & -1 & -1 & -1 & -1 & -1 \\\\ \n-0.9999 & -1 & -1 & -1 & -1 & -1 & -1 & -1 & -1 \\\\ \n\\midrule\\addlinespace[2.5pt]\n\\multicolumn{9}{>{\\raggedright\\arraybackslash}m{750.000000pt}}{1 to 2} \\\\[2.5pt] \n\\midrule\\addlinespace[2.5pt]\n1.0001 & 1 & 1 & 1 & 1 & 1 & 1 & 1 & 1 \\\\ \n1.0010 & 1 & 1 & 1\\ 1/999 & 1 & 1 & 1 & 1 & 1 \\\\ \n1.0100 & 1 & 1\\ 1/99 & 1\\ 1/100 & 1 & 1 & 1 & 1 & 1\\ 1/100 \\\\ \n1.1000 & 1\\ 1/9 & 1\\ 1/10 & 1\\ 1/10 & 1 & 1 & 1\\ 1/8 & 1\\ 2/16 & 1\\ 10/100 \\\\ \n1.2500 & 1\\ 1/4 & 1\\ 1/4 & 1\\ 1/4 & 1\\ 1/2 & 1\\ 1/4 & 1\\ 2/8 & 1\\ 4/16 & 1\\ 25/100 \\\\ \n1.4000 & 1\\ 2/5 & 1\\ 2/5 & 1\\ 2/5 & 1\\ 1/2 & 1\\ 2/4 & 1\\ 3/8 & 1\\ 6/16 & 1\\ 40/100 \\\\ \n1.5000 & 1\\ 1/2 & 1\\ 1/2 & 1\\ 1/2 & 1\\ 1/2 & 1\\ 2/4 & 1\\ 4/8 & 1\\ 8/16 & 1\\ 50/100 \\\\ \n1.6000 & 1\\ 3/5 & 1\\ 3/5 & 1\\ 3/5 & 1\\ 1/2 & 1\\ 2/4 & 1\\ 5/8 & 1\\ 10/16 & 1\\ 60/100 \\\\ \n1.7500 & 1\\ 3/4 & 1\\ 3/4 & 1\\ 3/4 & 2 & 1\\ 3/4 & 1\\ 6/8 & 1\\ 12/16 & 1\\ 75/100 \\\\ \n1.9000 & 1\\ 8/9 & 1\\ 9/10 & 1\\ 9/10 & 2 & 2 & 1\\ 7/8 & 1\\ 14/16 & 1\\ 90/100 \\\\ \n1.9900 & 2 & 1\\ 98/99 & 1\\ 99/100 & 2 & 2 & 2 & 2 & 1\\ 99/100 \\\\ \n1.9990 & 2 & 2 & 1\\ 998/999 & 2 & 2 & 2 & 2 & 2 \\\\ \n1.9999 & 2 & 2 & 2 & 2 & 2 & 2 & 2 & 2 \\\\ \n\\midrule\\addlinespace[2.5pt]\n\\multicolumn{9}{>{\\raggedright\\arraybackslash}m{750.000000pt}}{-1 to -2} \\\\[2.5pt] \n\\midrule\\addlinespace[2.5pt]\n-1.0001 & -1 & -1 & -1 & -1 & -1 & -1 & -1 & -1 \\\\ \n-1.0010 & -1 & -1 & -1\\ 1/999 & -1 & -1 & -1 & -1 & -1 \\\\ \n-1.0100 & -1 & -1\\ 1/99 & -1\\ 1/100 & -1 & -1 & -1 & -1 & -1\\ 1/100 \\\\ \n-1.1000 & -1\\ 1/9 & -1\\ 1/10 & -1\\ 1/10 & -1 & -1 & -1\\ 1/8 & -1\\ 2/16 & -1\\ 10/100 \\\\ \n-1.2500 & -1\\ 1/4 & -1\\ 1/4 & -1\\ 1/4 & -1\\ 1/2 & -1\\ 1/4 & -1\\ 2/8 & -1\\ 4/16 & -1\\ 25/100 \\\\ \n-1.4000 & -1\\ 2/5 & -1\\ 2/5 & -1\\ 2/5 & -1\\ 1/2 & -1\\ 2/4 & -1\\ 3/8 & -1\\ 6/16 & -1\\ 40/100 \\\\ \n-1.5000 & -1\\ 1/2 & -1\\ 1/2 & -1\\ 1/2 & -1\\ 1/2 & -1\\ 2/4 & -1\\ 4/8 & -1\\ 8/16 & -1\\ 50/100 \\\\ \n-1.6000 & -1\\ 3/5 & -1\\ 3/5 & -1\\ 3/5 & -1\\ 1/2 & -1\\ 2/4 & -1\\ 5/8 & -1\\ 10/16 & -1\\ 60/100 \\\\ \n-1.7500 & -1\\ 3/4 & -1\\ 3/4 & -1\\ 3/4 & -2 & -1\\ 3/4 & -1\\ 6/8 & -1\\ 12/16 & -1\\ 75/100 \\\\ \n-1.9000 & -1\\ 8/9 & -1\\ 9/10 & -1\\ 9/10 & -2 & -2 & -1\\ 7/8 & -1\\ 14/16 & -1\\ 90/100 \\\\ \n-1.9900 & -2 & -1\\ 98/99 & -1\\ 99/100 & -2 & -2 & -2 & -2 & -1\\ 99/100 \\\\ \n-1.9990 & -2 & -2 & -1\\ 998/999 & -2 & -2 & -2 & -2 & -2 \\\\ \n-1.9999 & -2 & -2 & -2 & -2 & -2 & -2 & -2 & -2 \\\\ \n\\midrule\\addlinespace[2.5pt]\n\\multicolumn{9}{>{\\raggedright\\arraybackslash}m{750.000000pt}}{Exact Numbers} \\\\[2.5pt] \n\\midrule\\addlinespace[2.5pt]\n-1.0000 & -1 & -1 & -1 & -1 & -1 & -1 & -1 & -1 \\\\ \n0.0000 & 0 & 0 & 0 & 0 & 0 & 0 & 0 & 0 \\\\ \n1.0000 & 1 & 1 & 1 & 1 & 1 & 1 & 1 & 1 \\\\ \n\\midrule\\addlinespace[2.5pt]\n\\multicolumn{9}{>{\\raggedright\\arraybackslash}m{750.000000pt}}{Not Numbers} \\\\[2.5pt] \n\\midrule\\addlinespace[2.5pt]\nNA & NA & NA & NA & NA & NA & NA & NA & NA \\\\ \nNaN & NaN & NaN & NaN & NaN & NaN & NaN & NaN & NaN \\\\ \nInf & Inf & Inf & Inf & Inf & Inf & Inf & Inf & Inf \\\\ \n-Inf & -Inf & -Inf & -Inf & -Inf & -Inf & -Inf & -Inf & -Inf \\\\ \n\\bottomrule\n\\end{longtable}\n\\endgroup\n" --- Code . Output - [1] "\\begingroup\n\\fontsize{12.0pt}{14.4pt}\\selectfont\n\\begin{longtable}{>{\\raggedright\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}|>{\\raggedleft\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}>{\\raggedleft\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}>{\\raggedleft\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}>{\\raggedleft\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}>{\\raggedleft\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}>{\\raggedleft\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}>{\\raggedleft\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}>{\\raggedleft\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}}\n\\toprule\n & low & med & high & halves & quarters & eighths & sixteenths & hundredths \\\\ \n\\midrule\\addlinespace[2.5pt]\n\\multicolumn{9}{l}{0 to 1} \\\\[2.5pt] \n\\midrule\\addlinespace[2.5pt]\n0.0001 & 0 & 0 & 0 & 0 & 0 & 0 & 0 & 0 \\\\ \n0.0010 & 0 & 0 & 1/999 & 0 & 0 & 0 & 0 & 0 \\\\ \n0.0100 & 0 & 1/99 & 1/100 & 0 & 0 & 0 & 0 & 1/100 \\\\ \n0.1000 & 1/9 & 1/10 & 1/10 & 0 & 0 & 1/8 & 1/8 & 1/10 \\\\ \n0.2500 & 1/4 & 1/4 & 1/4 & 1/2 & 1/4 & 1/4 & 1/4 & 1/4 \\\\ \n0.4000 & 2/5 & 2/5 & 2/5 & 1/2 & 1/2 & 3/8 & 3/8 & 2/5 \\\\ \n0.5000 & 1/2 & 1/2 & 1/2 & 1/2 & 1/2 & 1/2 & 1/2 & 1/2 \\\\ \n0.6000 & 3/5 & 3/5 & 3/5 & 1/2 & 1/2 & 5/8 & 5/8 & 3/5 \\\\ \n0.7500 & 3/4 & 3/4 & 3/4 & 1 & 3/4 & 3/4 & 3/4 & 3/4 \\\\ \n0.9000 & 8/9 & 9/10 & 9/10 & 1 & 1 & 7/8 & 7/8 & 9/10 \\\\ \n0.9900 & 1 & 98/99 & 99/100 & 1 & 1 & 1 & 1 & 99/100 \\\\ \n0.9990 & 1 & 1 & 998/999 & 1 & 1 & 1 & 1 & 1 \\\\ \n0.9999 & 1 & 1 & 1 & 1 & 1 & 1 & 1 & 1 \\\\ \n\\midrule\\addlinespace[2.5pt]\n\\multicolumn{9}{l}{0 to -1} \\\\[2.5pt] \n\\midrule\\addlinespace[2.5pt]\n-0.0001 & 0 & 0 & 0 & 0 & 0 & 0 & 0 & 0 \\\\ \n-0.0010 & 0 & 0 & -1/999 & 0 & 0 & 0 & 0 & 0 \\\\ \n-0.0100 & 0 & -1/99 & -1/100 & 0 & 0 & 0 & 0 & -1/100 \\\\ \n-0.1000 & -1/9 & -1/10 & -1/10 & 0 & 0 & -1/8 & -1/8 & -1/10 \\\\ \n-0.2500 & -1/4 & -1/4 & -1/4 & -1/2 & -1/4 & -1/4 & -1/4 & -1/4 \\\\ \n-0.4000 & -2/5 & -2/5 & -2/5 & -1/2 & -1/2 & -3/8 & -3/8 & -2/5 \\\\ \n-0.5000 & -1/2 & -1/2 & -1/2 & -1/2 & -1/2 & -1/2 & -1/2 & -1/2 \\\\ \n-0.6000 & -3/5 & -3/5 & -3/5 & -1/2 & -1/2 & -5/8 & -5/8 & -3/5 \\\\ \n-0.7500 & -3/4 & -3/4 & -3/4 & -1 & -3/4 & -3/4 & -3/4 & -3/4 \\\\ \n-0.9000 & -8/9 & -9/10 & -9/10 & -1 & -1 & -7/8 & -7/8 & -9/10 \\\\ \n-0.9900 & -1 & -98/99 & -99/100 & -1 & -1 & -1 & -1 & -99/100 \\\\ \n-0.9990 & -1 & -1 & -998/999 & -1 & -1 & -1 & -1 & -1 \\\\ \n-0.9999 & -1 & -1 & -1 & -1 & -1 & -1 & -1 & -1 \\\\ \n\\midrule\\addlinespace[2.5pt]\n\\multicolumn{9}{l}{1 to 2} \\\\[2.5pt] \n\\midrule\\addlinespace[2.5pt]\n1.0001 & 1 & 1 & 1 & 1 & 1 & 1 & 1 & 1 \\\\ \n1.0010 & 1 & 1 & 1\\ 1/999 & 1 & 1 & 1 & 1 & 1 \\\\ \n1.0100 & 1 & 1\\ 1/99 & 1\\ 1/100 & 1 & 1 & 1 & 1 & 1\\ 1/100 \\\\ \n1.1000 & 1\\ 1/9 & 1\\ 1/10 & 1\\ 1/10 & 1 & 1 & 1\\ 1/8 & 1\\ 1/8 & 1\\ 1/10 \\\\ \n1.2500 & 1\\ 1/4 & 1\\ 1/4 & 1\\ 1/4 & 1\\ 1/2 & 1\\ 1/4 & 1\\ 1/4 & 1\\ 1/4 & 1\\ 1/4 \\\\ \n1.4000 & 1\\ 2/5 & 1\\ 2/5 & 1\\ 2/5 & 1\\ 1/2 & 1\\ 1/2 & 1\\ 3/8 & 1\\ 3/8 & 1\\ 2/5 \\\\ \n1.5000 & 1\\ 1/2 & 1\\ 1/2 & 1\\ 1/2 & 1\\ 1/2 & 1\\ 1/2 & 1\\ 1/2 & 1\\ 1/2 & 1\\ 1/2 \\\\ \n1.6000 & 1\\ 3/5 & 1\\ 3/5 & 1\\ 3/5 & 1\\ 1/2 & 1\\ 1/2 & 1\\ 5/8 & 1\\ 5/8 & 1\\ 3/5 \\\\ \n1.7500 & 1\\ 3/4 & 1\\ 3/4 & 1\\ 3/4 & 2 & 1\\ 3/4 & 1\\ 3/4 & 1\\ 3/4 & 1\\ 3/4 \\\\ \n1.9000 & 1\\ 8/9 & 1\\ 9/10 & 1\\ 9/10 & 2 & 2 & 1\\ 7/8 & 1\\ 7/8 & 1\\ 9/10 \\\\ \n1.9900 & 2 & 1\\ 98/99 & 1\\ 99/100 & 2 & 2 & 2 & 2 & 1\\ 99/100 \\\\ \n1.9990 & 2 & 2 & 1\\ 998/999 & 2 & 2 & 2 & 2 & 2 \\\\ \n1.9999 & 2 & 2 & 2 & 2 & 2 & 2 & 2 & 2 \\\\ \n\\midrule\\addlinespace[2.5pt]\n\\multicolumn{9}{l}{-1 to -2} \\\\[2.5pt] \n\\midrule\\addlinespace[2.5pt]\n-1.0001 & -1 & -1 & -1 & -1 & -1 & -1 & -1 & -1 \\\\ \n-1.0010 & -1 & -1 & -1\\ 1/999 & -1 & -1 & -1 & -1 & -1 \\\\ \n-1.0100 & -1 & -1\\ 1/99 & -1\\ 1/100 & -1 & -1 & -1 & -1 & -1\\ 1/100 \\\\ \n-1.1000 & -1\\ 1/9 & -1\\ 1/10 & -1\\ 1/10 & -1 & -1 & -1\\ 1/8 & -1\\ 1/8 & -1\\ 1/10 \\\\ \n-1.2500 & -1\\ 1/4 & -1\\ 1/4 & -1\\ 1/4 & -1\\ 1/2 & -1\\ 1/4 & -1\\ 1/4 & -1\\ 1/4 & -1\\ 1/4 \\\\ \n-1.4000 & -1\\ 2/5 & -1\\ 2/5 & -1\\ 2/5 & -1\\ 1/2 & -1\\ 1/2 & -1\\ 3/8 & -1\\ 3/8 & -1\\ 2/5 \\\\ \n-1.5000 & -1\\ 1/2 & -1\\ 1/2 & -1\\ 1/2 & -1\\ 1/2 & -1\\ 1/2 & -1\\ 1/2 & -1\\ 1/2 & -1\\ 1/2 \\\\ \n-1.6000 & -1\\ 3/5 & -1\\ 3/5 & -1\\ 3/5 & -1\\ 1/2 & -1\\ 1/2 & -1\\ 5/8 & -1\\ 5/8 & -1\\ 3/5 \\\\ \n-1.7500 & -1\\ 3/4 & -1\\ 3/4 & -1\\ 3/4 & -2 & -1\\ 3/4 & -1\\ 3/4 & -1\\ 3/4 & -1\\ 3/4 \\\\ \n-1.9000 & -1\\ 8/9 & -1\\ 9/10 & -1\\ 9/10 & -2 & -2 & -1\\ 7/8 & -1\\ 7/8 & -1\\ 9/10 \\\\ \n-1.9900 & -2 & -1\\ 98/99 & -1\\ 99/100 & -2 & -2 & -2 & -2 & -1\\ 99/100 \\\\ \n-1.9990 & -2 & -2 & -1\\ 998/999 & -2 & -2 & -2 & -2 & -2 \\\\ \n-1.9999 & -2 & -2 & -2 & -2 & -2 & -2 & -2 & -2 \\\\ \n\\midrule\\addlinespace[2.5pt]\n\\multicolumn{9}{l}{Exact Numbers} \\\\[2.5pt] \n\\midrule\\addlinespace[2.5pt]\n-1.0000 & -1 & -1 & -1 & -1 & -1 & -1 & -1 & -1 \\\\ \n0.0000 & 0 & 0 & 0 & 0 & 0 & 0 & 0 & 0 \\\\ \n1.0000 & 1 & 1 & 1 & 1 & 1 & 1 & 1 & 1 \\\\ \n\\midrule\\addlinespace[2.5pt]\n\\multicolumn{9}{l}{Not Numbers} \\\\[2.5pt] \n\\midrule\\addlinespace[2.5pt]\nNA & NA & NA & NA & NA & NA & NA & NA & NA \\\\ \nNaN & NaN & NaN & NaN & NaN & NaN & NaN & NaN & NaN \\\\ \nInf & Inf & Inf & Inf & Inf & Inf & Inf & Inf & Inf \\\\ \n-Inf & -Inf & -Inf & -Inf & -Inf & -Inf & -Inf & -Inf & -Inf \\\\ \n\\bottomrule\n\\end{longtable}\n\\endgroup\n" + [1] "\\begingroup\n\\fontsize{12.0pt}{14.4pt}\\selectfont\n\\begin{longtable}{>{\\raggedright\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}|>{\\raggedleft\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}>{\\raggedleft\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}>{\\raggedleft\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}>{\\raggedleft\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}>{\\raggedleft\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}>{\\raggedleft\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}>{\\raggedleft\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}>{\\raggedleft\\arraybackslash}p{75pt -2\\tabcolsep-1.5\\arrayrulewidth}}\n\\toprule\n & low & med & high & halves & quarters & eighths & sixteenths & hundredths \\\\ \n\\midrule\\addlinespace[2.5pt]\n\\multicolumn{9}{>{\\raggedright\\arraybackslash}m{750.000000pt}}{0 to 1} \\\\[2.5pt] \n\\midrule\\addlinespace[2.5pt]\n0.0001 & 0 & 0 & 0 & 0 & 0 & 0 & 0 & 0 \\\\ \n0.0010 & 0 & 0 & 1/999 & 0 & 0 & 0 & 0 & 0 \\\\ \n0.0100 & 0 & 1/99 & 1/100 & 0 & 0 & 0 & 0 & 1/100 \\\\ \n0.1000 & 1/9 & 1/10 & 1/10 & 0 & 0 & 1/8 & 1/8 & 1/10 \\\\ \n0.2500 & 1/4 & 1/4 & 1/4 & 1/2 & 1/4 & 1/4 & 1/4 & 1/4 \\\\ \n0.4000 & 2/5 & 2/5 & 2/5 & 1/2 & 1/2 & 3/8 & 3/8 & 2/5 \\\\ \n0.5000 & 1/2 & 1/2 & 1/2 & 1/2 & 1/2 & 1/2 & 1/2 & 1/2 \\\\ \n0.6000 & 3/5 & 3/5 & 3/5 & 1/2 & 1/2 & 5/8 & 5/8 & 3/5 \\\\ \n0.7500 & 3/4 & 3/4 & 3/4 & 1 & 3/4 & 3/4 & 3/4 & 3/4 \\\\ \n0.9000 & 8/9 & 9/10 & 9/10 & 1 & 1 & 7/8 & 7/8 & 9/10 \\\\ \n0.9900 & 1 & 98/99 & 99/100 & 1 & 1 & 1 & 1 & 99/100 \\\\ \n0.9990 & 1 & 1 & 998/999 & 1 & 1 & 1 & 1 & 1 \\\\ \n0.9999 & 1 & 1 & 1 & 1 & 1 & 1 & 1 & 1 \\\\ \n\\midrule\\addlinespace[2.5pt]\n\\multicolumn{9}{>{\\raggedright\\arraybackslash}m{750.000000pt}}{0 to -1} \\\\[2.5pt] \n\\midrule\\addlinespace[2.5pt]\n-0.0001 & 0 & 0 & 0 & 0 & 0 & 0 & 0 & 0 \\\\ \n-0.0010 & 0 & 0 & -1/999 & 0 & 0 & 0 & 0 & 0 \\\\ \n-0.0100 & 0 & -1/99 & -1/100 & 0 & 0 & 0 & 0 & -1/100 \\\\ \n-0.1000 & -1/9 & -1/10 & -1/10 & 0 & 0 & -1/8 & -1/8 & -1/10 \\\\ \n-0.2500 & -1/4 & -1/4 & -1/4 & -1/2 & -1/4 & -1/4 & -1/4 & -1/4 \\\\ \n-0.4000 & -2/5 & -2/5 & -2/5 & -1/2 & -1/2 & -3/8 & -3/8 & -2/5 \\\\ \n-0.5000 & -1/2 & -1/2 & -1/2 & -1/2 & -1/2 & -1/2 & -1/2 & -1/2 \\\\ \n-0.6000 & -3/5 & -3/5 & -3/5 & -1/2 & -1/2 & -5/8 & -5/8 & -3/5 \\\\ \n-0.7500 & -3/4 & -3/4 & -3/4 & -1 & -3/4 & -3/4 & -3/4 & -3/4 \\\\ \n-0.9000 & -8/9 & -9/10 & -9/10 & -1 & -1 & -7/8 & -7/8 & -9/10 \\\\ \n-0.9900 & -1 & -98/99 & -99/100 & -1 & -1 & -1 & -1 & -99/100 \\\\ \n-0.9990 & -1 & -1 & -998/999 & -1 & -1 & -1 & -1 & -1 \\\\ \n-0.9999 & -1 & -1 & -1 & -1 & -1 & -1 & -1 & -1 \\\\ \n\\midrule\\addlinespace[2.5pt]\n\\multicolumn{9}{>{\\raggedright\\arraybackslash}m{750.000000pt}}{1 to 2} \\\\[2.5pt] \n\\midrule\\addlinespace[2.5pt]\n1.0001 & 1 & 1 & 1 & 1 & 1 & 1 & 1 & 1 \\\\ \n1.0010 & 1 & 1 & 1\\ 1/999 & 1 & 1 & 1 & 1 & 1 \\\\ \n1.0100 & 1 & 1\\ 1/99 & 1\\ 1/100 & 1 & 1 & 1 & 1 & 1\\ 1/100 \\\\ \n1.1000 & 1\\ 1/9 & 1\\ 1/10 & 1\\ 1/10 & 1 & 1 & 1\\ 1/8 & 1\\ 1/8 & 1\\ 1/10 \\\\ \n1.2500 & 1\\ 1/4 & 1\\ 1/4 & 1\\ 1/4 & 1\\ 1/2 & 1\\ 1/4 & 1\\ 1/4 & 1\\ 1/4 & 1\\ 1/4 \\\\ \n1.4000 & 1\\ 2/5 & 1\\ 2/5 & 1\\ 2/5 & 1\\ 1/2 & 1\\ 1/2 & 1\\ 3/8 & 1\\ 3/8 & 1\\ 2/5 \\\\ \n1.5000 & 1\\ 1/2 & 1\\ 1/2 & 1\\ 1/2 & 1\\ 1/2 & 1\\ 1/2 & 1\\ 1/2 & 1\\ 1/2 & 1\\ 1/2 \\\\ \n1.6000 & 1\\ 3/5 & 1\\ 3/5 & 1\\ 3/5 & 1\\ 1/2 & 1\\ 1/2 & 1\\ 5/8 & 1\\ 5/8 & 1\\ 3/5 \\\\ \n1.7500 & 1\\ 3/4 & 1\\ 3/4 & 1\\ 3/4 & 2 & 1\\ 3/4 & 1\\ 3/4 & 1\\ 3/4 & 1\\ 3/4 \\\\ \n1.9000 & 1\\ 8/9 & 1\\ 9/10 & 1\\ 9/10 & 2 & 2 & 1\\ 7/8 & 1\\ 7/8 & 1\\ 9/10 \\\\ \n1.9900 & 2 & 1\\ 98/99 & 1\\ 99/100 & 2 & 2 & 2 & 2 & 1\\ 99/100 \\\\ \n1.9990 & 2 & 2 & 1\\ 998/999 & 2 & 2 & 2 & 2 & 2 \\\\ \n1.9999 & 2 & 2 & 2 & 2 & 2 & 2 & 2 & 2 \\\\ \n\\midrule\\addlinespace[2.5pt]\n\\multicolumn{9}{>{\\raggedright\\arraybackslash}m{750.000000pt}}{-1 to -2} \\\\[2.5pt] \n\\midrule\\addlinespace[2.5pt]\n-1.0001 & -1 & -1 & -1 & -1 & -1 & -1 & -1 & -1 \\\\ \n-1.0010 & -1 & -1 & -1\\ 1/999 & -1 & -1 & -1 & -1 & -1 \\\\ \n-1.0100 & -1 & -1\\ 1/99 & -1\\ 1/100 & -1 & -1 & -1 & -1 & -1\\ 1/100 \\\\ \n-1.1000 & -1\\ 1/9 & -1\\ 1/10 & -1\\ 1/10 & -1 & -1 & -1\\ 1/8 & -1\\ 1/8 & -1\\ 1/10 \\\\ \n-1.2500 & -1\\ 1/4 & -1\\ 1/4 & -1\\ 1/4 & -1\\ 1/2 & -1\\ 1/4 & -1\\ 1/4 & -1\\ 1/4 & -1\\ 1/4 \\\\ \n-1.4000 & -1\\ 2/5 & -1\\ 2/5 & -1\\ 2/5 & -1\\ 1/2 & -1\\ 1/2 & -1\\ 3/8 & -1\\ 3/8 & -1\\ 2/5 \\\\ \n-1.5000 & -1\\ 1/2 & -1\\ 1/2 & -1\\ 1/2 & -1\\ 1/2 & -1\\ 1/2 & -1\\ 1/2 & -1\\ 1/2 & -1\\ 1/2 \\\\ \n-1.6000 & -1\\ 3/5 & -1\\ 3/5 & -1\\ 3/5 & -1\\ 1/2 & -1\\ 1/2 & -1\\ 5/8 & -1\\ 5/8 & -1\\ 3/5 \\\\ \n-1.7500 & -1\\ 3/4 & -1\\ 3/4 & -1\\ 3/4 & -2 & -1\\ 3/4 & -1\\ 3/4 & -1\\ 3/4 & -1\\ 3/4 \\\\ \n-1.9000 & -1\\ 8/9 & -1\\ 9/10 & -1\\ 9/10 & -2 & -2 & -1\\ 7/8 & -1\\ 7/8 & -1\\ 9/10 \\\\ \n-1.9900 & -2 & -1\\ 98/99 & -1\\ 99/100 & -2 & -2 & -2 & -2 & -1\\ 99/100 \\\\ \n-1.9990 & -2 & -2 & -1\\ 998/999 & -2 & -2 & -2 & -2 & -2 \\\\ \n-1.9999 & -2 & -2 & -2 & -2 & -2 & -2 & -2 & -2 \\\\ \n\\midrule\\addlinespace[2.5pt]\n\\multicolumn{9}{>{\\raggedright\\arraybackslash}m{750.000000pt}}{Exact Numbers} \\\\[2.5pt] \n\\midrule\\addlinespace[2.5pt]\n-1.0000 & -1 & -1 & -1 & -1 & -1 & -1 & -1 & -1 \\\\ \n0.0000 & 0 & 0 & 0 & 0 & 0 & 0 & 0 & 0 \\\\ \n1.0000 & 1 & 1 & 1 & 1 & 1 & 1 & 1 & 1 \\\\ \n\\midrule\\addlinespace[2.5pt]\n\\multicolumn{9}{>{\\raggedright\\arraybackslash}m{750.000000pt}}{Not Numbers} \\\\[2.5pt] \n\\midrule\\addlinespace[2.5pt]\nNA & NA & NA & NA & NA & NA & NA & NA & NA \\\\ \nNaN & NaN & NaN & NaN & NaN & NaN & NaN & NaN & NaN \\\\ \nInf & Inf & Inf & Inf & Inf & Inf & Inf & Inf & Inf \\\\ \n-Inf & -Inf & -Inf & -Inf & -Inf & -Inf & -Inf & -Inf & -Inf \\\\ \n\\bottomrule\n\\end{longtable}\n\\endgroup\n" --- From a75348dd81c0d3829001f814bce9fe60779eb9f7 Mon Sep 17 00:00:00 2001 From: Richard Iannone Date: Wed, 3 Jul 2024 15:42:04 -0400 Subject: [PATCH 05/13] Update test-cols_width.R --- tests/testthat/test-cols_width.R | 42 ++++++++++++++++++++++++++++++-- 1 file changed, 40 insertions(+), 2 deletions(-) diff --git a/tests/testthat/test-cols_width.R b/tests/testthat/test-cols_width.R index c4e42afe73..7f49dd387d 100644 --- a/tests/testthat/test-cols_width.R +++ b/tests/testthat/test-cols_width.R @@ -187,6 +187,45 @@ test_that("cols_width() stores values correctly", { ) ) + expect_equal( + gt( + tbl_2, + rowname_col = "row", + groupname_col = "group", + row_group_as_column = TRUE + ) %>% + cols_width( + group ~ px(20), + everything() ~ px(100) + ) %>% + .$`_boxhead` %>% + dplyr::select(var, column_width) %>% + dplyr::mutate(column_width = unlist(column_width)), + dplyr::tibble( + var = c(paste0("col_", 1:4), "row", "group"), + column_width = c(rep("100px", 5), "20px") + ) + ) + + expect_equal( + gt( + tbl_2, + groupname_col = "group", + row_group_as_column = TRUE + ) %>% + cols_width( + group ~ px(10), + row ~ px(30) + ) %>% + .$`_boxhead` %>% + dplyr::select(var, column_width) %>% + dplyr::mutate(column_width = unlist(column_width)), + dplyr::tibble( + var = c(paste0("col_", 1:4), "row", "group"), + column_width = c(rep("", 4), "30px", "10px") + ) + ) + # Don't expect an error or a warning if a `group` column # is included in a `cols_width()` call expect_no_error( @@ -204,8 +243,7 @@ test_that("cols_width() stores values correctly", { ) ) - # Expect an error if a column provided is not - # in the dataset + # Expect an error if a column provided is not in the dataset expect_error( gt(tbl) %>% cols_width( From dedb3609c21057a948383cf9b3bf058ceb8d6877 Mon Sep 17 00:00:00 2001 From: Richard Iannone Date: Wed, 3 Jul 2024 17:48:31 -0400 Subject: [PATCH 06/13] Reformat conditional stmt --- R/dt_boxhead.R | 6 +++++- 1 file changed, 5 insertions(+), 1 deletion(-) diff --git a/R/dt_boxhead.R b/R/dt_boxhead.R index 7506d2e307..a9b6355956 100644 --- a/R/dt_boxhead.R +++ b/R/dt_boxhead.R @@ -323,7 +323,11 @@ dt_boxhead_build <- function(data, context) { ) # rstudio/gt#1733 - if (!is.na(column_pattern) && column_pattern == "" && grepl(units, column_label, fixed = TRUE)) { + if ( + !is.na(column_pattern) && + column_pattern == "" && + grepl(units, column_label, fixed = TRUE) + ) { # With `column_pattern` equal to `""`, we can surmise that this was # set automatically by `cols_label()`; the mechanism now is to replace From c3f483c11b4da60d091f31506bb710645eb38615 Mon Sep 17 00:00:00 2001 From: Richard Iannone Date: Wed, 3 Jul 2024 17:49:05 -0400 Subject: [PATCH 07/13] Add the `row_group` helper function --- R/helpers.R | 108 +++++++++++++++++++++++++++++++++++++++++----------- 1 file changed, 86 insertions(+), 22 deletions(-) diff --git a/R/helpers.R b/R/helpers.R index 8f5aa2d482..ecd620e410 100644 --- a/R/helpers.R +++ b/R/helpers.R @@ -1352,6 +1352,70 @@ stub <- function() { x } +#' Select helper for targeting the row group column +#' +#' @description +#' +#' Should you need to target only the row group column for column-width +#' declarations (i.e., when `row_group_as_column = TRUE` is set in the initial +#' [gt()] call), the `row_group()` select helper can be used. This shorthand +#' makes it so you don't have to use the name of the column that was selected +#' as the row group column. +#' +#' @return A character vector of class `"row_group_column"`. +#' +#' @section Examples: +#' +#' Create a tibble that has a `row` column (values from `1` to `6`), a `group` +#' column, and a `vals` column (containing the same values as in `row`). +#' +#' ```r +#' tbl <- +#' dplyr::tibble( +#' row = 1:6, +#' group = c(rep("Group A", 3), rep("Group B", 3)), +#' vals = 1:6 +#' ) +#' ``` +#' +#' Create a **gt** table with a two-column stub (incorporating the `row` and +#' `group` columns in that). We can set the widths of the two columns in the +#' stub with the `row_group()` and [stub()] helpers on the LHS of the +#' expressions passed to [cols_width()]. +#' +#' ```r +#' tbl |> +#' gt( +#' rowname_col = "row", +#' groupname_col = "group", +#' row_group_as_column = TRUE +#' ) |> +#' fmt_roman(columns = stub()) |> +#' cols_width( +#' row_group() ~ px(200), +#' stub() ~ px(100), +#' vals ~ px(50) +#' ) +#' ``` +#' +#' \if{html}{\out{ +#' `r man_get_image_tag(file = "man_row_group_1.png")` +#' }} +#' +#' @family helper functions +#' @section Function ID: +#' 8-11 +#' +#' @section Function Introduced: +#' **In Development** +#' +#' @export +row_group <- function() { + x <- "::row_group::" + class(x) <- "row_group_column" + x +} + #' Location helper for targeting the table title and subtitle #' #' @description @@ -1395,7 +1459,7 @@ stub <- function() { #' #' @family location helper functions #' @section Function ID: -#' 8-11 +#' 8-12 #' #' @section Function Introduced: #' `v0.2.0.5` (March 31, 2020) @@ -1467,7 +1531,7 @@ cells_title <- function(groups = c("title", "subtitle")) { #' #' @family location helper functions #' @section Function ID: -#' 8-12 +#' 8-13 #' #' @section Function Introduced: #' `v0.2.0.5` (March 31, 2020) @@ -1536,7 +1600,7 @@ cells_stubhead <- function() { #' #' @family location helper functions #' @section Function ID: -#' 8-13 +#' 8-14 #' #' @section Function Introduced: #' `v0.2.0.5` (March 31, 2020) @@ -1618,7 +1682,7 @@ cells_column_spanners <- function(spanners = everything()) { #' #' @family location helper functions #' @section Function ID: -#' 8-14 +#' 8-15 #' #' @section Function Introduced: #' `v0.2.0.5` (March 31, 2020) @@ -1697,7 +1761,7 @@ cells_column_labels <- function(columns = everything()) { #' #' @family location helper functions #' @section Function ID: -#' 8-15 +#' 8-16 #' #' @section Function Introduced: #' `v0.2.0.5` (March 31, 2020) @@ -1796,7 +1860,7 @@ cells_group <- function(groups = everything()) { #' #' @family location helper functions #' @section Function ID: -#' 8-16 +#' 8-17 #' #' @section Function Introduced: #' `v0.2.0.5` (March 31, 2020) @@ -1906,7 +1970,7 @@ cells_stub <- function(rows = everything()) { #' #' @family location helper functions #' @section Function ID: -#' 8-17 +#' 8-18 #' #' @section Function Introduced: #' `v0.2.0.5` (March 31, 2020) @@ -2041,7 +2105,7 @@ cells_body <- function( #' #' @family location helper functions #' @section Function ID: -#' 8-18 +#' 8-19 #' #' @section Function Introduced: #' `v0.2.0.5` (March 31, 2020) @@ -2149,7 +2213,7 @@ cells_summary <- function( #' #' @family location helper functions #' @section Function ID: -#' 8-19 +#' 8-20 #' #' @section Function Introduced: #' `v0.2.0.5` (March 31, 2020) @@ -2266,7 +2330,7 @@ cells_grand_summary <- function( #' #' @family location helper functions #' @section Function ID: -#' 8-20 +#' 8-21 #' #' @section Function Introduced: #' `v0.3.0` (May 12, 2021) @@ -2361,7 +2425,7 @@ cells_stub_summary <- function( #' #' @family location helper functions #' @section Function ID: -#' 8-21 +#' 8-22 #' #' @section Function Introduced: #' `v0.3.0` (May 12, 2021) @@ -2438,7 +2502,7 @@ cells_stub_grand_summary <- function(rows = everything()) { #' #' @family location helper functions #' @section Function ID: -#' 8-22 +#' 8-23 #' #' @section Function Introduced: #' `v0.3.0` (May 12, 2021) @@ -2494,7 +2558,7 @@ cells_footnotes <- function() { #' #' @family location helper functions #' @section Function ID: -#' 8-23 +#' 8-24 #' #' @section Function Introduced: #' `v0.3.0` (May 12, 2021) @@ -2654,7 +2718,7 @@ cells_source_notes <- function() { #' #' @family helper functions #' @section Function ID: -#' 8-24 +#' 8-25 #' #' @section Function Introduced: #' `v0.2.0.5` (March 31, 2020) @@ -2857,7 +2921,7 @@ cell_style_to_html.cell_text <- function(style) { #' #' @family helper functions #' @section Function ID: -#' 8-25 +#' 8-26 #' #' @section Function Introduced: #' `v0.2.0.5` (March 31, 2020) @@ -3003,7 +3067,7 @@ cell_style_to_html.cell_fill <- function(style) { #' #' @family helper functions #' @section Function ID: -#' 8-26 +#' 8-27 #' #' @section Function Introduced: #' `v0.2.0.5` (March 31, 2020) @@ -3135,7 +3199,7 @@ cell_style_structure <- function(name, obj, subclass = name) { #' #' @family helper functions #' @section Function ID: -#' 8-27 +#' 8-28 #' #' @section Function Introduced: #' `v0.2.0.5` (March 31, 2020) @@ -3177,7 +3241,7 @@ latex_special_chars <- c( #' #' @family helper functions #' @section Function ID: -#' 8-28 +#' 8-29 #' #' @section Function Introduced: #' `v0.2.0.5` (March 31, 2020) @@ -3250,7 +3314,7 @@ escape_latex <- function(text) { #' #' @family helper functions #' @section Function ID: -#' 8-29 +#' 8-30 #' #' @section Function Introduced: #' `v0.2.0.5` (March 31, 2020) @@ -3354,7 +3418,7 @@ gt_latex_dependencies <- function() { #' #' @family helper functions #' @section Function ID: -#' 8-30 +#' 8-31 #' #' @section Function Introduced: #' `v0.2.2` (August 5, 2020) @@ -3427,7 +3491,7 @@ google_font <- function(name) { #' #' @family helper functions #' @section Function ID: -#' 8-31 +#' 8-32 #' #' @section Function Introduced: #' `v0.2.2` (August 5, 2020) @@ -3667,7 +3731,7 @@ default_fonts <- function() { #' #' @family helper functions #' @section Function ID: -#' 8-32 +#' 8-33 #' #' @section Function Introduced: #' `v0.9.0` (Mar 31, 2023) From 9bb9271bc2bcef0c24f360d0c7f7f0781f563769 Mon Sep 17 00:00:00 2001 From: Richard Iannone Date: Wed, 3 Jul 2024 17:49:41 -0400 Subject: [PATCH 08/13] Add support for resolving a `row_group()` stmt --- R/resolver.R | 16 ++++++++++++++++ 1 file changed, 16 insertions(+) diff --git a/R/resolver.R b/R/resolver.R index f2085ab6af..23c3f4441d 100644 --- a/R/resolver.R +++ b/R/resolver.R @@ -280,6 +280,22 @@ resolve_cols_i <- function( } } + # If we use the gt-specific select helper `row_group()` then we + # will retrieve the row_group var name and return the output in the + # same format as the return value for `tidyselect::eval_select()` + if (rlang::as_label(quo) == "row_group()") { + + row_group_var <- dt_boxhead_get_vars_groups(data = data) + + if (!is.null(row_group_var)) { + row_group_col <- 1 + names(row_group_col) <- row_group_var + return(row_group_col) + } else { + return(NULL) + } + } + # In most cases we would want to exclude the column that # represents the stub but that isn't always the case (e.g., # when considering the stub for column sizing); the `excl_stub` From 3f0cd213e755ab953abd9151120e7e47c080347f Mon Sep 17 00:00:00 2001 From: Richard Iannone Date: Wed, 3 Jul 2024 17:49:44 -0400 Subject: [PATCH 09/13] Update _pkgdown.yml --- pkgdown/_pkgdown.yml | 1 + 1 file changed, 1 insertion(+) diff --git a/pkgdown/_pkgdown.yml b/pkgdown/_pkgdown.yml index 32b6cacfe8..3efe28c0a1 100644 --- a/pkgdown/_pkgdown.yml +++ b/pkgdown/_pkgdown.yml @@ -203,6 +203,7 @@ reference: - nanoplot_options - adjust_luminance - stub + - row_group - has_concept("location helper functions") - cell_text - cell_fill From 35c7fe286980ce61a54c61a7243d643014f0f507 Mon Sep 17 00:00:00 2001 From: Richard Iannone Date: Wed, 3 Jul 2024 17:49:49 -0400 Subject: [PATCH 10/13] Update NAMESPACE --- NAMESPACE | 1 + 1 file changed, 1 insertion(+) diff --git a/NAMESPACE b/NAMESPACE index 9edb3a9393..c2967e7218 100644 --- a/NAMESPACE +++ b/NAMESPACE @@ -194,6 +194,7 @@ export(rm_header) export(rm_source_notes) export(rm_spanners) export(rm_stubhead) +export(row_group) export(row_group_order) export(rows_add) export(starts_with) From a859d045f21b87788cc8dd097132ed85a24f872e Mon Sep 17 00:00:00 2001 From: Richard Iannone Date: Wed, 3 Jul 2024 17:49:52 -0400 Subject: [PATCH 11/13] Create row_group.Rd --- man/row_group.Rd | 89 ++++++++++++++++++++++++++++++++++++++++++++++++ 1 file changed, 89 insertions(+) create mode 100644 man/row_group.Rd diff --git a/man/row_group.Rd b/man/row_group.Rd new file mode 100644 index 0000000000..7e59ce4524 --- /dev/null +++ b/man/row_group.Rd @@ -0,0 +1,89 @@ +% Generated by roxygen2: do not edit by hand +% Please edit documentation in R/helpers.R +\name{row_group} +\alias{row_group} +\title{Select helper for targeting the row group column} +\usage{ +row_group() +} +\value{ +A character vector of class \code{"row_group_column"}. +} +\description{ +Should you need to target only the row group column for column-width +declarations (i.e., when \code{row_group_as_column = TRUE} is set in the initial +\code{\link[=gt]{gt()}} call), the \code{row_group()} select helper can be used. This shorthand +makes it so you don't have to use the name of the column that was selected +as the row group column. +} +\section{Examples}{ + + +Create a tibble that has a \code{row} column (values from \code{1} to \code{6}), a \code{group} +column, and a \code{vals} column (containing the same values as in \code{row}). + +\if{html}{\out{
}}\preformatted{tbl <- + dplyr::tibble( + row = 1:6, + group = c(rep("Group A", 3), rep("Group B", 3)), + vals = 1:6 + ) +}\if{html}{\out{
}} + +Create a \strong{gt} table with a two-column stub (incorporating the \code{row} and +\code{group} columns in that). We can set the widths of the two columns in the +stub with the \code{row_group()} and \code{\link[=stub]{stub()}} helpers on the LHS of the +expressions passed to \code{\link[=cols_width]{cols_width()}}. + +\if{html}{\out{
}}\preformatted{tbl |> + gt( + rowname_col = "row", + groupname_col = "group", + row_group_as_column = TRUE + ) |> + fmt_roman(columns = stub()) |> + cols_width( + row_group() ~ px(200), + stub() ~ px(100), + vals ~ px(50) + ) +}\if{html}{\out{
}} + +\if{html}{\out{ +This image of a table was generated from the first code example in the `row_group()` help file. +}} +} + +\section{Function ID}{ + +8-11 +} + +\section{Function Introduced}{ + +\strong{In Development} +} + +\seealso{ +Other helper functions: +\code{\link{adjust_luminance}()}, +\code{\link{cell_borders}()}, +\code{\link{cell_fill}()}, +\code{\link{cell_text}()}, +\code{\link{currency}()}, +\code{\link{default_fonts}()}, +\code{\link{escape_latex}()}, +\code{\link{from_column}()}, +\code{\link{google_font}()}, +\code{\link{gt_latex_dependencies}()}, +\code{\link{html}()}, +\code{\link{md}()}, +\code{\link{nanoplot_options}()}, +\code{\link{pct}()}, +\code{\link{px}()}, +\code{\link{random_id}()}, +\code{\link{stub}()}, +\code{\link{system_fonts}()}, +\code{\link{unit_conversion}()} +} +\concept{helper functions} From 38bfbb84cb5610896f32918573869d96d4b3a9af Mon Sep 17 00:00:00 2001 From: Richard Iannone Date: Wed, 3 Jul 2024 17:49:55 -0400 Subject: [PATCH 12/13] Create man_row_group_1.png --- images/man_row_group_1.png | Bin 0 -> 47538 bytes 1 file changed, 0 insertions(+), 0 deletions(-) create mode 100644 images/man_row_group_1.png diff --git a/images/man_row_group_1.png b/images/man_row_group_1.png new file mode 100644 index 0000000000000000000000000000000000000000..16a66db0eb2a3cc27b13ce3185933b29ea49122d GIT binary patch literal 47538 zcmeFa2RzmN`#+A9P$;rjsVE`Ygwqr@#k?22rX85u=XX7p(}B4va` zW|K`))g2r}eS}>wMa4ygp3n3ggU#2ov854*4T9^p5!|~Y8Xa3-eQSxGz~zwA zu_FXNTm!X%Tvl77!YsS0zdE)*Mo#R*T76-x1^-c1+T8o%EV@Ox#*dqb6! z>ZiZ`nQIWxS2q=STyV5(CZ+PFm zBo`)l@YJ^;#+jLpS0*SrLry6X_FaZ&?%q24Cghu(l;j!u3N(ENl|#xaA8N`h)(Z0N z%V;~f*xHA(S)Vn{Jn!7DRhbzq*z2mRl}6GSMI5Grbqw=)(OlK+|GNJX`%9G7C9aDP zZfmj_R;@)998ai!^8A?7_qd?5jNH||ME#m*u6BcGLHkTD+%ycuB)Bf$n*AVbN-7p2 z_qLRsTk7m3wzSZy&_T+$K=goY568_aQDtJx?F$4mewEAB?%U(2 zW(@o^KYSs)_R*dE2gi*v)w{DO`j5VCD$877lylBb5ubSPeRlAD<*ntP?+=e+7uVQV zqpzMito!K#3C9VuTQLX$%@Wd;U}TN3Uy=I4=uov2 zy~&lyRm1+zGf~IY76NyS$@ZJ?y=tOPcx!vUt~=duB1A2CUV2;7Q}MBs z>8?$evrP{hfeRZOJ-z5!G`S>2nUwR=l8EP^)sv~FXJln>4#!+pN$R`afhOqPE4UOt zyv^teg;k$N6q;#@$cvro_DwD-N|iF=C!VyrgL{u}uOYBMMas3Uy3FDgs}+&XJH=Nd zV{l-_o>Q-$!bS!s9&E?c2(G#GeN}VGp}2+5h199=3y2q%wvf zGzWKoI(zmm%~N#Ena{!dKDu2aR|yz96A}FAqig)OHvuQlx&^m=w6xauKACen9(d_RFCm?Hsc1fYukBU;Kw0bErMh3q}O09~}5qYY2@Dt&Wk& ze>icRRG6Im!{@A{X|$Gi7MG8<-kUdMvpb+z#Za(K_uYOMqPlXzq%p)4`=18OJ~_>`|1otQHN_sqa?@o0slW>dNA{-Qo0!tNxZi|2 zk(!QLglhCI=UtYHstT{Y_u`dabGklyenD4-F!^>)U{0h%l!I^cxs|x*DTdGc)Aq(c zOgW%(ME!_HN5YMZKkk1P2(7=i`}LuYN6hDbK1vJ;f0!Q<`6>LP-uHSMh5JGuBKInN zdRdc@me8!Cs5)_}Cn+T*BH1meGKoxWFeyW=JJn5b{@I9(5RZ_AP+q5~P;%$qTowz? zW}DRFXDZ3+m!&O^=K2)g)>e=_=ZRX6Q`B(2JeV}wVw$Rv)Rt;+$y=7A>6rPkPGapn z=}}HTPWM_$i)1znV|XC=ApKD%fQA5jWtcWX>a6b-vB4w%3UB*s^N=8MIuNLhl?Y7sf zXsiwjYnwWJPHNL^Yp)mWatWR0A7G^}yccw@;acb?yGMh&Sa$e_RBKk78P7dsjJWee zP9gtEUZj_Bwy^whZsAmcB3ng%(+JZinI~-dC$o=d-F@}s>Lnw)s)tsea%x`d8o9R4 z6o=-jJ!~OL-H~czDQOw#7~&W(FUgb=kXd^z@@S-G-dUZO)`8YJ6mD={Lzdb?`pm%Ax@L|B@cH7R^4geWLk99ha){8^Zo4FYrMpNijD{+P{C zD)vVFhq$$Up@f{}<)NhhOSLcbCA!3Bqqw6o16~GFFiN^R3=C=TF7OhC2k_?W4rlDi zAlKE=EiHUgB>UB(+wCjQ*QT%B-L@xkpMI(NP-D+ZOz9oe!76i7%B|3q)@5RGt-AUh zca>$h#v=VF|4sg`%99Jivp?NzrzhsFF2yffEey{I&Hq?YUzVB?SR7cjUUaW~ZET$F zl&!xau`Itvxm;@M{@V1l67dzncZ3Oq<7jO(DSC7p8}ZZa#yeVw=eHN_P@{7%$pG`ayIHObE{J#HvtDhuUK6&_U5t+C>&-QS0Oq|m`fByi}a}*7y zg>mz`+33)xFMdXM`M>b*<5x10`A~OPl1U~gl0Kh%Lhr5jTH{g?sW55d?Xa`j{RI^x z6^pWjvfK~FAITi9zgY6bF!;bl^NWWP4!^Wf8fRk?b((L_u*(>btL&z?mGl}}nx)=# z_`9O0c!+R_#59U=KhF_sjZQinn*94+v30VU7bgd@TrFMrmb})~)>zT`SA6@l?l@Q8 ze=u=zvL^JYq*jU653S`_Jm*`GM`ZK)75}-b&y=p7`{sA#o+`z~ zmZ+lgw|^{;fPK z>Yw?Fm49AV*IzK^x1IJikXbKWXhR=jknapHk6IVhUC~-pDV%6nZSwC=_j3-X@%pt(kAt9X_u$nyIm*(X7U(&YR*3 z`Fv?WZsY^uQ0tW(t%Bv&us)u7HFdQgI`?$Q^QF4O3dYB5YkE`inXLG_Fphp^GJ|#P z(djJ{EiFa6oO#kuS;h-V7FCUxyyd*2WR!kpJWRa1@OAN(Ooz!?PxDoqG0Lvq8$Paa z3voZ*eLgdHCSm@FBKh-=6(m9;>RWj6LMBDPB(%p?Zk}k>_x`l5GGH83UCUx59;i26d}GF2`zbtQSt(hmI`-+w)Cs2vsYdE%`{m{KK|Q_-KB>j9wd7^fAM%mmB-okN)O5Z# znWLfKTgpa1*v|Eixs1-_B}f-y-xa-ej_nQiYQVml<(M7lP?C*}@r;@AoiiTS=*q0^ zeP7be^pT04%Knh@^uE|G(#+>$k{B@P>!kCSB61cA|eD9 z->~i%`PPcwke2mWUtirmZ$3b9_azb4Bw@ps7k-_6`U)kPj~Vt%Y!j~XP^gzD!B*0^ z*RjoDmUmrC;q4ooEhTt!!{gNbM1$K9P~11xlr>RMAUF!oI|+yh840$-6CwPSB4oln zpC{xZ*tYRG5dndpIRWvn-zdVr$e&>Ni@dY>@3x0`2uR?+_QGG6IHIjzldQ#U+j=Gv zh3^PXsh*LQg@09zZWtTe*qhlpNS9+%-~-a@7qsjN2xt!>e+gw(4o<=NZRVFX9W)g# ziW}Kl^IpAXYiP{tVtpMMhv1}(I6PV#J6vUVv9_|Y7k807u<;9Vct$?vJHWp269-Gl z1DXoT>}PCm7_$rW9_KxNK#Gi=o&DsEYbN3W2xVq#)^$4~H`IKczI;IVhLak%QjV`I;;Imp&HXN~QRZkS(pFt@c~N5;KsXzS=8 zdEfvt5$@0CI*nb-@iW=j|JoL8kPrEWkDvEAA8u@T^(6ACxU#v6v6a?Yb8Da(%poNt zEP8U|_y6$?e#YP4)WpAe;<%vT@2~#$)t|4b*&E+DV`~j_I!NL9_3P!|zx?&$Nj_xj zzmZ~-&KsWsp{2-9^5K{!MOMEnACW+2^Rr5q;a`w4vgj;glKOj+S*{!|9N5`pR!)}f17e=&NH8~(%t?hAOCG1sJ=ml-< z{5N8-H{2m2!U`XY*iZd$6h@aW{u?o<{wr?(!IS^jh#L>xQndl5afY8B&t~*_(p^l# zX_xdy!?!++>jQzgSxR^@_SYxDBw%7#Q?Bg732wk%swELQ^-|mizY8KdjC|*sjy};g zoV=OEfmJ~l6mH2gjV`LsU`oVicuOQ_*x9G*&+L1E#;xHJtl|8p5!|BwYj1GWgoppy zoBuF-|4%#KQs|xtnyY+u8%^&ZG{DS+8@0c>+QOE02)A%FGpLEZF7p|V|F9_Rs4ElO zCrVZ)mflf%1v@%a?2)Nh=(3ewj2^*hh!2W_m>46*b#wpU9d!+&pt1v2^SJY zT#t_4(y-qSD)bIm3Dd4L_pM_Z9YzWoe15V5r{BLl2%dpMeV6edP9DvCLA&>j)XDxf z(`uVN6RTS) z7zp&2Ve=H+v5TI{G}=-9Sjkd<_jsaGENi%)lh(wvH-jt^9`F6L;}p4 zUVeCWwYlUMe5EzcTlIeX%zvJ--+esSs+Z9+ zZI5MUu~S-Jr^WO{(WHsSKoFA%Z^wcJ8rfQtAE{08d~4eB>uO#m z_pvM)kACXdyCS_F0+^*L=}H#ouU|YrUsbE|UjW(~ncyUVxaZ6ZJRQ#J&XKydT zu1{8ZE_R1^dwIXVO=@gADs9o6w6s3y%{E&nVe6!`p3#LhfI+95VljeeI$=i~-3z6Q z9D2*Kr&s2_`P6$YWOuX?KF)ip+J|kF=QDO@eIjOWaxDMrjSe-;Y`wJi@VDuiYQCyE ziAiSFM8(VHs+ICdiEZbuEL)OEq`8~O8m#nIUFOx84< zF)oJrb=xRUQf0oKk&D+^uzmgMu(54otj%C-olvjGta1Jno1mGpGn+j^!Cj4hyBm$_ zB^Mt|dJIZ*SB2Vah~r$7k}03{t9Lu5zfpP@IOJR7^@C>*_`J8fW&b8rpgF^?=UBS@ zGtyL}D!eG&yD-|TFx|`T0gHsNN}T@aKw5U)eR96H$0f!zN>|jk+NknDyURd8Hs!(iZH<0= zL8$UIL6u(@kvTXU-rAC2u#ezHiygbae-C~!TcSU75M9OUeym8(D?+vKA);*)F+E^u zqPtVPJ9EslniM5I?Du1CEY5ToC|>OGFU8DfhOD^t-{b6W(J%;buv!T(*~`8@>ejq> zDba}4ZRptrHgT85Zs(%Hk2W2pt=g6!IxRC<3|1P$4U-eXMtV$tTbDlAE!X7Rc6d?2 zEpX@x8a6K#AgNb0Gc}*Gi;sTO$#>5Vd3p!`ce^N0{5J1q;rpJ;%I^xCQWEc zDOwV(fK{fNHD z^oI<+kek?Y3W;MS3%Qw&r6#{oh#NSU-t26Hmt36iY~Qm~id`+G=Qlh{`!$GFQoIW@ zD2;vEU57<1(WMvXKV%e5i2I)}Y{YOIEXz3=W1su;G7iRidmSqpd!3y#>~^D0Y_NjQ zd%1dS_$x6+Z{2Y{3Jz*rFbN%{3<4(C_z;T~re*Rp^i(-zmDlQcc(FsnDUuI1MdRv) z?qTDg>&IDL`p{#!ZaXk~oU#T-f-56gWmp_9TNRDx=@tEMtN{-2t{#ehf)jAu11gIc zF{YwFpBTOFTIsc`VhK4t=OBUoR_<3doER&`R2d-BLtn+_?XloyApr+WM`t`;kLzGG zqDCCuN7yATNY^+Oqv(f)F~d&l!=pqyb~8Sn|FT*-=Sb+s>Sneu)8jtby?*L;&-h7B z+{PO&!iofPqy2FU!9AeR+d*TzKbS;Xhi#wpV{y`S3iT!%u6n>g9cfcIY;}U~?bK{{WDQG>O9I-{}nEUn`Pol|g<+&@Dhc97Ned&oq%CFxpI8$o>LwhKWlPVM`>mde?j z7F7#FGDb?_z{?KzT4{paE9mWp za7ggGO!Y~f%j>c!a+!ED_}X(cqsYc%x!RyEqayZ%v0QxWtZm`&ODim=^ztVcumP`~ za)~j?vFUl8M_(#LhOw-+WO@m;8hEd3TBhf|=2wgmJi=Q%*Eps~ocsi+KVy+TAOIj1~Uip6wiD-x~-dCk3;7%UcvaT`gd7qYngcIGp8 zv9qJJlE#n3KFr(Mx@!H@LsLp5Ume@@?B0`dRx~H87Ojq14%o-8>Mrct#5|*HSv)s#8_XR~ofn_xii-SwABz>-Jom`TnWH8jD>Ul&%6( z+1>2~j?05v6yjWWDA{6s*VlKisrn6X+dj;_4KtT0{UJ58q|-CdVG!*QqafUI5HZso zB`R@6&vxV2!9xWH5<&NozgY)Wk{-LKW?zSCY(SfVw`5VS*NcoCC5@Fton^k9hSMFc zUrS0Cw8d_2aXwBABF3Mh6683y>mMGHQi1RpQR08+cK^ktsD;x~q^d(}3v9vJpg$f^ zdSI>`e>5}v!-O~kYZeGIi`CVg{>wCfjE3xIWMj?|F@YVH~?b{%+CIsvkA8iF74>&WPyL1xq%sGwvUST-Qv?ft)N*A zFaZt4XuO8}WkMWn(LZ;BGd(bN?C*DqvreeE3=oLI8zT??ZDv6k2xyp1P50y9{rg2a z?xR|23sp7!*O~wKi{elAsqoS@V+!|i{5jsxLsWiex8)=$z2p|PP&Oc%Z+HUGTU5Od z{N+VEC%KdEaEDq2ri#k<95bRO7_d{0uG-3r!$A#CK0u51m_ z4-E2GwG=q?i=H%>fU^}TkpjO~^-r3r%!%${qoIy(AypS)*?+~;;Vgp!PQ86lEx^u{ zWI=rRvN=3JM-4Rq9qrE~YL(IFHu^2dVnl@bL8|^A)&;$Tbf+K_acWl})hj9S=MN5_ z!m&Hf0`}5!nGqjtYzm<(6_we~XJnPZ8ib=9nW6kRY7i0yAXcJME%OhdK;0rHj@W&( z#ad>kCL7D8^N;Y-tegvGz~bocKbLiK=T5;{rSDiTGCKR*#F0}5Kz(t z0VQ4cy^@;IW*GQQ5$J)7M!NHIxM?>Z1TUcCI@mS4oo@Tgf7xR!NQzlV!XFB^mZ zSk}i|J}3c7wc~f*l4-KJra!RT(xaVJW)Fai{26XrQococ#)Iq)R#a&=5~s^nhVGt- zAjYj5odU|JrfPoSk7a#7g^GLXca;8&{`Rz>x9XJzcmfNa2h&8aQT(So?%qpfCcINU z|G#STf3=#7A3Sc|nS(_9yI4;aMBlMaLnKkz7sQk7paL296;GPHxx+Z@L0K6@?G(9f z=P!9hD^j~aG}M2G$>uJEubfDr<1*i(0Wm8>R^LtX$`jScsF|!@ow6!f{+Tt`DDT|a zY%dZ!cgjDzUP?lx@A$Qk!J@w}Rju;fB43X~ zkeU9OBsAxhl-%*3hO^UEY(Wx}Zv|Efh5;;Mg~wUlxu42-5f7jSLsh3NRqn9A!vR94mS#?MctB zH;!#qRWjCCa~A4^=%OFuD(50BZ?HJ__QOF9f&4V|4@oIz}a=bJ}wTOWn>I zei>OQja{yv2>coC+*1R)C`V%5c{o_x&Rk-11+PM+^u(}bTx0ihh)tthAe7A}jL%eA z0*LCdHThbk0ktXa*h|s}!(JR3hGV1H-V43f?f`e1aA-q7(+}hcpy{t44#`+hVk2`I zP6&T(GQ5D17<*M7MUj@r@&S#my%3ga zT4jAOjB)*W#9g=W#IanRYa!v%RgK3UaRu1 z*od5a*;d=DOvGM}%0|>Pm_~(2N`i(Nt4+fkJJ%0wv3}wv_;zENcbEMsgxx zqg8H;dWTq}D23Sf;4w>Tz&78eb-|)CRw;+6;X4vxi0)PS+ zoH>uKD<_tfzRA5Vj8kF^sL|@+PcGaCv}Ex*m5Dl4i84GIi_W{n^gMg_eNIG`%oY7m zE$H1>f4L@>lZ#N1QJG|<(+Su0Q zG|aXDa6*%5WQI{A30dR#bQ6czCTQ|Hw%m`ho(K!{l&B13iCmvv0Td)AL1Fljt;YZp z01ZLhm?l3?Md|gqv{iZDHwPR2C>mSVAwbnz&|cwiTM52N0w(IGI;u}P|7Ku)Hfnfs z`|vFvAd0<0d9IX2|NYYSaoZ3ncC8h{h749fk@n)DqVHO$zSzMLdZsNahl(X)vd+15 zF%pk%HdiuJI_gu+TXalO zVmxQeoa|c@3n8u6wUCVN-K1+p;%s6!t}#PiL{F*6y9e~UJCl-8kShbgM$N0f`wAD^ z3PYq&ui*V_ehE7L6ZySf-FmuS%RlT!k`qnp>%p83tqiz2Z-d=XB_V+b$CIDdhalUm z^rq0uR0|X&yEk-3-~>$FyRTrce-_(Bq>T9)K3g3Y_LZEcj zaiwmxgcULHMbg)UGi;;*2VAuXD|SM%c96&jv1S8=FAMNyhkTy(a;H1tGRCOdO2j>=lyjNxvBuNXJW-1&} zE8KNVQS{sG*Bq;e>Fh2nvAX3wNiS^GeoP|@+1O*HZyp9g4iak!%BAu|65NSOK!79H z$5O4`#zD3G1$*W$TQ!f8ihy_$5bOVu}xjuJfQ#}HF@X7H^rY0M^=nxmd1=1 zVKJ*knQ!@kW0KpjK()mB%mZ93x`hJo0Lpt*>;UPx4=VCJYK289<8xR2XfDK8EtV`6 zFZ~oL73;Das0p{50X@p^*NAgFfY|~4#amf5-PS|gq zEH}<*M(vF6dY?$;g(M_uPE?;Idsr>`Q+P^x@vFU2v}5aV_9{TSC!K(TRt5Z zOWH8s{MhPZdf<4;`uZ$2R}@~z=dWNVoJ%8F!0BB*yV5q#Rs7yt5smd; zZ}a|eiiG7cOCC6ZGGw#dl8tSY4xXs}-Hp=SozjwW*jEObWu=|U>rwV~_mH%Dhv-iS znOkY6*suxg-m|qLL38s2!&!jw&VL!fx(~zYTq~?n+(@#G*1%)>we>iJ;bl?a*4Q^@ zWp;1vBjR88fm#`GE)4K+)3vV^%37PLZWAnQl#Y)Dk38$kc_v3T1M5C%yZ(xH(B#(x z=O57Tc_9-tG4bN-`IX>PE3ZzueFc|hIxEQYSQjsgQZW(MI9xBUzl|aOQKDVql%ymt zq**j!={Qxz~=GGQ3l#b(Au!_Tr=}78=_wZS@Pcu@&)#83e0l?@V{6vQ@GO?@lRP91Mjn}aNv z!7hdq@eYetU691kL6VXkqr(&1hAsD6xW-dT##2hi%dGU3!>V)_rkr~{MGzOr%6ldF z{K~64$jSRx;|5zyJ^U}a!c2Pc>4`(+g}o5ZJTZ-Nea+oblo6IGSmQ9dO!KyMx{^t& zFJ^*9c_oyfWe0}MW9rmG^c<3vqD@J>UYrx#GjJilWU}xPYBF_FzLb@{d;1mG$E2sr z;;cZOC`TiGlaV6YyE9hmcCgd~=a%~EO6ezy7xj<5DkHKRjCM9Lc%+=+IoXCd zGwpDmz77ZAdi{a{sq%10rN`=czG*Gu9BNwUwj5@1UJaafzKGR^;~)YZG%v)CWmyJpfkHf#6!NMc2%*Lg%ZcLgGOxj~^BiRjo3J_#N%u581I#{&24wkIz;N7|9A5jBNlUlv zgT2z8$ARF=NI=t5$%?ak%;fQ1<%y})MK&R^88p(<71TzM+Z?lR9=0JkV&(;r&g*q~ zp4`j2jxB2ZSO_v3O9Y9xtm0E+@8L&?ccb+&_U4j?a*|=nU@~&>P}s&3E}#M4$gVeC6(-+(Wly8sPx5lju%aqOpn`o7mWr_ z#3G3q$hP<16I_@Rg+tL0&ccZv19PLFHBXV+jg5Fq;!wO81&er2<5hmomAMOSyce9$ zU&zNQX{;uSxg%!*E%;45+MRik2toEy{|iB)$k!IVvChnP6?;N#!ed#FpnAaRGX!tB z-ezAc(a;>)r zbh}Z|2c*tmIAvi@jcC~J<9@$u8pEbaau|7yHYES){sY{C>qrKwgZa)bhP{stD}1hu zow)d_lF_oF;vRLj6OOZtZYi^cnE{YK!K7M8q&tW0LA7?BW}LD!HP;tl?9+<=z~xXEH!iuh~$;h zHD83JoS6}O<+a1)Any1lmIGsWh+Y^6qjoCwLDfrLM$9DHJMP*mV8CiSo!1HTomaKD zVZqxhwDwAnCQ77a7y~bHI^EVYb@52{AjD(-ND_6S zokhzEl6!X|xtT$EcCKX_v2zj}@e-8HGZ)yX3cv=wK7-g(1k`EqODsAz1{$ihDwz04 zQ9OCXNC*OV6sWg5+b`)KU-7)u7aJQvPrBu)m5qU?)}ingrx6V%M2Llo^2RLN)e5y; z%fCNqxdb&#SDcL3S>4C>Ko~cXD!ZVaj`r4&89s`kfuz`v#I9~<$;Na{>69;D1#i*V ziKx!wR47=AfN7l5Qe)jab(C$kc!6T7DQvMTmwHLJ*< zTj@gy1vz~1T3PXN@bxBJD`IU*R04#3jn4?W-r z0yLX7)$k%-o*2OavyDoR!3oq(LA^NLzTP>sC;~n+asjZ*o{`a|U$$blx;J8L8z8R{ zAc;bD=J?tG_FiDAM_bhp&?E?;L#aTw;fsK53yfN*<0t$K4s7)&7ko+HZ)KgRT7dl` zJ~1n^!)vGy!fIRQam$$E$VxQ?0KGTKzNX7Nskpe=8;;2vk)U5m0hERN35`7PCCx38 zXG`Qze&kWt-;*NNX$k7BSV0`z{pwriV1yJ{Zc?boqy?lDEFS0l78W5{t-9odr?_D^ z9?+*DZ9#s?bk4=uRAY8^zqVHzzWX- z$Sc;aoW$``Uow9jh}cPPQ4Vy{!+Ff;as zmq1%#o~Wz1Xke4J&&hTQ`fIz+W}GiuNjfjfgkM2468}YMN8qf;CdIgJ1N*3qg#pLX zWLv*&PmiaqFyM^&=HGVVYb7>bp-}_cHh+$E76OG3lIz@Yi6pDVG}W;JAw#gv6Fa zVwefe_HD9{Y(KE?>{Er;v9KuVZ_N0-b({iVlh)dz30wjk7?KaV*X-LarMOV&S6^eBKh3fn@x7gWlm;y2I`{$a!~G7v)1kE?f8DqPlJ&iH-~6Z}-7BdP#gyL?$!{QH7%V)w zLuM=b*<|?6Ia(^S1={H-R1lmtMpu7JU+)27KbQ1c48Klf<7kMj%$$_@6%r;u47+6= z@j}Pm1~Q@>Ue$+Z>4q^u_kgVT9EhR*uX1b=|9_Km_{~8=?B268eyxcD#lH+W2+g0@ zg|@yK;bU(|D@|sN~`|{{FS0DmFN8612>_4@~{s?#>349PhA7&y!hFE2!kDMt{B%dJ^XAsFUDy8|zT8 zNu5+YIbHDt;D*n6S-+RLg2et!sbU;BkF{P+V#i5{LW$PpR=E}4tt1^39K}EyR(PS; z8~fy>>y11kB%$iqs>KXKSyD$y=f~I}gSs{( zBmG%_X{D`{70ImC*F8)}qQz;XveMo7WAJ_?87$nW^xFknsL5FxgqoaRhG9!cc0y4~ zLt2DfIWyU1vN`VYOu<8=FCHq_V*sqr5xsnqP#nCRlX#?W=Bpx0d(fx2!M z?zC5@GihV+7Q`$7PD7!Ix<4yP=2YRR0$=yX={S`*19R^LSxvUk+inZkF;i)OBo)v> zj?}Ezz=Z}$33uy+t|g@>$M?I>Ka}Ua2NM-*kSpO2rW~ZmgVEU(cg+7frB^`a#=yV2 zv0wQ}LuO8CD*F51zGLNPttiLX`bV}I$RtocH-v8H$7YF4* zwNM_EEA~tD0~$f}FLyyQp;Y>O0OLLZlbX9N>N-5UZ@xbq%fsZ(KNrFumX#1sF`1^C z{&_4B!k|0iMqZo$8gzFvGUz%6aKgh2P^Z5HsZa(aH;UX7QrB~A8Ifpsh}$TN8q`z) z?zDZ+hH67n_I$wz42?+Ll zLwW(A;@rUc%&TkvRQjc|3|gSFD?Q#VY8oG8IinwsuR+x^3&?~Cf?iKn>f`k>m;+p- z!24IZ{@@qN7{)Z_;F;n6Mcf*MxY?7XNIL&6M<9~4+qgakV1x|<6K9Lek>RC)8Kl5o zljaQG7u&RD0Q?F9@cYPnix6f&hzLh4N6^W=ko3Ru7E)8wNJ?h|PKL?|6YKB48To&@ zS7<^9qF~b>y0GV$aJ@u?D`p+Az5BMFqdL>AI=04qyt&OPS&#*r6XeRy9Z5;8tYos) zHOUOeb4ySI?3J!9zU1SVz4{5+VzF=^3ftsgw%}I&hJD9Q2YEA#e7%0Ao?Oi)fS&)r z`5;z3W6N5+y%Gf6s8`dV_^;6~A(10Ed#wzYofWq1)vL`FBUc%ajEW@RGWW{i z%8=17!C{VkKlU3;xOu`AgK*71Y*ylgxHwu<%^pwlKk?^Z{9*S4^=7915PSn1=I<|Q zcHl$QxFaCJFON(75qq;M^MN=NADnNx2d*ZkdP@|3hks&UzZ|QN&!E20?;L;pR|qcN z9PvftW!mgM96d*B6!Ft;zSArZ@j9REy2EpDfbXdZapGnE2e|$}tjGR99f)rLa8+~l z(yk*Suq+$7tL%6wjsP^wmMr@be%ei5&V$q3Dz73P%>`w+hHAC<@Yc{3RKb#N?M9L(26df4t$u>*EMi zreuc4d;O_hcok|!YFK10>fv0w8c^X_-||1uEfo7CQSmnKQ`$Y;CLXnba7Fy(`mr`2 z=)LFe2V3#omJgi-rN~;_!e07Pzmg);xIv8r*|-Y88ui%{G~us*ZM*}JQ-c*iPPPI7 zM3`7e{8qEx3Yd+K!8VRxrvq+F7T}Sz`Xrct15f0A=-1o0gN2M2K!PQvvN_x*8}Fcs z0JG^zH>~VJ5cH>=b-2PDRNOom;?}mZow&g_AJB|o?S-zGYm34g*AIzY-LjGBo3JQy z%#P!pTc2#2sRkP`_D-o!riB61G<%t6k0URYSuyNwAe90d|4Uep$mKrBs6PndkTDs&fX38&V`jDLoT0|33X1t6i=Cj{7ij{Z z+l0|#T%4|08QPZcUOw66#rc5yvX2gjTEBssvZ^DAQG4Z&Wu5I1cEX>5|I`{_4uQ;V z#Yuz#S?(qNE*@jpUvUpf&To{Y%@;y>g|P;-3z%z!Rs=}3=3>b?Iz2)1^`?DTB>(!$ z)NbWC@leyI`<5gJXUD!r=XoF>oxih$Eiszk2x^u14wL^q-p zakro6!@OR;D$T5_c`9I(80~aFG1g1G%k!Hr9h4QMebG?O{LStbg54edu87BLHxH{C zfMmRF=9s(8z!81nJKBbYn-6RvJuXJOm_?7(q_C@U z;AmGX#g^qEB&vn}Um~hqZ*Wxmb#x%WbG^_r3P|@(*|OV27nMLM+5p_j52W-QI+OM7 z4pUv$B66#t?&NGuS}jx-vqHIXtdY9}o-l%tZ|yy1KKQ36J_2WTCix3RxFa-WOJ(I> zB-!V)tsh{-nu#4#MZN31tHCILzwdK+R{m`dxCV7N_VSKueA~f2HTm{oVjMQ^7R7yp zVOw1!1{E3~;5OEYL|1tU0@v}IMWM&yE-X@}OTOBs zX%rwjnwD({7gbU{UeV&$6oIUMZ%)&exNS`|56RoMs!M#EH{x;`iUXmb6RB()y9|9Y z0-)eVs7v4Q-XTLMg$jc50)AS!fNiqtgV@#pQ1kiE7s{~6g|f|z`FHF*TuE@t>zb!z zJt>+8W&cYxrc%@!H_72zdoA|t16)ERP8n!*I<)H=o;%38QLEqxbd}zTKDiC;y{f(l zcN+pA2`&*?<~~_Whm`xCgmUR_jg`!tMmgkmOC@xHX)Jjpcw>u*=s+mma@LhqxQmO8 zHXa=EKyI@~yC$-!m-5}Wo3dbY%$xcPM>G7PsRU2s!fA3Inqfr(f9S1}wp$XP&}ujU z?C|f4{u5yviiPpKZ2~PeFAvvBRqxZ#-D6Z0SgTls+$?#*ZxkU(Jowu{NP`C@T0T6A zxoH-VdnSW$87~yztmtJac<;Ow(j^3-s!AxuV}`;GQ&Yv}G#ocN6+v#C4hdY@+VZBa zq-+HX%^Hne>>yv8)qjQwvV}^yAfyy^v@cL%;_f+Gt$1v-*lz$@G|cFDvl*Y~|K)W3 zx*D9|4J^XE5n4^UN6lG@G)ahdLMl+UQHaL%Q{_Qv3IceyPJm$wfLww4$@AOrD+-`p z@`fIeSgddIl*U%$$MJ6Rf_-Z5r2DoXpi|8`@j>3qiQjij^})lMW|g~TH4h)Z?bG|x zJol*PW<$JSNDa;QCKYOx+j7(Aoh~&!@F;BO+^0V@J9|HTr_d!p=!d<9SDEXK7dqU3 z*7OWU4_-2v)XHv+aL$UcXY~@WbW2-aq_x7U$0q&I;(L~2;S!UHB+E&c>rfIzH6(`y zQ2r=Vd?ZUJweltC4)of1rR8h`3U+;=!<4f(+Nsn0Dzrk_$6~8q5K8$|hMOzhV;(B= z?ubgIYGhI%AWb>6NMHn@rdVALGnnef<|WDug-f6O2)FIHy*xXZuhqIq+>K+^m23`p z{we*p-0Q|VnICP+!i1*tG^|h~&tqRp?+Y3TjZ^ z|H1!}5off63cZNUSMeVnzv042y9K>x847rgY|hXGJXLHG<40P@QG67#=!ZHyQlt>f z1?=)8#(XH#o*Gv27Po>{4p*VjheAH=7^y!k4;ca!A#E5Qo?u(+BPoY!lV%A zEqHsA1d?eG9h?1EohCp>0RSR)%Q6E|rE|J^`Yy{eKR!KLC#T~bd&M_x;!{9|a+k+C zYu@{9wHC*~Ci5qa;KcqH|EyrFj+K<+jVlgbdUgvbYN_wlH1zg)%|`a#M(%%ngDQB- z)&T3gj>F8*)#F>)HcG37VoJOuY-By(a}90#jU~vp!AQnDLhhXn*A=hJB0~skk*iRz zqr9=0^>SJrt35j?m^Jkh>Tux~doc9nls==Y_9sG?3z%MO&*gvsjw@b*b()2H@jEjI z&X_-b{O1`&#sQ@jHOfO52)EY+5mDUd#UHsJp84eTaU_5R#k=$5ZzjQX594(Sj$_#&@W3$WP~r zs2L6He8LtW5SH;ZKgPy%==VtBkpPXj3W{*{h0m?$^7tW7z~OFsH`M}9 zjg9Z(79h;)j7-V0Bd!UmWRTaugKO;IR!9dtJb@o$b6Hm*lJsRDV>uG%vwW%S)R#l} zAsGO^6{t|dCm?>=M|V)JafOz4QP}&yg9L6o2ZABf6MJ5k0YAp(vLLvueZR{$kVd&| zjjJziXfIA+(7Qkk8TwOxt2W#CE~yxT$%U5|R?M(>yUNB;JO?g7WsuT~_+7X$ek}_w zMVnl`b6SQBq>kpgvcqqf9?~Inmz~-lHB>vB^#KiVR}~Tt^jZEQYBVf|=RiE1^@*2M z@RdB9haeY{4my738OL^-+_(E{kvFT9YJT(C*z&DYk4LBV6O`buk*bj}yaI(7-nBcAW2% zln$;>UW^6qgI@vB30gDP7f;xEjIOt|g@PVylqY24#cZ>|0Mw}AKSE|;R|18J>Fi7q z0Tt^xf6*In7B{cz)OY;#1s_x$=yB9LAq@@Ce7)V_b$AzSvmL`TGThQPAJ8Yk>bY82 zruKkAa%19O$LE}sqhT-N(xzLx-+EIFjIsTWHeEf^Cv1*Fy5jgY(wogIZXf-%>8%%t zXK0{#MRIz&8})JN5$lRMTu)UW)W#jLwWvQ8|NAk>7%=GCJ07~?)!cG@_!!QXZ1ymq zPQj`5uZNG25PzDOmp7tNww9E?r^x_M%#CYWv-W=!)3FCsSS1EP^0jz*>1RaMWj#tpTt8MfUZALHRPLtCf z+bO;Fjj}xM)UEf(wQfbW-no||zDS$FWm^EV3+mOUQD8jZd*(=Qqr9S&ayx~5jFH&AF#uvjjDx3Y3&HQm==u;6}eHXZG zB<~CNn;GxyW>R0V!j<~_pf;-W=(l^~jMGpK%Huv#G9Wv&1|d$Kj#8|Y=X>O~4y1>> zZNx~LNRiGG-{3lhqQ+8hLeETC{%ye3eBpwzzP@3JRuQ-Hdd!v5xr{Ui zg~+ww`^$ir_xl6r2C9N=SB8}ECJYL2*n5Qfgfo zy2yQ(#kdHdJUX#Z9;Gu=;jQ`%xz+s*uC_e?4Y^~hseJ6~T7ebeY0F!r5m*#Yhb!3iTbtemn^YXKSDDNu++^NtJJIR7h2r4Q+( zSdLr-iw`UDTs^FG)e~AEkRmr(vLlct4A&uGyA7fzcucQQP;9{fJ8$smGXcL(o}*%1 zaqx>|sMLA?B1noc1Fq_uh?wX)d^s00XM1`EE?Vq^V~YE*{ps^W?INyXih43wEcSd?lZfBjqdjL(8ewV$!AMJ&sy26g11;x z>D7(}MY}W>^up=DR>f7M$_(ipc-U`4XQ1Cp>-}YL^$i#_n;(>_oafs@MQTu^Z`};y3shRQR*d(cU1Dqh6TVSjy=;U*M{= z1T$R9`vz4Y7mn^-(wG?DwIxsJF(kBPvc$D=j;kcHJA(c4LdK8Iz=J<|89MrrBbcjd z?hI5Wy_pNji?l6qE%*_pqY_O={=q4nM~4=+TQ^bBCam8EHW%T>Zn7 zePI;tv60!jR_mPhFnraS{v!B=@%r?6e^DDd|4IIg@3K{4j>{K)P>WDs;WRnT*Vy7b zmpujdfXM)mb!+^Av|x;aW`itFSh#w%3+arkVgv2}t~MuKVu?}JhbW~j$x6C}VkGHB zAQ@cgzA}^Y96C4iyGlMTD?K5TfOC~*5YTBf9oKpg&A79I^G83mz1?aViInn+%yf=g zmGd`V-GbvsSi>Wb-j(u+NDE*J#ArRLAB?hBMB1&CQ+iF^iuZV{#m-yJREjhO7>+8K z1!eGE3VM$e+?4~E63p!XY^AGbA@7=4Z^6Sdbsg)Lv8b1n({4z$*molj?4%!z`tr=^ znk(Fu^h2t>mZkKos-zaOOpGa{mink}twTlVq4ft!iR)01DEEGTsiJSBCH2f?PjUHb zFBU@;p41K1O%c%spZo$rmPQzbtuz};or_2HWJ|TV2PA;U4oGeGg^$y3iN#m6=)Ea| z0APQ!=Q@}j^4Y<9N|s{9AwUXtA$Z67%DlY3Z1arTITpRhFsg z23OXeMD(WX1N!eWT)@k9kn`QPY5FC~6NExGtVVie=tViyB{e#@ zL`zeO55;}|R9<&-+Ms9B<;8nwYTcGxy5^rCA0B4&_^t@5LgQ%rU(cF|Sl{XM#c<(X z%3KO#!w=n$go|FgO!qg|H@VnfU5kFvSi6>Vc})7pz~@V`%QdDCTY~!oLXgX>5BG%t zjydaqE0#w=Jsx%~Ef*JZDs!Nhq*{JdhjUi{s3LgV$l2RDdfp?V^vG1uX4{Q&XnjH7 z1DEy>Db-db&LB7G8&e3T*`^|63WA=w>h9?~!?vRAGU?tMd2$bJ?8l(Vo7SEEsz#7r zQfjLDUO)3HP95#7n|tMvf-os^?V0}g71V1B)Gm6%CALyHlQFdYuXF82$C@mDtSeG4 zDMbqN)Ide3`TE^elVidGWGrEIaGCRUF-RQK815-FRkD2gou{^Q1 zm^dm7!Y1FjWDIX_#B=Yg>)bU1#fw0f(^tk*CyKo_weT|8it+4LIsb^xDT ze5?xD$$Z}`2%)v|OPkMkXT)c#e$?j+H#}22Gh~^+nTK$0gG%>7pYsgMn#N?q{ImEJVcRRy)C>~|6toGQPz$$*l?LG zeOKV{d<}N##UG?wU0CULlgAK?o%S!D%>J6Ryx^%d zs@GlW_vb}%k-5)i1H$W#+d7jR^>&r4S$*yh_WHCQ@6OP?U+bp;bM$=05IhuX-rPek zmKAg}x;>eF>U-roBA2H!k3J(L^b3nj0&n}xba>JHHqkO>I-T}c&Xl2aQf)0x8*X92 zO3vMUpG5>q)WT<~s7UnYOC|3A&}e-ShA%Kl&n)C(tH>gaNdkZIg5UY^{VhLs9rc*h z8Whgj?b~_-$4h4}(yuUB1BxiowV9nA$1l2%Y{2<6D2lg1a~VHuI~Gm;XoXm-yxR1Pu1EM0@&>^(b;s1u>Y_) z*7Gu_i;Iny^l+zjekm(x9TWeff4XJg3YTvcpWAmfviw~hMs5qSIj;X?mgO}*%Nu<6 z2{b-0Q!&;a3u=e-X-f{)tyg-d~RJ= zyJgz4Pb6i|C4CA)uYM0u5O{HA^$OH6lT6%1v0cv@;#O^__24%5Guo_s0?hp5#3N-9 z4$JQ?9~4YFZ?dG@4dM(X6u1_d-CIN~x#oEnhgH4^_kxj$XdU+7_Gt2-hVtw(zaLmmQmvNf>x>c$}>`J zI;}DDhgN{vTOf%UPb}g%uWvBH1O5q|p ziLvQf>iz3$ZTW+{Ga^yPX0`7*ln<47jT>>v(uX?rw*Kax+hg&Pg5iGzC`{~!RnjCP z!%b_vep;(C6gP`@n=ocZAqu6_Dc@c1UC&`aDWsMO*pNVS3JNwQ*>9n{- znVcHD)Hwt^wNuw*IPcmtcIQS9EKx}>r4IiO?X)WnJqd48=xq3E3Dz7nubov@pak=} z-C2*=d6#)>3dcG1p)xZYEga%@XFXI+oy4l0VI%ygNK9U&PuOUVubD?pKdwx)X}#^U7$<|3C~ zMV#NPzPyex(7hqCzo^6Ei4 zDncrqF**`QNLpVF4M0m$54j(k4%lNj;2b zj(wUHu`~;MJ3qxBv#vYXdoF|3DEi^d@nd~mTe#R4I(vZ{)BRCa5uUjEYKYnmRi3xE zO=jTIFATfCOT@~{^U{jF3li`Dl@;)K56c0G#nzUyj`bVTUkNa89@69ZJw-5)@YMwT zEy785QvToz2@iOl_+;_8r^NEVu`X)%{LQgEV#Y6t@Tj~ zowi0=rHntMKETYQ)z*V;YxdzjN_&n#I3#>(<3>FR5Vc&`3s(Z4Y2xeWhu4M^B7c){ zk2Y^3Zatsc8Y2T1Sh~z)q8o~+_Q$CeaQ$hw(dw&vJG)AH4eSm}?yOY82;3<$vwtAr z(PC@4DOM+Axq4_OavrsAqD)L=ENL%uuHS1_sM(1B~chPmC|x@W-!dW^-irA;qV zFN-$4CM{i}7N+ek2rOy6!l*Bdt|})DY-+y#HLUQQjXypdZZHrv#B32y^$}fiaD+fdA_Hi_zP(X#E3u8~UB>m;S)?wDKrP3XBgt zCqDZJ+~ub-D)XG0Yu==scapGM2z;9k0{i#w2<#Qsq61$#Y6DcSvZl;X&FA;4u{~Mi zOwuKCZR;yzy=2{5?@)P&oXXw+CKOi}w?`Kq+0;kXsnq((Euk=#Lo329fppWUCi$H& zE(&%enI{>3dq5py+=bQOb7mJ zpJVQ*9P9NY%}APP=9hK=#2UCy>m@wOra_^|!%(cQ_B|$|_9(#&xYti9E+jC}LuWzHK#CHsmrYlQ^jp;$1P79Sk{U8y5d?@rfq9@d9$ zry;{|wTQ3CCoNRRx&I{Y5p!HMkMZ^%dJm z6IU6%3oV)%`96{Uim_z}ousSCDUMtwsjQaqoH&u1tnVToFnZCCvQ<^$Rri-f?dCoi zJ?9V8I9CYa3!Y7Is-tV&Z$BsA^1w;LGp$73R$+WpyvAxAs1sKH5SH>&L*j@DNeg`m zxs*}*nY1rO(>Bc2?KLm-@6kQ`F}-0D>#ZDvLqkE^jIsTBv!_1dToxKVvq_boT+RSY z&gk!XNxNs73sTkjH726rx4t5r#OT3%3R{A z>5P!6^-xl!vJ2BfTuo*`H0f&c-^)Z&D!PKhH z=QIMlx%1ynIBYF5b@h8iRnz>kaUVObcF$+$&6!q{NvdaMc-gpDhwK-VoX~JOGygIJ z{TD=PCes+!X~r+%;j}#{;gYDF)gpsG{=-cunCJ1$7B*B*UL>ig2HBC9AQCzCf~)dR zCGeV@y?g6|3UiH6h$u$fuNY8P0kg(}v}=woz_US=FX zrGLe83HdArpv0PzuJ+Z zPyHQnvg)(ttbMfzIu_C7l^2(Ip`|G9uy!S@)Wj}|_D`oCv2i;>&NsP_2^?xy#6R4) zdQC@GcQy&qJ8w`|AO4g0rVeh;=p_+adE~Q&%k0q|;=k|_W)mNaU#sxsJJjx@kl=jU z%K7gw)Z7&(Hmsx`_6X@CQA#hhqyCAE)9)|&JzT$6*MDoDn2rmrEc@rk46&`MTu=xn zgcp60=G-bR5JSG&q#fq$>z~DNLCZL**u$b!x@0_)W(n=7W-r^vV}ygbMx;n`8`|%i|F_2`n^y7$HI#FO8QT-fTx`88_)h9eLkoQCD$z3 z4*%t9B)*%9PB-McmmH|yF#AU89u%D|y@>I%ZC2xsMAZJPJ!fb)Mx4*361jHdgbjP+ zhcPY(eitzg#gf@#v40$*BX3$m+U{v8b<`K~py|Tq%6ejTzuteYkYVC>VHlKNmIY}1 zx*=3FCMNLY3`uR?`<2dSUxMT-9CP^`rYBK6Hz}gGmJ+`vNVf&g!(<$JrX=JINA=QsNWh^l5@=jVD6kn)TzEpSX=iMgPASF?~i;Opvw zWo?#8JJ$Nt&E$|D#Lk6)Zn|`T3za1f{!Wf$te(0OLOhEsGuQCKI_9?dgXM1Nsw#Ei z&bFq)5nyOnBgdaY(AJ|ivZ{L9B)Cc4t?j9JfG4`*E!`ZtGA21Fm{aB#+X{Oy+URj> z1qSy#b+mlPIDR+Oa*oeNZ-HsY(eQ3TSQ`8=(37#b*vjWB%#D-aG$2{$3^>HGr!K_B zRoe{-xOrsl4_tK=9-`Z0!NN(5{WOl%{V2LSChhG9-zLgNV&DrK>+xmw{Q?pGOW2$` zb1kRN+|~bY>&*LTqy|t;DsjFvZMdkM5n2)bW5!(S5Z$UqUho%^@xZXs?~#1`!z#T+ zbjX9miO`9_+{gmaKFV#`(9mlME7Bdur-hs<(TXZE3@`liY^$AFcF=fPkJ1CqxFDw`MoI@ zMePc1_x(W2Oi|K7;&b*Eh02*kX)yp@pd(|}1U4*Z1<>nv8oBhz9(b43hF;XNJrC^{ zXL9b#V#TRQX%af$DsooU;165jYj9UxHZQ|GV*jOn5(@}kwEdBLeCbUR9fpc|o$c(e z`t7YtUj)3-H)VfA-EcB$h+0#goTGtmPz`B{eQI0A$Ib*tf;-|NQ_5;7s9UVqfP8)6 z+a)8uzE~P#a`WAl*Ir!2=9fvl#=q}?kGd7%+22$ka9s|>Z9yKY06j{A8othK{>0M} zIVK`Gcc{!c!@c{PuruUDZNz!#dvo~;f@u|O5g_nzE?|Ch#a#rTS+Tc>_ws>c%_b!! zYG(cgiu?J15l|*ruQQ({pthr_er$5mR7?6i`PlQJ1vjlca04qkRa)~C{gvOLAiAz zOmZd=T3CBIo7(e-N!PKs4Qf;gXz+2>)?umorOjO8o6Tg@=H__uXjEk$%O!rk#fg?# zdM^#*O@k{YBpoPEPO9}+^0rNQ5PkS|iExMbBV+R-)g@m=?;k2!EqP|{>g2K@OY~FV z%Wu8rBckOmN@Fpq0g&3K-d;+bGM|YBo|*Z-tYXY$VJ!1X#X7FK*3-nyIoEfZxR&w* zi0^Wtp$zo6Dr==KxWamKlkp9u`VH=PP(xh01`MBq(q2+d%#c(8E6xgF@up{wCD=4@ z-uZbb9 znNBKo%nXKkA+V!Xj59oD%|$9BX|P|q%-x5w`~*f*yQ_FMI@kzBYloQ{^wn=L@MyWp zA~skRpuuQfa_gw~0>pOj*LOpCt7GdM(iei7aJ<_Jyj!7^!TGx&oUGxi>8q-Beq*xN z3&JX~MaD^DTBzEY`tfbq(Hr&=bl{b*rcWe2PAi;WGE1 z41ZBvqv$pW_GOb4vt+oV5$F0~mm!K@MwbpbX-FRg86-UG#wMLclikz+CMR_~ZgX-o^^D_0UU~atq=E(sa7gm=Q z5iH$tErQGQ9qrYYRP=A0gfq_QmTl0_Wjh2wHKriYmLAq#CM12%gbXg4ZYbA$zKhVJvw&bob{0ET)cL8 z9`z7*Dt&`JdS&DZDFJ z>{AcM?B0sWMjH@Y)9`21ysX4bUY<{iF2Ahf*Ivj0mw0PRPUMrqJuSrQ9p@Hxi&%F@ zUs*U3G)$hgPl(A=l03_Zri_r-xzetRRVe~=o>%rL&Qa~(0jFurTOr4bbQRqap3 zW#T?n-AIJKs;%PCONoZOj$O)5W=NKef!!q!bWm$Xf?II>JsX0j8*di7fKul}nCpv7 zlIIIuJ}duT>S6bz*2$;FO`e2?eG^*ICg`nlfdUmF{!?1r+!LO0Ke@v`|{*H1@Dyce`$I--SEQINkU=g<6SghiaDSe8rv-Tcw(Bvl>a8& zN|Ly?IqQNK2>reMIoZqHB5io&6$(s!-?SIRHH`0b4d=E@M0C+Yc z=-PllgfD;5lD;f>#mLFjQicrl1Y|HS!4I9O$UYdAwQ+_h<<&>=jxAbMd!`LHq~$R^ z;0aD9Y;T` zC;W7!%+fZ8Cx4gw5T-Aoc^1eB5ndFZ(Z0rg&C9=@@uNmte;&?Ju9q>?E*U&Wf6}zx z-OJ_{FhBRORQUqguY`tt*^2|8I@p@HqQi`boN|(5b&f2o-lK{@FIq@0@N)5%d#Dd> z$22!c#0!rY<%k8?0->_8QR}$~Vai9?*;wzx=<##;NY_JoTVSWBbI~w2XfCvg?t+Sk z8x{9(_kTUNyFCvMRvN6O_Q35X0>9JgBB-Fxcu@~oV#8idm@|X~{SHK=T!L}zHt>!* z$ENc6e`VlW;2{i#sYQ}`^!}RZi1Kxl;N!X!7hRzgZ zx{|a)PXagXcIi9O{x%=S7t8YJSCRH$R}PnGem(z}B^)02#Poy^(_}*W)BuS(m(|mu zF*gXBp9L)k9x|R-wSD@hng%pE7ah5EZH}IrEI%P+yZe4uh8izqyfo&apgrE|i* z@L!Wwz9EXw>Ish{R;fJ7!YbaqpPBZj$MY7_(C(s=i+y|NmDPuGlz^CCSQm)azlJ6@ z{dGU#%piBw_P+x>(UeaT#?ew}lx#VXs4FxeKMdSO_)TagE0Y6o`Mig}PVdW$%fyK( zja+NcBx;!+CLZlVat)k)`|}42FmGFzyHCC^UOZE*8>D;|9N=xcGP{4J)GG7+^*bzj``96T?X9L0dn0)aiwS3e6#MetS z&*r4-Kf{M2Y!+H?U+GAmnFiHwZj@$F;DRFM?h3M3^$wAsxT@~_w!oKY`Z)m|*QAAQ zABeX(NCy@+5Hl*$)%?b@hQiAN#BZjz;-F;0$2QWW@*xy41*L4KE1+)`|MDOQktjE4 zC#)U0kBCK!oO@BB)+gB8Z@F5-CQkB1Q00iuUBRJ*&YlLQlX~LzM>&MiUZYg=;XNAp z6uj>0b3L^Fp=RX%qYx5=I)7kwoVH}`O#V(=#Fww&f0ttzaYD@qDvk{Iu_-!KMmMlh z^x;RA=)0+UE_abiUo+pBzV;ooJU@ObeEVd^`V$zA70|h*R*FnyeW;5m|A)|9VJ&!F z-!e3tO}e|Mp;c<&A+qHiLBKv=bf0n@iHO6tu#iZ!82Q56uurw`td<^67o1IyZp}?w z=xrytdDJTcJ|JT85nuV;S@CRqXJAYV9QF$x(ABxkE2;!8Ptv4yp|CvJUb4`IM^&7c z-WJF&thh#V*ij6Om<5cOVyF%NZmSuF+D^I5P-zHi^&vj?%|F4`YfTmmCm}YG0^ZK* z?`@HnYI6v=X+0jjgzI+Kd4cDvZ1Q(CX!Qn-AMQJ3bOs13$uHXeaFz572R>hgNyAR2 z|69R;je$OhItBU+&~n*1f{5<_fWiC~1e_NYtk!wIV@sj|z(5KIj?Xi5;A1eQfJA&KjWGVDXhT zuBQAU1|#EBi-dbcik%c&Z!;cT2`ToJ|tS}NS_f$^qoGha{oRyy3Wn6{F>=M zi1tC9jj4b1TFpa3V~t^E3k=Dsk>>Jug+#vNSo$^|#L^0xN*`9>9E>xNqq87Kzb7;H z!ct2SLN_&pN{AG=clwgv5jVg10c+Y;$g>zLiD(ktVzc(tK}2{t@a;;EY97mtPwv(^ zg%1m-H*m9+=}aAIJfcs`xGuh!Sh*3Gdix|OtjgOEN#xL)K%5+IyyQ^DIlPZ7-Xr`< zR4+5N_1KVSb{J50D1%XAH|(xnJTZtrI}a$_lU3=%x;X3yu(1Eec`6|uOvwg%k3E)c z{Btc(xRX=P*i)zWQ;pciwDQsupY!U@(kE~GX^6hziH zgY`ysm696h1(zE!gPR{_Op3DUlyS0{IA(f%QtZg{BpJZ7b#3gMCwzdacg?lnrq*H# z#y3Up88sM#OJks?9jpalhsF29^$m^$*^GxY&gH)c0-G{2+hXRt+t{)rt)!GkU+;u3U0b2I=| zpK&_OPkmwuOoK|bh}Mkra^#1>9)niJf1M<*Qp5Fk*jO@F%b)d1G_gcwG3jtLh-f?(XkF4LD=gQm1zE4A8Hm@#$OMG}k;?)2>F>#XZg0$j5ld{uM!+^CZHX0ZCXd|foQL`O!|xCLm!bQ4tN%TQzr Date: Wed, 3 Jul 2024 17:50:05 -0400 Subject: [PATCH 13/13] Update help files using roxygen --- man/adjust_luminance.Rd | 1 + man/cell_borders.Rd | 3 ++- man/cell_fill.Rd | 3 ++- man/cell_text.Rd | 3 ++- man/cells_body.Rd | 2 +- man/cells_column_labels.Rd | 2 +- man/cells_column_spanners.Rd | 2 +- man/cells_footnotes.Rd | 2 +- man/cells_grand_summary.Rd | 2 +- man/cells_row_groups.Rd | 2 +- man/cells_source_notes.Rd | 2 +- man/cells_stub.Rd | 2 +- man/cells_stub_grand_summary.Rd | 2 +- man/cells_stub_summary.Rd | 2 +- man/cells_stubhead.Rd | 2 +- man/cells_summary.Rd | 2 +- man/cells_title.Rd | 2 +- man/currency.Rd | 1 + man/default_fonts.Rd | 3 ++- man/escape_latex.Rd | 3 ++- man/from_column.Rd | 1 + man/google_font.Rd | 3 ++- man/gt_latex_dependencies.Rd | 3 ++- man/html.Rd | 1 + man/md.Rd | 1 + man/nanoplot_options.Rd | 1 + man/pct.Rd | 1 + man/px.Rd | 1 + man/random_id.Rd | 3 ++- man/stub.Rd | 1 + man/system_fonts.Rd | 3 ++- man/unit_conversion.Rd | 1 + 32 files changed, 41 insertions(+), 22 deletions(-) diff --git a/man/adjust_luminance.Rd b/man/adjust_luminance.Rd index 5d61bf0083..9cd0020d9e 100644 --- a/man/adjust_luminance.Rd +++ b/man/adjust_luminance.Rd @@ -116,6 +116,7 @@ Other helper functions: \code{\link{pct}()}, \code{\link{px}()}, \code{\link{random_id}()}, +\code{\link{row_group}()}, \code{\link{stub}()}, \code{\link{system_fonts}()}, \code{\link{unit_conversion}()} diff --git a/man/cell_borders.Rd b/man/cell_borders.Rd index fa538e7318..42b225350d 100644 --- a/man/cell_borders.Rd +++ b/man/cell_borders.Rd @@ -115,7 +115,7 @@ It's possible to incorporate different horizontal and vertical (\code{"left"} an \section{Function ID}{ -8-26 +8-27 } \section{Function Introduced}{ @@ -140,6 +140,7 @@ Other helper functions: \code{\link{pct}()}, \code{\link{px}()}, \code{\link{random_id}()}, +\code{\link{row_group}()}, \code{\link{stub}()}, \code{\link{system_fonts}()}, \code{\link{unit_conversion}()} diff --git a/man/cell_fill.Rd b/man/cell_fill.Rd index 96870d91d6..26be5550f3 100644 --- a/man/cell_fill.Rd +++ b/man/cell_fill.Rd @@ -68,7 +68,7 @@ in the other. \section{Function ID}{ -8-25 +8-26 } \section{Function Introduced}{ @@ -93,6 +93,7 @@ Other helper functions: \code{\link{pct}()}, \code{\link{px}()}, \code{\link{random_id}()}, +\code{\link{row_group}()}, \code{\link{stub}()}, \code{\link{system_fonts}()}, \code{\link{unit_conversion}()} diff --git a/man/cell_text.Rd b/man/cell_text.Rd index df835bb6d1..88a6e35e68 100644 --- a/man/cell_text.Rd +++ b/man/cell_text.Rd @@ -162,7 +162,7 @@ Let's use the \code{\link{exibble}} dataset to create a simple, two-column \stro \section{Function ID}{ -8-24 +8-25 } \section{Function Introduced}{ @@ -187,6 +187,7 @@ Other helper functions: \code{\link{pct}()}, \code{\link{px}()}, \code{\link{random_id}()}, +\code{\link{row_group}()}, \code{\link{stub}()}, \code{\link{system_fonts}()}, \code{\link{unit_conversion}()} diff --git a/man/cells_body.Rd b/man/cells_body.Rd index 65a15b1825..e14698165c 100644 --- a/man/cells_body.Rd +++ b/man/cells_body.Rd @@ -98,7 +98,7 @@ row in the \code{hp} column). \section{Function ID}{ -8-17 +8-18 } \section{Function Introduced}{ diff --git a/man/cells_column_labels.Rd b/man/cells_column_labels.Rd index 9a32a709d7..98cb6f3f6b 100644 --- a/man/cells_column_labels.Rd +++ b/man/cells_column_labels.Rd @@ -77,7 +77,7 @@ Add footnotes to the column labels with \code{\link[=tab_footnote]{tab_footnote( \section{Function ID}{ -8-14 +8-15 } \section{Function Introduced}{ diff --git a/man/cells_column_spanners.Rd b/man/cells_column_spanners.Rd index e2243aa647..b93a1cc971 100644 --- a/man/cells_column_spanners.Rd +++ b/man/cells_column_spanners.Rd @@ -58,7 +58,7 @@ we are making the text of the column spanner label appear as bold. \section{Function ID}{ -8-13 +8-14 } \section{Function Introduced}{ diff --git a/man/cells_footnotes.Rd b/man/cells_footnotes.Rd index 7072bf247c..df218d6031 100644 --- a/man/cells_footnotes.Rd +++ b/man/cells_footnotes.Rd @@ -62,7 +62,7 @@ footnotes section. The styling is done with \code{\link[=tab_style]{tab_style()} \section{Function ID}{ -8-22 +8-23 } \section{Function Introduced}{ diff --git a/man/cells_grand_summary.Rd b/man/cells_grand_summary.Rd index a42a21cd2c..31f145fdd0 100644 --- a/man/cells_grand_summary.Rd +++ b/man/cells_grand_summary.Rd @@ -103,7 +103,7 @@ some styling to a grand summary cells with \code{\link[=tab_style]{tab_style()}} \section{Function ID}{ -8-19 +8-20 } \section{Function Introduced}{ diff --git a/man/cells_row_groups.Rd b/man/cells_row_groups.Rd index a601b4b9a7..05ca616183 100644 --- a/man/cells_row_groups.Rd +++ b/man/cells_row_groups.Rd @@ -67,7 +67,7 @@ the targeting is done with \code{cells_row_groups()} in the \code{locations} arg \section{Function ID}{ -8-15 +8-16 } \section{Function Introduced}{ diff --git a/man/cells_source_notes.Rd b/man/cells_source_notes.Rd index d4220ef481..bc794e06c1 100644 --- a/man/cells_source_notes.Rd +++ b/man/cells_source_notes.Rd @@ -44,7 +44,7 @@ inside \code{\link[=tab_style]{tab_style()}} with \code{locations = cells_source \section{Function ID}{ -8-23 +8-24 } \section{Function Introduced}{ diff --git a/man/cells_stub.Rd b/man/cells_stub.Rd index 879ecef20e..3fdd794858 100644 --- a/man/cells_stub.Rd +++ b/man/cells_stub.Rd @@ -63,7 +63,7 @@ using \code{cells_stub()} in \code{locations}. \section{Function ID}{ -8-16 +8-17 } \section{Function Introduced}{ diff --git a/man/cells_stub_grand_summary.Rd b/man/cells_stub_grand_summary.Rd index b27d732f8b..5a4617cc31 100644 --- a/man/cells_stub_grand_summary.Rd +++ b/man/cells_stub_grand_summary.Rd @@ -75,7 +75,7 @@ some styling to a grand summary stub cell with \code{\link[=tab_style]{tab_style \section{Function ID}{ -8-21 +8-22 } \section{Function Introduced}{ diff --git a/man/cells_stub_summary.Rd b/man/cells_stub_summary.Rd index 9ecba0928b..a5c479f7cf 100644 --- a/man/cells_stub_summary.Rd +++ b/man/cells_stub_summary.Rd @@ -104,7 +104,7 @@ some styling to the summary data stub cells with \code{\link[=tab_style]{tab_sty \section{Function ID}{ -8-20 +8-21 } \section{Function Introduced}{ diff --git a/man/cells_stubhead.Rd b/man/cells_stubhead.Rd index f6a950a798..454eebf1ec 100644 --- a/man/cells_stubhead.Rd +++ b/man/cells_stubhead.Rd @@ -44,7 +44,7 @@ with \code{\link[=tab_style]{tab_style()}} in conjunction with the use of \code{ \section{Function ID}{ -8-12 +8-13 } \section{Function Introduced}{ diff --git a/man/cells_summary.Rd b/man/cells_summary.Rd index a6ff00d47d..2a0966acb9 100644 --- a/man/cells_summary.Rd +++ b/man/cells_summary.Rd @@ -138,7 +138,7 @@ some styling to the summary data cells with with \code{\link[=tab_style]{tab_sty \section{Function ID}{ -8-18 +8-19 } \section{Function Introduced}{ diff --git a/man/cells_title.Rd b/man/cells_title.Rd index c192ee6c81..41222fbc61 100644 --- a/man/cells_title.Rd +++ b/man/cells_title.Rd @@ -49,7 +49,7 @@ header with a title, and then add a footnote to the title with \section{Function ID}{ -8-11 +8-12 } \section{Function Introduced}{ diff --git a/man/currency.Rd b/man/currency.Rd index eb2d51fc89..33325cdc85 100644 --- a/man/currency.Rd +++ b/man/currency.Rd @@ -98,6 +98,7 @@ Other helper functions: \code{\link{pct}()}, \code{\link{px}()}, \code{\link{random_id}()}, +\code{\link{row_group}()}, \code{\link{stub}()}, \code{\link{system_fonts}()}, \code{\link{unit_conversion}()} diff --git a/man/default_fonts.Rd b/man/default_fonts.Rd index eb569d3f55..9036cd038c 100644 --- a/man/default_fonts.Rd +++ b/man/default_fonts.Rd @@ -50,7 +50,7 @@ the \code{"Comic Sansa"} and \code{"Menloa"} fonts shouldn't exist, is that we'l \section{Function ID}{ -8-31 +8-32 } \section{Function Introduced}{ @@ -75,6 +75,7 @@ Other helper functions: \code{\link{pct}()}, \code{\link{px}()}, \code{\link{random_id}()}, +\code{\link{row_group}()}, \code{\link{stub}()}, \code{\link{system_fonts}()}, \code{\link{unit_conversion}()} diff --git a/man/escape_latex.Rd b/man/escape_latex.Rd index 5f34ca36f1..3f73c34081 100644 --- a/man/escape_latex.Rd +++ b/man/escape_latex.Rd @@ -23,7 +23,7 @@ within LaTeX tables. } \section{Function ID}{ -8-28 +8-29 } \section{Function Introduced}{ @@ -48,6 +48,7 @@ Other helper functions: \code{\link{pct}()}, \code{\link{px}()}, \code{\link{random_id}()}, +\code{\link{row_group}()}, \code{\link{stub}()}, \code{\link{system_fonts}()}, \code{\link{unit_conversion}()} diff --git a/man/from_column.Rd b/man/from_column.Rd index 38c52c7584..04adedd1c6 100644 --- a/man/from_column.Rd +++ b/man/from_column.Rd @@ -168,6 +168,7 @@ Other helper functions: \code{\link{pct}()}, \code{\link{px}()}, \code{\link{random_id}()}, +\code{\link{row_group}()}, \code{\link{stub}()}, \code{\link{system_fonts}()}, \code{\link{unit_conversion}()} diff --git a/man/google_font.Rd b/man/google_font.Rd index 7289919d46..d5d2ad526b 100644 --- a/man/google_font.Rd +++ b/man/google_font.Rd @@ -87,7 +87,7 @@ two font fallbacks: \code{"Cochin"} and the catchall \code{"Serif"} group. \section{Function ID}{ -8-30 +8-31 } \section{Function Introduced}{ @@ -112,6 +112,7 @@ Other helper functions: \code{\link{pct}()}, \code{\link{px}()}, \code{\link{random_id}()}, +\code{\link{row_group}()}, \code{\link{stub}()}, \code{\link{system_fonts}()}, \code{\link{unit_conversion}()} diff --git a/man/gt_latex_dependencies.Rd b/man/gt_latex_dependencies.Rd index 18530cd6f4..6a4f6a0f38 100644 --- a/man/gt_latex_dependencies.Rd +++ b/man/gt_latex_dependencies.Rd @@ -46,7 +46,7 @@ gt(exibble) } \section{Function ID}{ -8-29 +8-30 } \section{Function Introduced}{ @@ -71,6 +71,7 @@ Other helper functions: \code{\link{pct}()}, \code{\link{px}()}, \code{\link{random_id}()}, +\code{\link{row_group}()}, \code{\link{stub}()}, \code{\link{system_fonts}()}, \code{\link{unit_conversion}()} diff --git a/man/html.Rd b/man/html.Rd index 55c996ce44..c561441f71 100644 --- a/man/html.Rd +++ b/man/html.Rd @@ -77,6 +77,7 @@ Other helper functions: \code{\link{pct}()}, \code{\link{px}()}, \code{\link{random_id}()}, +\code{\link{row_group}()}, \code{\link{stub}()}, \code{\link{system_fonts}()}, \code{\link{unit_conversion}()} diff --git a/man/md.Rd b/man/md.Rd index 90349819af..1d2d0207c1 100644 --- a/man/md.Rd +++ b/man/md.Rd @@ -71,6 +71,7 @@ Other helper functions: \code{\link{pct}()}, \code{\link{px}()}, \code{\link{random_id}()}, +\code{\link{row_group}()}, \code{\link{stub}()}, \code{\link{system_fonts}()}, \code{\link{unit_conversion}()} diff --git a/man/nanoplot_options.Rd b/man/nanoplot_options.Rd index 1db1ad7509..40e68d874f 100644 --- a/man/nanoplot_options.Rd +++ b/man/nanoplot_options.Rd @@ -314,6 +314,7 @@ Other helper functions: \code{\link{pct}()}, \code{\link{px}()}, \code{\link{random_id}()}, +\code{\link{row_group}()}, \code{\link{stub}()}, \code{\link{system_fonts}()}, \code{\link{unit_conversion}()} diff --git a/man/pct.Rd b/man/pct.Rd index ad36ae8177..1ba9bf5240 100644 --- a/man/pct.Rd +++ b/man/pct.Rd @@ -75,6 +75,7 @@ Other helper functions: \code{\link{nanoplot_options}()}, \code{\link{px}()}, \code{\link{random_id}()}, +\code{\link{row_group}()}, \code{\link{stub}()}, \code{\link{system_fonts}()}, \code{\link{unit_conversion}()} diff --git a/man/px.Rd b/man/px.Rd index 278e47ec05..105ea958d9 100644 --- a/man/px.Rd +++ b/man/px.Rd @@ -73,6 +73,7 @@ Other helper functions: \code{\link{nanoplot_options}()}, \code{\link{pct}()}, \code{\link{random_id}()}, +\code{\link{row_group}()}, \code{\link{stub}()}, \code{\link{system_fonts}()}, \code{\link{unit_conversion}()} diff --git a/man/random_id.Rd b/man/random_id.Rd index c3068a372b..f95dadddbc 100644 --- a/man/random_id.Rd +++ b/man/random_id.Rd @@ -23,7 +23,7 @@ argument of variable length (the default is 10 letters). } \section{Function ID}{ -8-27 +8-28 } \section{Function Introduced}{ @@ -48,6 +48,7 @@ Other helper functions: \code{\link{nanoplot_options}()}, \code{\link{pct}()}, \code{\link{px}()}, +\code{\link{row_group}()}, \code{\link{stub}()}, \code{\link{system_fonts}()}, \code{\link{unit_conversion}()} diff --git a/man/stub.Rd b/man/stub.Rd index 3ce131a026..6d342a70bd 100644 --- a/man/stub.Rd +++ b/man/stub.Rd @@ -72,6 +72,7 @@ Other helper functions: \code{\link{pct}()}, \code{\link{px}()}, \code{\link{random_id}()}, +\code{\link{row_group}()}, \code{\link{system_fonts}()}, \code{\link{unit_conversion}()} } diff --git a/man/system_fonts.Rd b/man/system_fonts.Rd index 6c61d5ce7c..208a62ab2f 100644 --- a/man/system_fonts.Rd +++ b/man/system_fonts.Rd @@ -234,7 +234,7 @@ are used if the aforementioned fonts aren't available). \section{Function ID}{ -8-32 +8-33 } \section{Function Introduced}{ @@ -260,6 +260,7 @@ Other helper functions: \code{\link{pct}()}, \code{\link{px}()}, \code{\link{random_id}()}, +\code{\link{row_group}()}, \code{\link{stub}()}, \code{\link{unit_conversion}()} } diff --git a/man/unit_conversion.Rd b/man/unit_conversion.Rd index c0c5ef1d63..530b2c935f 100644 --- a/man/unit_conversion.Rd +++ b/man/unit_conversion.Rd @@ -173,6 +173,7 @@ Other helper functions: \code{\link{pct}()}, \code{\link{px}()}, \code{\link{random_id}()}, +\code{\link{row_group}()}, \code{\link{stub}()}, \code{\link{system_fonts}()} }