Skip to content

Commit 6e8b482

Browse files
spelling and documenting
1 parent 44b50c4 commit 6e8b482

File tree

2 files changed

+4
-4
lines changed

2 files changed

+4
-4
lines changed

R/rules-line_break.R

Lines changed: 3 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -52,7 +52,7 @@ add_line_break_after_pipe <- function(pd) {
5252

5353
#' Set line break for multi-line function calls
5454
#' @param pd A parse table.
55-
#' @param except A character vector with tokens before "'('" that do not
55+
#' @param except_token A character vector with tokens before "'('" that do not
5656
#' @name set_line_break_if_call_is_multi_line
5757
#' @importFrom rlang seq2
5858
NULL
@@ -66,8 +66,8 @@ set_line_break_after_opening_if_call_is_multi_line <-
6666
npd <- nrow(pd)
6767
is_multi_line <- any(pd$lag_newlines[seq2(3, npd - 1)] > 0)
6868
if (!is_multi_line) return(pd)
69-
exeption_pos <- which(pd$token %in% except_token)
70-
pd$lag_newlines[setdiff(3, exeption_pos)] <- 1L
69+
exception_pos <- which(pd$token %in% except_token)
70+
pd$lag_newlines[setdiff(3, exception_pos)] <- 1L
7171
pd
7272
}
7373

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