Skip to content

Commit 08af852

Browse files
document
1 parent 872ae2e commit 08af852

File tree

5 files changed

+11
-10
lines changed

5 files changed

+11
-10
lines changed

R/indent.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -163,7 +163,7 @@ compute_indent_indices <- function(pd,
163163
#'
164164
#' Checks for each potential trigger token in `pd` whether it actually should
165165
#' cause indention.
166-
#' @param potential_triggers A vector with indices of the potential trigger
166+
#' @param potential_triggers_pos A vector with indices of the potential trigger
167167
#' tokens in `pd`.
168168
#' @inheritParams needs_indention_one
169169
needs_indention <- function(pd,
@@ -184,7 +184,7 @@ needs_indention <- function(pd,
184184
#' break that is going to cause indention.
185185
#'
186186
#' @param pd A parse table.
187-
#' @param potential_trigger the index of the token in the parse table
187+
#' @param potential_trigger_pos the index of the token in the parse table
188188
#' for which it should be checked whether it should trigger indention.
189189
#' @return Returns `TRUE` if indention is needed, `FALSE` otherwise.
190190
#' @param other_trigger_tokens Other tokens that are going to cause indention

R/reindent.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -114,7 +114,7 @@ apply_ref_indention_one <- function(flattened_pd, target_token) {
114114
#' already embeded in the column `lag_spaces`, only tokens at the beginning of
115115
#' a line are of concern.
116116
#' @param flattened_pd A flattened parse table.
117-
#' @param token_to_update An integer vector with positions of tokens to update.
117+
#' @inheritParams apply_ref_indention_one
118118
#' @seealso apply_ref_indention_one()
119119
#' @examples
120120
#' style_text("function(a =

man/find_tokens_to_update.Rd

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

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