Skip to content

Commit ee07c4f

Browse files
fix typos; spelling and missing bracket (#460)
1 parent 8ca05e0 commit ee07c4f

14 files changed

+16
-16
lines changed

R/label-date.R

+1-1
Original file line numberDiff line numberDiff line change
@@ -163,7 +163,7 @@ format_dt <- function(x, format, tz = "UTC", locale = NULL) {
163163
#' `r lifecycle::badge("superseded")`
164164
#'
165165
#' These functions are kept for backward compatibility; you should switch
166-
#' to [label_date()/[label_time()] for new code.
166+
#' to [label_date()]/[label_time()] for new code.
167167
#'
168168
#' @keywords internal
169169
#' @export

R/label-number.R

+2-2
Original file line numberDiff line numberDiff line change
@@ -1,6 +1,6 @@
11
#' Label numbers in decimal format (e.g. 0.12, 1,234)
22
#'
3-
#' Use `label_number()` force decimal display of numbers (i.e. don't use
3+
#' Use `label_number()` to force decimal display of numbers (i.e. don't use
44
#' [scientific][label_scientific] notation). `label_comma()` is a special case
55
#' that inserts a comma every three digits.
66
#'
@@ -46,7 +46,7 @@
4646
#' [number options][number_options].
4747
#' @param style_negative A string that determines the style of negative numbers:
4848
#'
49-
#' * `"hyphen"` (the default): preceded by a standard hypen `-`, e.g. `-1`.
49+
#' * `"hyphen"` (the default): preceded by a standard hyphen `-`, e.g. `-1`.
5050
#' * `"minus"`, uses a proper Unicode minus symbol. This is a typographical
5151
#' nicety that ensures `-` aligns with the horizontal bar of the
5252
#' the horizontal bar of `+`.

R/pal-dichromat.R

+1-1
Original file line numberDiff line numberDiff line change
@@ -8,7 +8,7 @@
88
#' show_col(pal_dichromat("BluetoOrange.10")(10))
99
#' show_col(pal_dichromat("BluetoOrange.10")(5))
1010
#'
11-
#' # Can use with gradient_n to create a continous gradient
11+
#' # Can use with gradient_n to create a continuous gradient
1212
#' cols <- pal_dichromat("DarkRedtoBlue.12")(12)
1313
#' show_col(pal_gradient_n(cols)(seq(0, 1, length.out = 30)))
1414
#' }

man/comma.Rd

+1-1
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/date_format.Rd

+1-1
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/label_bytes.Rd

+1-1
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/label_currency.Rd

+1-1
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/label_date.Rd

+1-1
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/label_number.Rd

+2-2
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/label_number_si.Rd

+1-1
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/label_ordinal.Rd

+1-1
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/label_percent.Rd

+1-1
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/number.Rd

+1-1
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/pal_dichromat.Rd

+1-1
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

0 commit comments

Comments
 (0)