Skip to content

Commit

Permalink
Merge branch 'master' into latex-caption
Browse files Browse the repository at this point in the history
  • Loading branch information
nielsbock authored Aug 28, 2024
2 parents 051b475 + d30f199 commit fb7447d
Showing 4 changed files with 4 additions and 4 deletions.
2 changes: 1 addition & 1 deletion R/cols_label.R
Original file line number Diff line number Diff line change
@@ -582,7 +582,7 @@ cols_label <- function(
#' ```r
#' pizzaplace |>
#' dplyr::mutate(month = substr(date, 6, 7)) |>
#' dplyr::count(month, name = "pizza_vendute") |>
#' dplyr::count(month, name = "pizze_vendute") |>
#' dplyr::mutate(frazione_della_quota = pizze_vendute / 4000) |>
#' dplyr::mutate(date = paste0("2015/", month, "/01")) |>
#' dplyr::select(-month) |>
2 changes: 1 addition & 1 deletion R/cols_merge.R
Original file line number Diff line number Diff line change
@@ -777,7 +777,7 @@ cols_merge_range <- function(
#' ```r
#' pizzaplace |>
#' dplyr::count(name, type, price, sort = TRUE) |>
#' mutate(frac = prop.table(n)) |>
#' dplyr::mutate(frac = prop.table(n)) |>
#' dplyr::slice_max(n, n = 3, by = type) |>
#' dplyr::arrange(type) |>
#' gt(
2 changes: 1 addition & 1 deletion man/cols_label_with.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/cols_merge_n_pct.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

0 comments on commit fb7447d

Please sign in to comment.