Skip to content

Commit bcc2218

Browse files
grammar
1 parent 0cf43fc commit bcc2218

File tree

3 files changed

+6
-6
lines changed

3 files changed

+6
-6
lines changed

R/nested.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -101,7 +101,7 @@ add_terminal_token_before <- function(pd_flat) {
101101
#'
102102
#' @param spaces_after_prefix An integer vector with the number of spaces
103103
#' after the prefix.
104-
#' @param text_lenght Integer vector giving the number of characters of
104+
#' @param text_length Integer vector giving the number of characters of
105105
#' the text.
106106
#' @param force_one Whether spaces_after_prefix should be set to one in all
107107
#' cases.

R/visit.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -104,8 +104,8 @@ context_towards_terminals <- function(pd_nested,
104104
#' @param pd_nested A nested parse table.
105105
extract_terminals <- function(pd_nested) {
106106
if (is.null(pd_nested)) return(pd)
107-
pd_splitted <- split(pd_nested, seq_len(nrow(pd_nested)))
108-
bind_rows(ifelse(pd_nested$terminal, pd_splitted, pd_nested$child))
107+
pd_split <- split(pd_nested, seq_len(nrow(pd_nested)))
108+
bind_rows(ifelse(pd_nested$terminal, pd_split, pd_nested$child))
109109
}
110110

111111

man/set_spaces.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.

0 commit comments

Comments
 (0)