Skip to content

Commit

Permalink
rename for consistency
Browse files Browse the repository at this point in the history
  • Loading branch information
lorenzwalthert committed Nov 24, 2024
1 parent 8b9a4a0 commit ff785ea
Showing 1 changed file with 2 additions and 2 deletions.
4 changes: 2 additions & 2 deletions R/rules-line-breaks.R
Original file line number Diff line number Diff line change
Expand Up @@ -236,13 +236,13 @@ remove_line_break_before_round_closing_after_curly <- function(pd) {

remove_line_breaks_in_fun_dec <- function(pd) {
if (is_function_declaration(pd)) {
is_double_indention <- is_single_indent_function_declaration(pd)
is_single_indention <- is_single_indent_function_declaration(pd)
round_after <- (
pd$token == "')'" | pd$token_before == "'('"
) &
pd$token_before != "COMMENT"
pd$lag_newlines[pd$lag_newlines > 1L] <- 1L
if (is_double_indention) {
if (is_single_indention) {
pd$lag_newlines[lag(pd$token == "'('")] <- 1L
pd$lag_newlines[round_after] <- 1L
} else {
Expand Down

0 comments on commit ff785ea

Please sign in to comment.