Skip to content

Commit

Permalink
Fix mistake in docs for cols_nanoplot()
Browse files Browse the repository at this point in the history
  • Loading branch information
rich-iannone committed Jan 9, 2024
1 parent c95e557 commit f4c3df6
Show file tree
Hide file tree
Showing 2 changed files with 14 additions and 12 deletions.
13 changes: 7 additions & 6 deletions R/modify_columns.R
Original file line number Diff line number Diff line change
Expand Up @@ -2673,12 +2673,13 @@ cols_add <- function(
#'
#' Box plots can be generated, and we just need to use `plot_type = "boxplot"`
#' to make that type of nanoplot. Using a small portion of the [`pizzaplace`]
#' dataset, we will create a simple table that displays a box plot of pizza for
#' a selection of days. By converting the string-time 24-hour-clock time values
#' to the number of seconds elapsed in a day, we get continuous values that can
#' be incorporated into each box plot. And, by supplying a function to the
#' `y_val_fmt_fn` argument within `nanoplot_options()`, we can transform the
#' integer seconds values back to clock times for display on hover.
#' dataset, we will create a simple table that displays a box plot of pizza
#' sales for a selection of days. By converting the string-time 24-hour-clock
#' time values to the number of seconds elapsed in a day, we get continuous
#' values that can be incorporated into each box plot. And, by supplying a
#' function to the `y_val_fmt_fn` argument within `nanoplot_options()`, we can
#' transform the integer seconds values back to clock times for display on
#' hover.
#'
#' ```r
#' pizzaplace |>
Expand Down
13 changes: 7 additions & 6 deletions man/cols_nanoplot.Rd

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

0 comments on commit f4c3df6

Please sign in to comment.