Skip to content

opt_footnote_marks symbols size is too small #511

@MadhulikaTanuboddi

Description

@MadhulikaTanuboddi

Run the following example that uses opt_footnote_marks() function in different modes. I noticed that when "standard" and "extended" modes are used, the symbols at the footer of the table are very small especially asterik "*" symbol. It would be a nice enhancement if the symbols size can be increased.

# Use `sza` to create a gt table,
# adding three footnotes; call
# `opt_footnote_marks()` to specify
# which footnote marks to use
tab_1 <-
  sza %>%
  dplyr::group_by(latitude, tst) %>%
  dplyr::summarize(
    SZA.Max = max(sza),
    SZA.Min = min(sza, na.rm = TRUE)
  ) %>%
  dplyr::ungroup() %>%
  dplyr::filter(latitude == 30, !is.infinite(SZA.Min)) %>%
  dplyr::select(-latitude) %>%
  gt(rowname_col = "tst") %>%
  tab_spanner_delim(delim = ".") %>%
  fmt_missing(
    columns = everything(),
    missing_text = "90+"
  ) %>%
  tab_stubhead("TST") %>%
  tab_footnote(
    footnote = "True solar time.",
    locations = cells_stubhead()
  ) %>%
  tab_footnote(
    footnote = "Solar zenith angle.",
    locations = cells_column_spanners(spanners = "SZA")
  ) %>%
  tab_footnote(
    footnote = "The Lowest SZA.",
    locations = cells_stub(rows = "1200")
  ) %>%
  tab_footnote(
    footnote = "Five.",
    locations = cells_stub(rows = 5)
  ) %>%
  tab_footnote(
    footnote = "six",
    locations = cells_stub(rows = 6)
  ) %>%
  tab_footnote(
    footnote = "seven",
    locations = cells_stub(rows = 7)
  ) %>%
  tab_footnote(
    footnote = "eight",
    locations = cells_stub(rows = 8)
  )

  tab_1 %>% opt_footnote_marks(marks = "numbers")
  tab_1 %>% opt_footnote_marks(marks = "letters")
  tab_1 %>% opt_footnote_marks(marks = "LETTERS")
  tab_1 %>% opt_footnote_marks(marks = "standard")
  tab_1 %>% opt_footnote_marks(marks = "extended")

chrome_footnotes_marks

Metadata

Metadata

Assignees

Type

No type

Projects

No projects

Milestone

Relationships

None yet

Development

No branches or pull requests

Issue actions