Skip to content

Commit cdbe1bf

Browse files
typos found by @rilling.
1 parent 824e2a8 commit cdbe1bf

File tree

7 files changed

+11
-15
lines changed

7 files changed

+11
-15
lines changed

R/initialize.R

Lines changed: 0 additions & 4 deletions
Original file line numberDiff line numberDiff line change
@@ -84,10 +84,6 @@ initialize_indent <- function(pd_flat) {
8484
pd_flat
8585
}
8686

87-
88-
89-
90-
9187
#' @importFrom rlang abort
9288
#' @describeIn initialize_attributes validates the parse data.
9389
#' @keywords internal

R/nest.R

Lines changed: 3 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -47,7 +47,7 @@ add_cache_block <- function(pd_nested) {
4747
#' Drop all children of a top level expression that are cached
4848
#'
4949
#' Note that we do cache top-level comments. Because package code has a lot of
50-
#' roxygen comments and each of them is a top level expresion, so checking is
50+
#' roxygen comments and each of them is a top level expresion, checking is
5151
#' very expensive.
5252
#' @param pd A top-level nest.
5353
#' @details
@@ -62,8 +62,8 @@ add_cache_block <- function(pd_nested) {
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
65-
#' located, be shallow, i.e. it does not have to contain a children, because it
66-
#' will neighter be transformerd nor serialized anytime. This function drop all
65+
#' located, be shallow, i.e. it does not have to contain a child, because it
66+
#' will neither be transformed nor serialized anytime. This function drop all
6767
#' associated tokens except the top-level token for such expressions, which will
6868
#' result in large speed improvements in [compute_parse_data_nested()] because
6969
#' nesting is expensive and will not be done for cached expressions.

R/transform-block.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -36,7 +36,7 @@ parse_transform_serialize_r_block <- function(pd_nested,
3636
#' Every expression is an expression itself, Expressions on same line are in
3737
#' same block.
3838
#' Multiple expressions can sit on one row, e.g. in line comment and commands
39-
#' seperated with ";". This creates a problem when processing each expression
39+
#' separated with ";". This creates a problem when processing each expression
4040
#' separately because when putting them together, we need complicated handling
4141
#' of line breaks between them, as it is not apriory clear that there is a line
4242
#' break separating them. To avoid this, we put top level expressions that sit
@@ -90,7 +90,7 @@ find_blank_lines_to_next_expr <- function(pd_nested) {
9090
#' @param pd A top level nest.
9191
find_blank_lines_to_next_block <- function(pd) {
9292
block_boundary <- pd$block != lag(pd$block, default = 0)
93-
# TODO everywhere: block is not ambiguous. use cache block since we also have
93+
# TODO everywhere: block is ambiguous. use cache block since we also have
9494
# block_id and other things in other places
9595
find_blank_lines_to_next_expr(pd)[block_boundary]
9696
}

R/utils-cache.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -15,7 +15,7 @@ hash_standardize <- function(text) {
1515

1616
#' Check if text is cached
1717
#'
18-
#' This boilds down to check if the hash exists at the caching dir as a file.
18+
#' This boils down to check if the hash exists at the caching dir as a file.
1919
#' @param text,transformers Passed to [cache_make_key()] to generate a key.
2020
#' @param cache_dir The caching directory relative to the `.Rcache` root to
2121
#' look for a cached value.

man/cache_find_block.Rd

Lines changed: 1 addition & 1 deletion
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/drop_cached_children.Rd

Lines changed: 3 additions & 3 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/is_cached.Rd

Lines changed: 1 addition & 1 deletion
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

0 commit comments

Comments
 (0)