Skip to content

Commit

Permalink
use wide line
Browse files Browse the repository at this point in the history
  • Loading branch information
MichaelChirico authored Feb 24, 2024
1 parent 6112af1 commit dc3ab81
Showing 1 changed file with 1 addition and 3 deletions.
4 changes: 1 addition & 3 deletions R/assignment_linter.R
Original file line number Diff line number Diff line change
Expand Up @@ -112,9 +112,7 @@ assignment_linter <- function(allow_cascading_assign = TRUE,

operator <- xml_text(bad_expr)
lint_message_fmt <- rep(
paste0("Use ",
if (allow_equal_assign) "=" else "<-",
", not %s, for assignment."),
paste0("Use ", if (allow_equal_assign) "=" else "<-", ", not %s, for assignment."),
length(operator)
)
lint_message_fmt[operator %in% c("<<-", "->>")] <-
Expand Down

0 comments on commit dc3ab81

Please sign in to comment.