Skip to content

Commit

Permalink
fix typos; spelling and missing bracket (#460)
Browse files Browse the repository at this point in the history
  • Loading branch information
kellijohnson-NOAA authored Oct 22, 2024
1 parent 8ca05e0 commit ee07c4f
Show file tree
Hide file tree
Showing 14 changed files with 16 additions and 16 deletions.
2 changes: 1 addition & 1 deletion R/label-date.R
Original file line number Diff line number Diff line change
Expand Up @@ -163,7 +163,7 @@ format_dt <- function(x, format, tz = "UTC", locale = NULL) {
#' `r lifecycle::badge("superseded")`
#'
#' These functions are kept for backward compatibility; you should switch
#' to [label_date()/[label_time()] for new code.
#' to [label_date()]/[label_time()] for new code.
#'
#' @keywords internal
#' @export
Expand Down
4 changes: 2 additions & 2 deletions R/label-number.R
Original file line number Diff line number Diff line change
@@ -1,6 +1,6 @@
#' Label numbers in decimal format (e.g. 0.12, 1,234)
#'
#' Use `label_number()` force decimal display of numbers (i.e. don't use
#' Use `label_number()` to force decimal display of numbers (i.e. don't use
#' [scientific][label_scientific] notation). `label_comma()` is a special case
#' that inserts a comma every three digits.
#'
Expand Down Expand Up @@ -46,7 +46,7 @@
#' [number options][number_options].
#' @param style_negative A string that determines the style of negative numbers:
#'
#' * `"hyphen"` (the default): preceded by a standard hypen `-`, e.g. `-1`.
#' * `"hyphen"` (the default): preceded by a standard hyphen `-`, e.g. `-1`.
#' * `"minus"`, uses a proper Unicode minus symbol. This is a typographical
#' nicety that ensures `-` aligns with the horizontal bar of the
#' the horizontal bar of `+`.
Expand Down
2 changes: 1 addition & 1 deletion R/pal-dichromat.R
Original file line number Diff line number Diff line change
Expand Up @@ -8,7 +8,7 @@
#' show_col(pal_dichromat("BluetoOrange.10")(10))
#' show_col(pal_dichromat("BluetoOrange.10")(5))
#'
#' # Can use with gradient_n to create a continous gradient
#' # Can use with gradient_n to create a continuous gradient
#' cols <- pal_dichromat("DarkRedtoBlue.12")(12)
#' show_col(pal_gradient_n(cols)(seq(0, 1, length.out = 30)))
#' }
Expand Down
2 changes: 1 addition & 1 deletion man/comma.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/date_format.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/label_bytes.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/label_currency.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/label_date.Rd

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

4 changes: 2 additions & 2 deletions man/label_number.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/label_number_si.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/label_ordinal.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/label_percent.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/number.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/pal_dichromat.Rd

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

0 comments on commit ee07c4f

Please sign in to comment.