Skip to content

Commit 49afe67

Browse files
spelling
1 parent 3bd53b0 commit 49afe67

File tree

6 files changed

+6
-4
lines changed

6 files changed

+6
-4
lines changed

R/parse.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -9,7 +9,7 @@
99
#' * A column "pos_id" for (positional id) which can be used for sorting
1010
#' (because "id" cannot be used in general). Note that the nth value of this
1111
#' column corresponds to n as long as no tokens are inserted.
12-
#' * A column "child" that contains the nested subtibbles.
12+
#' * A column "child" that contains the nested sub-tibbles.
1313
#'
1414
#' @param text A character vector.
1515
#' @return A flat parse table

R/reindent.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -116,7 +116,7 @@ apply_ref_indention_one <- function(flattened_pd, target_token) {
116116
#'
117117
#' Given a target token and a flattened parse table, the token for which the
118118
#' spacing information needs to be updated are computed. Since indention is
119-
#' already embeded in the column `lag_spaces`, only tokens at the beginning of
119+
#' already embedded in the column `lag_spaces`, only tokens at the beginning of
120120
#' a line are of concern.
121121
#' @param flattened_pd A flattened parse table.
122122
#' @inheritParams apply_ref_indention_one

R/relevel.R

Lines changed: 1 addition & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -186,6 +186,7 @@ find_block_id <- function(pd) {
186186
#' assignment expression. Note that one assignment can include multiple
187187
#' assignment operators such as "a = b = c".
188188
#' @param pd A parse table with one assignment expression to relocate.
189+
#' @keywords internal
189190
relocate_eq_assign_one <- function(pd) {
190191
idx_eq_assign <- which(pd$token == "EQ_ASSIGN")
191192
eq_ind <- seq2(idx_eq_assign[1] - 1L, last(idx_eq_assign) + 1L)

man/find_tokens_to_update.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/relocate_eq_assign_one.Rd

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

man/tokenize.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)