Skip to content

Commit 007ac24

Browse files
committed
Merged upstream/master into selection
2 parents 5eaac48 + 8d1a021 commit 007ac24

19 files changed

+38
-38
lines changed

NEWS.md

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -579,7 +579,7 @@
579579

580580
* 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)
581581

582-
* 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)
582+
* 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)
583583

584584
## Minor improvements and bug fixes
585585

R/cols_units.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -56,7 +56,7 @@
5656
#' column name to the **gt** units syntax; they should be of the form
5757
#' `<column name> = <units text>`. Subsequent expressions that operate on the
5858
#' columns assigned previously will result in overwriting column units
59-
#' defintion values.
59+
#' definition values.
6060
#'
6161
#' @param .list *Alternative to `...`*
6262
#'

R/dt_cols_merge.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -54,7 +54,7 @@ dt_col_merge_entry <- function(vars, rows, type, pattern = NULL, ...) {
5454
)
5555
}
5656

57-
# get colum names where columns were merged.
57+
# get column names where columns were merged.
5858
dt_col_merge_get_vars <- function(data) {
5959
col_merge <- dt_col_merge_get(data)
6060
key_vars <- lapply(col_merge, function(x) x$vars[1])

R/format_data.R

Lines changed: 15 additions & 15 deletions
Original file line numberDiff line numberDiff line change
@@ -2171,7 +2171,7 @@ fmt_fraction <- function(
21712171
# Get the correct minus mark based on the output context
21722172
minus_mark <- context_minus_mark(context = context)
21732173

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

@@ -3089,7 +3089,7 @@ fmt_roman <- function(
30893089
use_latex_math_mode = FALSE,
30903090
format_fn = function(x, context) {
30913091

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

@@ -3327,7 +3327,7 @@ fmt_index <- function(
33273327
use_latex_math_mode = FALSE,
33283328
format_fn = function(x, context) {
33293329

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

@@ -3696,7 +3696,7 @@ fmt_spelled_num <- function(
36963696
use_latex_math_mode = FALSE,
36973697
format_fn = function(x, context) {
36983698

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

@@ -4932,7 +4932,7 @@ format_bins_by_context <- function(x, sep, fmt, context) {
49324932
sep <- context_dash_mark(sep, context = context)
49334933
}
49344934

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

@@ -5552,7 +5552,7 @@ format_tf_by_context <- function(
55525552
context
55535553
) {
55545554

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

@@ -6049,7 +6049,7 @@ format_units_by_context <- function(
60496049
context = "html"
60506050
) {
60516051

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

@@ -6587,7 +6587,7 @@ fmt_url <- function(
65876587
fns = list(
65886588
html = function(x) {
65896589

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

@@ -7269,7 +7269,7 @@ fmt_email <- function(
72697269
fns = list(
72707270
html = function(x) {
72717271

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

@@ -7704,7 +7704,7 @@ fmt_image <- function(
77047704
fns = list(
77057705
html = function(x) {
77067706

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

@@ -7963,7 +7963,7 @@ convert_to_px <- function(x) {
79637963
rlang::abort(
79647964
paste0(
79657965
"invalid units provided - `", units,
7966-
"`. Must be one of of type ",
7966+
"`. Must be one of type ",
79677967
paste0("`", names(px_conversion), "`", collapse = "")
79687968
)
79697969
)
@@ -8312,7 +8312,7 @@ fmt_flag <- function(
83128312
fns = list(
83138313
html = function(x) {
83148314

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

@@ -8796,7 +8796,7 @@ fmt_country <- function(
87968796
use_latex_math_mode = FALSE,
87978797
format_fn = function(x, context) {
87988798

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

@@ -9330,7 +9330,7 @@ fmt_icon <- function(
93309330
fns = list(
93319331
html = function(x) {
93329332

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

@@ -9768,7 +9768,7 @@ fmt_markdown <- function(
97689768
#'
97699769
#' Let's use the [`exibble`] dataset to create a single-column **gt** table
97709770
#' (with only the `char` column). Now we can pass the data in that column
9771-
#' through the 'non-formatter' that is `fmt_passthrough()`. While the the
9771+
#' through the 'non-formatter' that is `fmt_passthrough()`. While the
97729772
#' function doesn't do any explicit formatting it has a feature common to all
97739773
#' other formatting functions: the `pattern` argument. So that's what we'll use
97749774
#' in this example, applying a simple pattern to the non-`NA` values that adds

R/format_vec.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -2906,7 +2906,7 @@ vec_fmt_time <- function(
29062906
#'
29072907
#' We can choose from any of 41 different date styles and 25 time formatting
29082908
#' styles. Many of these styles are flexible, meaning that the structure of the
2909-
#' format will adapt to different locales. Let's use a combination of the the
2909+
#' format will adapt to different locales. Let's use a combination of the
29102910
#' `"yMMMd"` and `"hms"` date and time styles to demonstrate this (first in the
29112911
#' default locale of `"en"`):
29122912
#'
@@ -3219,7 +3219,7 @@ vec_fmt_duration <- function(
32193219
# Stop function if class of `x` is incompatible with the formatting
32203220
check_vector_valid(x, valid_classes = c("numeric", "integer", "difftime"))
32213221

3222-
# Ensure that `duration_style` and `ouput` are matched correctly to one option
3222+
# Ensure that `duration_style` and `output` are matched correctly to one option
32233223
duration_style <-
32243224
rlang::arg_match0(
32253225
duration_style,

R/helpers.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -1756,7 +1756,7 @@ cells_body <- function(
17561756
#' @section Examples:
17571757
#'
17581758
#' Use a portion of the [`countrypops`] dataset to create a **gt** table. Add
1759-
#' some styling to the summary data cells with with [tab_style()], using
1759+
#' some styling to the summary data cells with [tab_style()], using
17601760
#' `cells_summary()` in the `locations` argument.
17611761
#'
17621762
#' ```r
@@ -2600,7 +2600,7 @@ cell_style_to_html.cell_text <- function(style) {
26002600
#' Let's use the [`exibble`] dataset to create a simple, two-column **gt** table
26012601
#' (keeping only the `num` and `currency` columns). Styles are added with
26022602
#' [tab_style()] in two separate calls (targeting different body cells with the
2603-
#' [cells_body()] helper function). With the `cell_fill()` helper funciton we
2603+
#' [cells_body()] helper function). With the `cell_fill()` helper function we
26042604
#' define cells with a `"lightblue"` background in one instance, and `"gray85"`
26052605
#' in the other.
26062606
#'

R/render_as_i_html.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -454,7 +454,7 @@ render_as_ihtml <- function(data, id) {
454454
collapse = ""
455455
)
456456

457-
# TODO if `sub_missing()` is enabled gloablly, just use `na = ` here!
457+
# TODO if `sub_missing()` is enabled globally, just use `na = ` here!
458458
default_col_def <-
459459
reactable::colDef(
460460
style = reactable::JS(body_style_js_str),

R/tab_create_modify.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -376,7 +376,7 @@ tab_header <- function(
376376
#'
377377
#' - `"m/s"` and `"m / s"` both render as `"m/s"`
378378
#' - `"m s^-1"` will appear with the `"-1"` exponent intact
379-
#' - `"m /s"` gives the the same result, as `"/<unit>"` is equivalent to
379+
#' - `"m /s"` gives the same result, as `"/<unit>"` is equivalent to
380380
#' `"<unit>^-1"`
381381
#' - `"E_h"` will render an `"E"` with the `"h"` subscript
382382
#' - `"t_i^2.5"` provides a `t` with an `"i"` subscript and a `"2.5"` exponent

R/tab_options.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -175,7 +175,7 @@
175175
#' *Properties of all vertical lines by the column labels*
176176
#'
177177
#' The style, width, and color properties for all vertical lines ('vlines')
178-
#' of the the `column_labels`.
178+
#' of the `column_labels`.
179179
#'
180180
#' @param column_labels.border.top.style,column_labels.border.top.width,column_labels.border.top.color
181181
#' *Properties of the border above the column labels*
@@ -466,7 +466,7 @@
466466
#'
467467
#' @param page.orientation *Set RTF page orientation*
468468
#'
469-
#' For RTF output, this provides an two options for page
469+
#' For RTF output, this provides two options for page
470470
#' orientation: `"portrait"` (the default) and `"landscape"`.
471471
#'
472472
#' @param page.numbering *Enable RTF page numbering*

R/topics.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -230,7 +230,7 @@ NULL
230230
#'
231231
#' Will only affect the output of one specific function (or override global setting).
232232
#'
233-
#' `locale` has very low precedence usually. As soon as you override some parameteres,
233+
#' `locale` has very low precedence usually. As soon as you override some parameters,
234234
#' `sep_mark`, `dec_mark`, `incl_space`, they will be override `locale`.
235235
#'
236236
#' @examples

0 commit comments

Comments
 (0)