Skip to content

Commit 9402414

Browse files
fix roxygen
1 parent 790bbcc commit 9402414

File tree

3 files changed

+22
-25
lines changed

3 files changed

+22
-25
lines changed

R/rules-line-breaks.R

Lines changed: 10 additions & 12 deletions
Original file line numberDiff line numberDiff line change
@@ -268,23 +268,20 @@ set_line_break_after_assignment <- function(pd) {
268268

269269
#' Set line break for multi-line function calls
270270
#' @param pd A parse table.
271-
#' @param except_token_after A character vector with tokens after "'('" that do
272-
#' not cause a line break after "'('".
273-
#' @param except_text_before A character vector with text before "'('" that do
274-
#' not cause a line break after "'('".
275-
#' @param except_token_before A character vector with text before "')'" that do
276-
#' not cause a line break before "')'".
277-
#' @param force_text_before A character vector with text before "'('" that
278-
#' forces a line break after every argument in the call.
271+
#' @param except_token_before A character vector with tokens that do
272+
#' not cause a line break after them.
279273
#' @name set_line_break_if_call_is_multi_line
280274
#'
281275
#' @keywords internal
282276
NULL
283277

284278
#' Sets line break after opening parenthesis
285279
#' @param pd The parse table.
286-
#' @param except_token_after,except_token_before The tokens before or after the
287-
#' token that cause an exception.
280+
#' @param except_token_after The tokens after the token that cause an exception.
281+
#' @param except_text_before A character vector with text before a token that
282+
#' does not cause a line break.
283+
#' @param force_text_before A character vector with text before "'('" that
284+
#' forces a line break after every argument in the call.
288285
#' @details
289286
#' In general, every call that is multi-line has a line break after the opening
290287
#' parenthesis. Exceptions:
@@ -343,7 +340,7 @@ set_line_break_after_opening_if_call_is_multi_line <- function(pd,
343340
#' position of the first named argument and breaks returns the index of it.
344341
#' If there is no named argument, the line is broken right after the opening
345342
#' parenthesis.
346-
#' @inheritParams set_line_break_if_call_is_multi_line
343+
#' @param pd A parse table.
347344
#' @keywords internal
348345
find_line_break_position_in_multiline_call <- function(pd) {
349346
candidate <- (which(pd$token == "EQ_SUB") - 1L)[1L]
@@ -379,7 +376,8 @@ set_line_break_before_closing_call <- function(pd, except_token_before) {
379376
}
380377

381378

382-
#' @rdname set_line_break_if_call_is_multi_line
379+
#' @describeIn set_line_break_if_call_is_multi_line Remove line breaks in
380+
#' function calls.
383381
#' @keywords internal
384382
remove_line_break_in_fun_call <- function(pd, strict) {
385383
if (is_function_call(pd)) {

man/set_line_break_after_opening_if_call_is_multi_line.Rd

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

man/set_line_break_if_call_is_multi_line.Rd

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

0 commit comments

Comments
 (0)