Skip to content

Commit

Permalink
Fix check errors
Browse files Browse the repository at this point in the history
  • Loading branch information
thomasp85 committed Nov 2, 2023
1 parent 1777a8d commit cfe1ce7
Show file tree
Hide file tree
Showing 4 changed files with 7 additions and 3 deletions.
4 changes: 2 additions & 2 deletions R/label-date.R
Original file line number Diff line number Diff line change
Expand Up @@ -8,7 +8,7 @@
#' "firsts" (e.g. first day of month, first day of day) specially;
#' `date_short()` formats changes (e.g. new month, new year) specially.
#' `label_timespan()` is intended to show time passed and adds common time units
#' suffix to the input (ns, µs, ms, s, m, h, d, w).
#' suffix to the input (ns, `r "\u03BC"`s, ms, s, m, h, d, w).
#'
#' @inherit label_number return
#' @param format For `date_format()` and `time_format()` a date/time format
Expand Down Expand Up @@ -131,7 +131,7 @@ label_timespan <- function(unit = c("secs", "mins", "hours", "days", "weeks"),
scale_cut = c(
0,
"ns" = 1e-9,
"µs" = 1e-6,
"\u03BCs" = 1e-6,
"ms" = 1e-3,
"s" = 1,
"m" = 60,
Expand Down
1 change: 1 addition & 0 deletions R/trans-date.R
Original file line number Diff line number Diff line change
Expand Up @@ -66,6 +66,7 @@ time_trans <- function(tz = NULL) {
#' the range of the data. `hms_trans()` provides the same but using standard hms
#' idioms and formatting.
#'
#' @inheritParams label_timespan
#' @export
#' @examples
#' # timespan_trans allows you to specify the time unit numeric data is
Expand Down
2 changes: 1 addition & 1 deletion man/label_date.Rd

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

3 changes: 3 additions & 0 deletions man/timespan_trans.Rd

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

0 comments on commit cfe1ce7

Please sign in to comment.