Skip to content

Commit ff785ea

Browse files
rename for consistency
1 parent 8b9a4a0 commit ff785ea

File tree

1 file changed

+2
-2
lines changed

1 file changed

+2
-2
lines changed

R/rules-line-breaks.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -236,13 +236,13 @@ remove_line_break_before_round_closing_after_curly <- function(pd) {
236236

237237
remove_line_breaks_in_fun_dec <- function(pd) {
238238
if (is_function_declaration(pd)) {
239-
is_double_indention <- is_single_indent_function_declaration(pd)
239+
is_single_indention <- is_single_indent_function_declaration(pd)
240240
round_after <- (
241241
pd$token == "')'" | pd$token_before == "'('"
242242
) &
243243
pd$token_before != "COMMENT"
244244
pd$lag_newlines[pd$lag_newlines > 1L] <- 1L
245-
if (is_double_indention) {
245+
if (is_single_indention) {
246246
pd$lag_newlines[lag(pd$token == "'('")] <- 1L
247247
pd$lag_newlines[round_after] <- 1L
248248
} else {

0 commit comments

Comments
 (0)