Skip to content

Commit a958e3e

Browse files
Merge pull request #590 from lorenzwalthert/fix-spelling
- fix spelling (#590).
2 parents a05de07 + a5c67ed commit a958e3e

24 files changed

+28
-28
lines changed

NEWS.md

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

3737
* lines are now broken after `+` in `ggplot2` calls for `strict = TRUE` (#569).
3838

39-
* function documentation now contains many more linebreaks due to roxygen2
39+
* function documentation now contains many more line breaks due to roxygen2
4040
update to version 7.0.1 (#566).
4141

4242
* spaces next to the braces in subsetting expressions `[` and `[[` are now

R/nest.R

Lines changed: 3 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -58,7 +58,7 @@ add_cache_block <- function(pd_nested) {
5858
#'
5959
#' **usual case: All other expressions in a block are cached**
6060
#'
61-
#' Cached expressiond don't need to be transformed with `transformers` in
61+
#' Cached expressions don't need to be transformed with `transformers` in
6262
#' [parse_transform_serialize_r_block()], we simply return `text` for the top
6363
#' level token. For that
6464
#' reason, the nested parse table can, at the rows where these expressions are
@@ -106,7 +106,7 @@ drop_cached_children <- function(pd) {
106106
#' To make a parse table shallow, we must know which ids to keep.
107107
#' `split(cumsum(pd_parent_first$parent < 1))` above puts comments with negative
108108
#' parents in the same block as proceeding expressions. `find_pos_id_to_keep()`
109-
#' must hence alyways keep comments. We did not use
109+
#' must hence always keep comments. We did not use
110110
#' `split(cumsum(pd_parent_first$parent < 1))` because then every comment is an
111111
#' expression on its own and processing takes much longer for typical roxygen
112112
#' annotated code
@@ -140,7 +140,7 @@ find_pos_id_to_keep <- function(pd) {
140140
#' To use something else as start and stop markers, set the R options
141141
#' `styler.ignore_start` and
142142
#' `styler.ignore_stop` using [options()]. If you want these
143-
#' settings to persist over mulitple R sessions, consider setting them in your
143+
#' settings to persist over multiple R sessions, consider setting them in your
144144
#' R profile, e.g. with `usethis::edit_rprofile()`.
145145
#' @name stylerignore
146146
#' @examples

R/relevel.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -182,7 +182,7 @@ relocate_eq_assign_nest <- function(pd) {
182182
#'
183183
#' Two assignment tokens `EQ_ASSIGN` belong to the same block if they are not
184184
#' separated by more than one token. Token between `EQ_ASSIGN` tokens belong
185-
#' to the `EQ_ASSIGN` token occurring before them, except the token right before
185+
#' to the `EQ_ASSIGN` token occuring before them, except the token right before
186186
#' `EQ_ASSING` already belongs to the `EQ_ASSING` after it. Note that this
187187
#' notion is unrelated to the column *block* in the parse table, which is used
188188
#' to [parse_transform_serialize_r()] code blocks and leave out the ones that

R/roxygen-examples-parse.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -1,7 +1,7 @@
11
#' Parse roxygen comments into text
22
#'
33
#' Used to parse roxygen code examples. Removes line break before
4-
#' `\\dontrun{...}` and friends because it does not occurr for segments other
4+
#' `\\dontrun{...}` and friends because it does not occur for segments other
55
#' than `\\dont{...}` and friends.
66
#' @param roxygen Roxygen comments.
77
#' @examples

R/rules-line-break.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -127,7 +127,7 @@ style_line_break_around_curly <- function(strict, pd) {
127127
#' sugar according to the above definition. On the other hand `\{\{ x + y \}\}`
128128
#' is recognized by styler as containing it (and is parsable code)
129129
#' but will most likely give an error at runtime because the way the syntactic
130-
#' suggar is defined in rlang is to use a single token within curly-curly. In
130+
#' sugar is defined in rlang is to use a single token within curly-curly. In
131131
#' addition, because rlang parses `\{\{` in a special way (just as `!!`), the
132132
#' expression `\{\{ x \}\}` will give a runtime error when used outside of a
133133
#' context that is capable of handling it, e.g. on the top level (that is, not

R/testing-mocks.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -7,7 +7,7 @@
77
#' with multiple curly braces in a sequence. It is important to maintain testing
88
#' for indention rules even as the curly-curly expression is always kept on the
99
#' same line in the tidyverse style guide because we should
10-
#' ensure the underlaying mechanics for indention work correctly. When
10+
#' ensure the underlying mechanics for indention work correctly. When
1111
#' indention mechanisms are changed later, e.g. by simplifying
1212
#' [compute_indent_indices()], we must have
1313
#' a way of testing this without the interaction of `\{\{`.

R/testing.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -196,7 +196,7 @@ testthat_file <- function(...) {
196196
file.path(rprojroot::find_testthat_root_file(), ...)
197197
}
198198

199-
#' Convert a serialized R object to a certaion version.
199+
#' Convert a serialized R object to a certain version.
200200
#'
201201
#' Needed to make [testthat::expect_known_value()] work on R < 3.6.
202202
#' @param path A path to an rds file.

R/transform-block.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -38,7 +38,7 @@ parse_transform_serialize_r_block <- function(pd_nested,
3838
#' Multiple expressions can sit on one row, e.g. in line comment and commands
3939
#' separated with ";". This creates a problem when processing each expression
4040
#' separately because when putting them together, we need complicated handling
41-
#' of line breaks between them, as it is not apriory clear that there is a line
41+
#' of line breaks between them, as it is not apriori clear that there is a line
4242
#' break separating them. To avoid this, we put top level expressions that sit
4343
#' on the same line into one block, so the assumption that there is a line break
4444
#' between each block of expressions holds.

R/ui-caching.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -2,7 +2,7 @@
22
#'
33
#' Clears the cache that stores which files are already styled. You won't be
44
#' able to undo this. Note that the file corresponding to the cache (a folder
5-
#' on your file stystem) won't be deleted, but it will be empty after calling
5+
#' on your file system) won't be deleted, but it will be empty after calling
66
#' `cache_clear`.
77
#' @param cache_name The name of the styler cache to use. If
88
#' `NULL`, the option "styler.cache_name" is considered which defaults to

R/utils-cache.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -67,8 +67,8 @@ is_cached <- function(text, transformers, cache_dir = cache_dir_default()) {
6767
#' * Our caching backend package, `R.cache`, uses
6868
#' `R.cache:::getChecksum.default` (which uses `digest::digest()`) to hash the
6969
#' input. The latter does not seem to care if the environments are exactly
70-
#' equal (see 'Exampels').
71-
#' * However, under stome circumstances, it does: Commit 9c94c022 (if not
70+
#' equal (see 'Examples').
71+
#' * However, under some circumstances, it does: Commit 9c94c022 (if not
7272
#' overwritten / rebased by now) contains a reprex. Otherwise, search for
7373
#' 43219ixmypi in commit messages and restore this commit to reproduce the
7474
#' behavior.

0 commit comments

Comments
 (0)