Skip to content

Commit

Permalink
Clarify precedence using parentheses (#2185)
Browse files Browse the repository at this point in the history
  • Loading branch information
IndrajeetPatil authored Sep 18, 2023
1 parent 3912906 commit d4f23e4
Showing 1 changed file with 1 addition and 1 deletion.
2 changes: 1 addition & 1 deletion R/trailing_blank_lines_linter.R
Original file line number Diff line number Diff line change
Expand Up @@ -51,7 +51,7 @@ trailing_blank_lines_linter <- function() {
lints[[length(lints) + 1L]] <- Lint(
filename = source_expression$filename,
line_number = length(source_expression$file_lines),
column_number = nchar(last_line) %||% 0L + 1L,
column_number = (nchar(last_line) %||% 0L) + 1L,
type = "style",
message = "Missing terminal newline.",
line = last_line
Expand Down

0 comments on commit d4f23e4

Please sign in to comment.