Skip to content

Commit c4b7b89

Browse files
narrow line
1 parent c2db3de commit c4b7b89

File tree

1 file changed

+2
-1
lines changed

1 file changed

+2
-1
lines changed

R/rules-line-breaks.R

+2-1
Original file line numberDiff line numberDiff line change
@@ -311,7 +311,8 @@ set_line_break_after_opening_if_call_is_multi_line <- function(pd,
311311
return(pd)
312312
}
313313
idx <- length(pd$child[[1L]]$text)
314-
has_force_text_before <- pd$child[[1L]]$text[idx] %in% force_text_before && pd$child[[1L]]$token[idx] == "SYMBOL_FUNCTION_CALL"
314+
has_force_text_before <-
315+
pd$child[[1L]]$text[idx] %in% force_text_before && pd$child[[1L]]$token[idx] == "SYMBOL_FUNCTION_CALL"
315316
if (has_force_text_before) {
316317
break_pos <- c(
317318
which(lag(pd$token %in% c("','", "COMMENT"))),

0 commit comments

Comments
 (0)