Skip to content

Commit

Permalink
Merge pull request #990 from rstudio/family-names
Browse files Browse the repository at this point in the history
Adjust family names to fit with .Rd templating
  • Loading branch information
rich-iannone authored Jul 22, 2022
2 parents 088b6f4 + 9f5b8c5 commit faf9f40
Show file tree
Hide file tree
Showing 112 changed files with 290 additions and 290 deletions.
2 changes: 1 addition & 1 deletion R/data_color.R
Original file line number Diff line number Diff line change
Expand Up @@ -126,7 +126,7 @@
#' `r man_get_image_tag(file = "man_data_color_2.png")`
#' }}
#'
#' @family Format Data
#' @family data formatting functions
#' @section Function ID:
#' 3-21
#'
Expand Down
12 changes: 6 additions & 6 deletions R/datasets.R
Original file line number Diff line number Diff line change
Expand Up @@ -27,7 +27,7 @@
#' dplyr::glimpse(countrypops)
#' ```
#'
#' @family Datasets
#' @family datasets
#' @section Function ID:
#' 11-1
#'
Expand Down Expand Up @@ -78,7 +78,7 @@
#' dplyr::glimpse(sza)
#' ```
#'
#' @family Datasets
#' @family datasets
#' @section Function ID:
#' 11-2
#'
Expand Down Expand Up @@ -133,7 +133,7 @@
#' dplyr::glimpse(gtcars)
#' ```
#'
#' @family Datasets
#' @family datasets
#' @section Function ID:
#' 11-3
#'
Expand Down Expand Up @@ -163,7 +163,7 @@
#' dplyr::glimpse(sp500)
#' ```
#'
#' @family Datasets
#' @family datasets
#' @section Function ID:
#' 11-4
#'
Expand Down Expand Up @@ -294,7 +294,7 @@
#' dplyr::glimpse(pizzaplace)
#' ```
#'
#' @family Datasets
#' @family datasets
#' @section Function ID:
#' 11-5
#'
Expand Down Expand Up @@ -338,7 +338,7 @@
#' exibble
#' ```
#'
#' @family Datasets
#' @family datasets
#' @section Function ID:
#' 11-6
#'
Expand Down
12 changes: 6 additions & 6 deletions R/export.R
Original file line number Diff line number Diff line change
Expand Up @@ -107,7 +107,7 @@
#' tab_1 %>% gtsave("tab_1.docx")
#' ```
#'
#' @family Export Functions
#' @family table export functions
#' @section Function ID:
#' 13-1
#'
Expand Down Expand Up @@ -378,7 +378,7 @@ gtsave_filename <- function(path, filename) {
#' It has only the `<table>...</table>` part so it's not a complete HTML
#' document but rather an HTML fragment.
#'
#' @family Export Functions
#' @family table export functions
#' @section Function ID:
#' 13-2
#'
Expand Down Expand Up @@ -443,7 +443,7 @@ as_raw_html <- function(
#' Markdown documents that are knit to PDF. We can use `as.character()` to get
#' just the LaTeX code as a single-element vector.
#'
#' @family Export Functions
#' @family table export functions
#' @section Function ID:
#' 13-3
#'
Expand Down Expand Up @@ -527,7 +527,7 @@ as_latex <- function(data) {
#' as_rtf()
#' ```
#'
#' @family Export Functions
#' @family table export functions
#' @section Function ID:
#' 13-4
#'
Expand Down Expand Up @@ -631,7 +631,7 @@ as_rtf <- function(data) {
#' ) %>%
#' as_word()
#'
#' @family Export Functions
#' @family table export functions
#' @section Function ID:
#' 13-5
#'
Expand Down Expand Up @@ -832,7 +832,7 @@ as_word_tbl_body <- function(
#' `r man_get_image_tag(file = "man_extract_summary_1.png")`
#' }}
#'
#' @family Export Functions
#' @family table export functions
#' @section Function ID:
#' 13-6
#'
Expand Down
32 changes: 16 additions & 16 deletions R/format_data.R
Original file line number Diff line number Diff line change
Expand Up @@ -154,7 +154,7 @@
#' `r man_get_image_tag(file = "man_fmt_number_2.png")`
#' }}
#'
#' @family Format Data
#' @family data formatting functions
#' @section Function ID:
#' 3-1
#'
Expand Down Expand Up @@ -349,7 +349,7 @@ fmt_number <- function(
#' `r man_get_image_tag(file = "man_fmt_integer_1.png")`
#' }}
#'
#' @family Format Data
#' @family data formatting functions
#' @section Function ID:
#' 3-2
#'
Expand Down Expand Up @@ -449,7 +449,7 @@ fmt_integer <- function(
#' `r man_get_image_tag(file = "man_fmt_scientific_1.png")`
#' }}
#'
#' @family Format Data
#' @family data formatting functions
#' @section Function ID:
#' 3-3
#'
Expand Down Expand Up @@ -633,7 +633,7 @@ fmt_scientific <- function(
#' `r man_get_image_tag(file = "man_fmt_engineering_1.png")`
#' }}
#'
#' @family Format Data
#' @family data formatting functions
#' @section Function ID:
#' 3-4
#'
Expand Down Expand Up @@ -992,7 +992,7 @@ fmt_symbol <- function(
#' `r man_get_image_tag(file = "man_fmt_percent_1.png")`
#' }}
#'
#' @family Format Data
#' @family data formatting functions
#' @section Function ID:
#' 3-5
#'
Expand Down Expand Up @@ -1150,7 +1150,7 @@ fmt_percent <- function(
#' `r man_get_image_tag(file = "man_fmt_partsper_1.png")`
#' }}
#'
#' @family Format Data
#' @family data formatting functions
#' @section Function ID:
#' 3-6
#'
Expand Down Expand Up @@ -1387,7 +1387,7 @@ fmt_partsper <- function(
#' `r man_get_image_tag(file = "man_fmt_fraction_1.png")`
#' }}
#'
#' @family Format Data
#' @family data formatting functions
#' @section Function ID:
#' 3-7
#'
Expand Down Expand Up @@ -1823,7 +1823,7 @@ round_gt <- function(x, digits = 0) {
#' `r man_get_image_tag(file = "man_fmt_currency_2.png")`
#' }}
#'
#' @family Format Data
#' @family data formatting functions
#' @section Function ID:
#' 3-8
#'
Expand Down Expand Up @@ -1985,7 +1985,7 @@ fmt_currency <- function(
#' `r man_get_image_tag(file = "man_fmt_bytes_2.png")`
#' }}
#'
#' @family Format Data
#' @family data formatting functions
#' @section Function ID:
#' 3-9
#'
Expand Down Expand Up @@ -2182,7 +2182,7 @@ fmt_bytes <- function(
#' `r man_get_image_tag(file = "man_fmt_date_2.png")`
#' }}
#'
#' @family Format Data
#' @family data formatting functions
#' @section Function ID:
#' 3-10
#'
Expand Down Expand Up @@ -2338,7 +2338,7 @@ fmt_date <- function(
#' `r man_get_image_tag(file = "man_fmt_time_2.png")`
#' }}
#'
#' @family Format Data
#' @family data formatting functions
#' @section Function ID:
#' 3-11
#'
Expand Down Expand Up @@ -2559,7 +2559,7 @@ fmt_time <- function(
#' `r man_get_image_tag(file = "man_fmt_datetime_1.png")`
#' }}
#'
#' @family Format Data
#' @family data formatting functions
#' @section Function ID:
#' 3-12
#'
Expand Down Expand Up @@ -2795,7 +2795,7 @@ fmt_datetime <- function(
#' `r man_get_image_tag(file = "man_fmt_duration_1.png")`
#' }}
#'
#' @family Format Data
#' @family data formatting functions
#' @section Function ID:
#' 3-13
#'
Expand Down Expand Up @@ -3513,7 +3513,7 @@ extract_duration_pattern <- function(
#' `r man_get_image_tag(file = "man_fmt_markdown_1.png")`
#' }}
#'
#' @family Format Data
#' @family data formatting functions
#' @section Function ID:
#' 3-14
#'
Expand Down Expand Up @@ -3607,7 +3607,7 @@ fmt_markdown <- function(
#' `r man_get_image_tag(file = "man_fmt_passthrough_1.png")`
#' }}
#'
#' @family Format Data
#' @family data formatting functions
#' @section Function ID:
#' 3-15
#'
Expand Down Expand Up @@ -3763,7 +3763,7 @@ fmt_passthrough <- function(
#' `r man_get_image_tag(file = "man_fmt_1.png")`
#' }}
#'
#' @family Format Data
#' @family data formatting functions
#' @section Function ID:
#' 3-16
#'
Expand Down
2 changes: 1 addition & 1 deletion R/gt.R
Original file line number Diff line number Diff line change
Expand Up @@ -93,7 +93,7 @@
#' `r man_get_image_tag(file = "man_gt_2.png")`
#' }}
#'
#' @family Create Table
#' @family table creation functions
#' @section Function ID:
#' 1-1
#'
Expand Down
2 changes: 1 addition & 1 deletion R/gt_preview.R
Original file line number Diff line number Diff line change
Expand Up @@ -42,7 +42,7 @@
#' `r man_get_image_tag(file = "man_gt_preview_1.png")`
#' }}
#'
#' @family Create Table
#' @family table creation functions
#' @section Function ID:
#' 1-2
#'
Expand Down
Loading

0 comments on commit faf9f40

Please sign in to comment.