gtsummary themes

knitr::opts_chunk$set(
  collapse = TRUE,
  warning = FALSE,
  comment = "#>"
)

It's possible to set themes in {gtsummary}. The themes control many aspects of how a table is printed. Function defaults can be controlled with themes, as well as other aspects that are not modifiable with function arguments.

The {gtsummary} package comes with a few themes, and we welcome user-contributed themes as well! Our focus is tables that are ready for publication and encourage themes that assist in that process; for example, the theme_gtsummary_journal(journal = "jama") theme sets defaults that align with the published guidelines from the Journal of the American Medical Association---JAMA. The defaults in {gtsummary} were written to align with the reporting guidelines for European Urology, The Journal of Urology, Urology, and the British Journal of Urology International.

Setting Themes

To set a pre-defined theme, simply include the theme function in a script or the R console.

theme_gtsummary_journal(journal = "jama")

Use the set_gtsummary_theme() function to set user-defined themes (more on that below).

set_gtsummary_theme(my_custom_theme)

Themes must be set before you create the {gtsummary} tables. Let's take a look at the default table, comparing data between treatment groups.

Default Theme

library(gtsummary)
library(gt)
library(dplyr)

trial %>%
  select(trt, age, grade) %>%
  tbl_summary(by = trt) %>%
  add_p()

JAMA Theme

Now, the same code with the JAMA theme.

theme_gtsummary_journal(journal = "jama")
trial %>%
  select(trt, age, grade) %>%
  tbl_summary(by = trt) %>%
  add_p()

By setting the theme, we were able to change the default formatting for the p-value and add a dash between the 25th and 75th percentiles.

JAMA + Compact Theme

Themes can be stacked as well. In the example below, the JAMA theme and the compact theme (reduces font size and cell padding) are both called and both themes are utilized.

theme_gtsummary_journal(journal = "jama")
theme_gtsummary_compact()
trial %>%
  select(trt, age, grade) %>%
  tbl_summary(by = trt) %>%
  add_p()

JAMA + Compact + Language Theme

All {gtsummary} tables can be translated into another language using theme_gtsummary_language()!

set_gtsummary_theme(theme_gtsummary_journal(journal = "jama"))
set_gtsummary_theme(theme_gtsummary_compact())
set_gtsummary_theme(theme_gtsummary_language("es"))
trial %>%
  select(trt, age, grade) %>%
  tbl_summary(by = trt) %>%
  add_p()

Clear all previously set themes using reset_gtsummary_theme().

reset_gtsummary_theme()

Writing Themes

Theme Structure

There are many parts of a {gtsummary} table that may be controlled with theme elements. To construct a personalized theme, create a named list of at least one theme element. Here's an example of a theme that modifies the function that styles p-values and updates the default statistics reported in tbl_summary().

my_theme <-
  list(
    # round large p-values to two places
    "pkgwide-fn:pvalue_fun" = function(x) style_pvalue(x, digits = 2),
    "pkgwide-fn:prependpvalue_fun" = function(x) style_pvalue(x, digits = 2, prepend_p = TRUE),
    # report median (IQR) and n (percent) as default stats in `tbl_summary()`
    "tbl_summary-str:continuous_stat" = "{median} ({p25} - {p75})",
    "tbl_summary-str:categorical_stat" = "{n} ({p})"
  )

Once you create the theme, first check the structure using check_gtsummary_theme(). Then apply or set the theme with set_gtsummary_theme().

set_gtsummary_theme(my_theme)

Theme Elements

Each theme element follows a naming structure: "<function name>-<input type>:<description>". The function name is the function the change applies to, the input type specifies class or type of the theme element, and the description is brief text characterizing the theme element.

Theme elements fall into two categories. The first is modifying internal behavior of the functions that is not directly controllable by function arguments.

gtsummary:::df_theme_elements %>%
  dplyr::filter(argument == FALSE) %>%
  dplyr::select(-argument) %>%
  dplyr::mutate(
    name = ifelse(!is.na(name), glue::glue("`{name}`"), NA_character_),
    example = ifelse(!is.na(example), glue::glue("`{example}`"), NA_character_)
  ) %>%
  dplyr::group_by(fn) %>%
  gt::gt() %>%
  gt::cols_align(columns = everything(), align = "left") %>%
  gt::cols_label(
    name = "Theme Element", desc = "Description",
    example = "Example"
  ) %>%
  gt::fmt_markdown(columns = c(name, desc, example)) %>%
  gt::sub_missing(columns = everything(), missing_text = "") %>%
  gt::tab_options(
    table.font.size = "small",
    data_row.padding = gt::px(1),
    row_group.padding = gt::px(1)
  )

The second type of theme elements set function argument defaults. The values of these theme elements must align with the functions' accepted input for the argument.

gtsummary:::df_theme_elements %>%
  filter(argument == TRUE) %>%
  select(fn, name) %>%
  group_by(fn) %>%
  mutate(arg_list = paste0("`", name, "`", collapse = ", ")) %>%
  select(fn, arg_list) %>%
  distinct() %>%
  gt() %>%
  cols_label(arg_list = "Theme Element") %>%
  fmt_markdown(columns = c(arg_list)) %>%
  tab_options(
    table.font.size = "small",
    data_row.padding = gt::px(1),
    row_group.padding = gt::px(1)
  )


Try the gtsummary package in your browser

Any scripts or data that you put into this service are public.

gtsummary documentation built on July 26, 2023, 5:27 p.m.