Skip to content

Commit 0d845ef

Browse files
actualy restore old behavior for strict = FALSE and non-comment
1 parent d3e2a0a commit 0d845ef

File tree

1 file changed

+1
-1
lines changed

1 file changed

+1
-1
lines changed

R/rules-line-breaks.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -159,7 +159,7 @@ style_line_break_around_curly <- function(strict, pd) {
159159
pd$lag_newlines[to_break] <- ifelse(
160160
pd$token[to_break] == "COMMENT",
161161
pmin(1L, pd$lag_newlines[to_break]),
162-
1L
162+
if (strict) 1L else pmax(1L, pd$lag_newlines[to_break])
163163
)
164164
} else {
165165
is_else <- pd$token == "ELSE"

0 commit comments

Comments
 (0)