Skip to content

Commit

Permalink
Merge pull request #1910 from MichaelChirico/typos
Browse files Browse the repository at this point in the history
Fix typos
  • Loading branch information
rich-iannone authored Oct 24, 2024
2 parents 4bdbd45 + 9a88e8c commit 8d1a021
Show file tree
Hide file tree
Showing 19 changed files with 38 additions and 38 deletions.
2 changes: 1 addition & 1 deletion NEWS.md
Original file line number Diff line number Diff line change
Expand Up @@ -575,7 +575,7 @@

* Added the `opt_horizontal_padding()` and `opt_vertical_padding()` functions to easily expand or contract an HTML table in the horizontal and vertical directions (#868). (#882)

* There is now a `locale` argument in the `gt()` function. If set, formatter functions like `fmt_number()` will automatically use this global locale while formatting. There also remains the the option to override the global locale with any non-`NULL` value set for `locale` within a `fmt_*()` call (#682). (#866)
* There is now a `locale` argument in the `gt()` function. If set, formatter functions like `fmt_number()` will automatically use this global locale while formatting. There also remains the option to override the global locale with any non-`NULL` value set for `locale` within a `fmt_*()` call (#682). (#866)

## Minor improvements and bug fixes

Expand Down
2 changes: 1 addition & 1 deletion R/cols_units.R
Original file line number Diff line number Diff line change
Expand Up @@ -56,7 +56,7 @@
#' column name to the **gt** units syntax; they should be of the form
#' `<column name> = <units text>`. Subsequent expressions that operate on the
#' columns assigned previously will result in overwriting column units
#' defintion values.
#' definition values.
#'
#' @param .list *Alternative to `...`*
#'
Expand Down
2 changes: 1 addition & 1 deletion R/dt_cols_merge.R
Original file line number Diff line number Diff line change
Expand Up @@ -54,7 +54,7 @@ dt_col_merge_entry <- function(vars, rows, type, pattern = NULL, ...) {
)
}

# get colum names where columns were merged.
# get column names where columns were merged.
dt_col_merge_get_vars <- function(data) {
col_merge <- dt_col_merge_get(data)
key_vars <- lapply(col_merge, function(x) x$vars[1])
Expand Down
30 changes: 15 additions & 15 deletions R/format_data.R
Original file line number Diff line number Diff line change
Expand Up @@ -2171,7 +2171,7 @@ fmt_fraction <- function(
# Get the correct minus mark based on the output context
minus_mark <- context_minus_mark(context = context)

# Generate an vector of empty strings that will eventually contain
# Generate a vector of empty strings that will eventually contain
# all of the fractional parts of the finalized numbers
fraction_x <- rep_len("", length(x))

Expand Down Expand Up @@ -3089,7 +3089,7 @@ fmt_roman <- function(
use_latex_math_mode = FALSE,
format_fn = function(x, context) {

# Generate an vector of empty strings that will eventually contain
# Generate a vector of empty strings that will eventually contain
# all of the roman numerals
x_str <- character(length(x))

Expand Down Expand Up @@ -3327,7 +3327,7 @@ fmt_index <- function(
use_latex_math_mode = FALSE,
format_fn = function(x, context) {

# Generate an vector of empty strings that will eventually contain
# Generate a vector of empty strings that will eventually contain
# all of the roman numerals
x_str <- character(length(x))

Expand Down Expand Up @@ -3696,7 +3696,7 @@ fmt_spelled_num <- function(
use_latex_math_mode = FALSE,
format_fn = function(x, context) {

# Generate an vector of empty strings that will eventually contain
# Generate a vector of empty strings that will eventually contain
# all of the roman numerals
x_str <- character(length(x))

Expand Down Expand Up @@ -4932,7 +4932,7 @@ format_bins_by_context <- function(x, sep, fmt, context) {
sep <- context_dash_mark(sep, context = context)
}

# Generate an vector of empty strings that will eventually
# Generate a vector of empty strings that will eventually
# contain all of the ranged value text
x_str <- character(length(x))

Expand Down Expand Up @@ -5552,7 +5552,7 @@ format_tf_by_context <- function(
context
) {

# Generate an vector of empty strings that will eventually
# Generate a vector of empty strings that will eventually
# contain all of the text values
x_str <- character(length(x))

Expand Down Expand Up @@ -6049,7 +6049,7 @@ format_units_by_context <- function(
context = "html"
) {

# Generate an vector of empty strings that will eventually
# Generate a vector of empty strings that will eventually
# contain all of the ranged value text
x_str <- character(length(x))

Expand Down Expand Up @@ -6587,7 +6587,7 @@ fmt_url <- function(
fns = list(
html = function(x) {

# Generate an vector of empty strings that will eventually
# Generate a vector of empty strings that will eventually
# contain all of the link text
x_str <- character(length(x))

Expand Down Expand Up @@ -7269,7 +7269,7 @@ fmt_email <- function(
fns = list(
html = function(x) {

# Generate an vector of empty strings that will eventually
# Generate a vector of empty strings that will eventually
# contain all of the link text
x_str <- character(length(x))

Expand Down Expand Up @@ -7704,7 +7704,7 @@ fmt_image <- function(
fns = list(
html = function(x) {

# Generate an vector of empty strings that will eventually
# Generate a vector of empty strings that will eventually
# contain all of the link text
x_str <- character(length(x))

Expand Down Expand Up @@ -7963,7 +7963,7 @@ convert_to_px <- function(x) {
rlang::abort(
paste0(
"invalid units provided - `", units,
"`. Must be one of of type ",
"`. Must be one of type ",
paste0("`", names(px_conversion), "`", collapse = "")
)
)
Expand Down Expand Up @@ -8312,7 +8312,7 @@ fmt_flag <- function(
fns = list(
html = function(x) {

# Generate an vector of empty strings that will eventually
# Generate a vector of empty strings that will eventually
# contain all of the link text
x_str <- character(length(x))

Expand Down Expand Up @@ -8796,7 +8796,7 @@ fmt_country <- function(
use_latex_math_mode = FALSE,
format_fn = function(x, context) {

# Generate an vector of empty strings that will eventually
# Generate a vector of empty strings that will eventually
# contain all of the link text
x_str <- character(length(x))

Expand Down Expand Up @@ -9330,7 +9330,7 @@ fmt_icon <- function(
fns = list(
html = function(x) {

# Generate an vector of empty strings that will eventually
# Generate a vector of empty strings that will eventually
# contain all of the link text
x_str <- character(length(x))

Expand Down Expand Up @@ -9768,7 +9768,7 @@ fmt_markdown <- function(
#'
#' Let's use the [`exibble`] dataset to create a single-column **gt** table
#' (with only the `char` column). Now we can pass the data in that column
#' through the 'non-formatter' that is `fmt_passthrough()`. While the the
#' through the 'non-formatter' that is `fmt_passthrough()`. While the
#' function doesn't do any explicit formatting it has a feature common to all
#' other formatting functions: the `pattern` argument. So that's what we'll use
#' in this example, applying a simple pattern to the non-`NA` values that adds
Expand Down
4 changes: 2 additions & 2 deletions R/format_vec.R
Original file line number Diff line number Diff line change
Expand Up @@ -2906,7 +2906,7 @@ vec_fmt_time <- function(
#'
#' We can choose from any of 41 different date styles and 25 time formatting
#' styles. Many of these styles are flexible, meaning that the structure of the
#' format will adapt to different locales. Let's use a combination of the the
#' format will adapt to different locales. Let's use a combination of the
#' `"yMMMd"` and `"hms"` date and time styles to demonstrate this (first in the
#' default locale of `"en"`):
#'
Expand Down Expand Up @@ -3219,7 +3219,7 @@ vec_fmt_duration <- function(
# Stop function if class of `x` is incompatible with the formatting
check_vector_valid(x, valid_classes = c("numeric", "integer", "difftime"))

# Ensure that `duration_style` and `ouput` are matched correctly to one option
# Ensure that `duration_style` and `output` are matched correctly to one option
duration_style <-
rlang::arg_match0(
duration_style,
Expand Down
4 changes: 2 additions & 2 deletions R/helpers.R
Original file line number Diff line number Diff line change
Expand Up @@ -1756,7 +1756,7 @@ cells_body <- function(
#' @section Examples:
#'
#' Use a portion of the [`countrypops`] dataset to create a **gt** table. Add
#' some styling to the summary data cells with with [tab_style()], using
#' some styling to the summary data cells with [tab_style()], using
#' `cells_summary()` in the `locations` argument.
#'
#' ```r
Expand Down Expand Up @@ -2600,7 +2600,7 @@ cell_style_to_html.cell_text <- function(style) {
#' Let's use the [`exibble`] dataset to create a simple, two-column **gt** table
#' (keeping only the `num` and `currency` columns). Styles are added with
#' [tab_style()] in two separate calls (targeting different body cells with the
#' [cells_body()] helper function). With the `cell_fill()` helper funciton we
#' [cells_body()] helper function). With the `cell_fill()` helper function we
#' define cells with a `"lightblue"` background in one instance, and `"gray85"`
#' in the other.
#'
Expand Down
2 changes: 1 addition & 1 deletion R/render_as_i_html.R
Original file line number Diff line number Diff line change
Expand Up @@ -451,7 +451,7 @@ render_as_ihtml <- function(data, id) {
collapse = ""
)

# TODO if `sub_missing()` is enabled gloablly, just use `na = ` here!
# TODO if `sub_missing()` is enabled globally, just use `na = ` here!
default_col_def <-
reactable::colDef(
style = reactable::JS(body_style_js_str),
Expand Down
2 changes: 1 addition & 1 deletion R/tab_create_modify.R
Original file line number Diff line number Diff line change
Expand Up @@ -376,7 +376,7 @@ tab_header <- function(
#'
#' - `"m/s"` and `"m / s"` both render as `"m/s"`
#' - `"m s^-1"` will appear with the `"-1"` exponent intact
#' - `"m /s"` gives the the same result, as `"/<unit>"` is equivalent to
#' - `"m /s"` gives the same result, as `"/<unit>"` is equivalent to
#' `"<unit>^-1"`
#' - `"E_h"` will render an `"E"` with the `"h"` subscript
#' - `"t_i^2.5"` provides a `t` with an `"i"` subscript and a `"2.5"` exponent
Expand Down
4 changes: 2 additions & 2 deletions R/tab_options.R
Original file line number Diff line number Diff line change
Expand Up @@ -175,7 +175,7 @@
#' *Properties of all vertical lines by the column labels*
#'
#' The style, width, and color properties for all vertical lines ('vlines')
#' of the the `column_labels`.
#' of the `column_labels`.
#'
#' @param column_labels.border.top.style,column_labels.border.top.width,column_labels.border.top.color
#' *Properties of the border above the column labels*
Expand Down Expand Up @@ -457,7 +457,7 @@
#'
#' @param page.orientation *Set RTF page orientation*
#'
#' For RTF output, this provides an two options for page
#' For RTF output, this provides two options for page
#' orientation: `"portrait"` (the default) and `"landscape"`.
#'
#' @param page.numbering *Enable RTF page numbering*
Expand Down
2 changes: 1 addition & 1 deletion R/topics.R
Original file line number Diff line number Diff line change
Expand Up @@ -230,7 +230,7 @@ NULL
#'
#' Will only affect the output of one specific function (or override global setting).
#'
#' `locale` has very low precedence usually. As soon as you override some parameteres,
#' `locale` has very low precedence usually. As soon as you override some parameters,
#' `sep_mark`, `dec_mark`, `incl_space`, they will be override `locale`.
#'
#' @examples
Expand Down
2 changes: 1 addition & 1 deletion man/cell_fill.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/cells_summary.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_units.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/fmt_passthrough.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/grp_options.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/locale.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/tab_options.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/tab_spanner.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/vec_fmt_datetime.Rd

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

12 comments on commit 8d1a021

@github-actions
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

@github-actions
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

@github-actions
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

@github-actions
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

@github-actions
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

@github-actions
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

@github-actions
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

@github-actions
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

@github-actions
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

@github-actions
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

@github-actions
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

@github-actions
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

Please sign in to comment.