Skip to content

Commit

Permalink
remove non-existing token
Browse files Browse the repository at this point in the history
  • Loading branch information
IndrajeetPatil committed May 11, 2024
1 parent d1fb41e commit a7056be
Showing 1 changed file with 1 addition and 1 deletion.
2 changes: 1 addition & 1 deletion R/rules-line-breaks.R
Original file line number Diff line number Diff line change
Expand Up @@ -432,7 +432,7 @@ remove_empty_lines_after_opening_braces <- function(pd) {
}

remove_empty_lines_before_closing_braces <- function(pd) {
closing_braces <- c("')'", "']'", "RBB")
closing_braces <- c("')'", "']'")
paren_before <- pd$token %in% closing_braces
if (!any(paren_before)) {
return(pd)
Expand Down

0 comments on commit a7056be

Please # to comment.