Skip to content

Commit

Permalink
Fix stale message
Browse files Browse the repository at this point in the history
  • Loading branch information
MichaelChirico authored Feb 3, 2025
1 parent b28fd64 commit 392d2bf
Showing 1 changed file with 1 addition and 1 deletion.
2 changes: 1 addition & 1 deletion R/assignment_linter.R
Original file line number Diff line number Diff line change
Expand Up @@ -161,7 +161,7 @@ assignment_linter <- function(operator = c("<-", "<<-"),
op_lint_message_fmt[op_text %in% c("<<-", "->>")] <-
"Replace %s by assigning to a specific environment (with assign() or <-) to avoid hard-to-predict behavior."
op_lint_message_fmt[op_text == "%<>%"] <-
"Avoid the assignment pipe %s; prefer using <- and %%>%% separately."
"Avoid the assignment pipe %s; prefer pipes and assignment in separate steps."

op_lint_message <- sprintf(op_lint_message_fmt, op_text)
lints <- xml_nodes_to_lints(op_expr, source_expression, op_lint_message, type = "style")
Expand Down

0 comments on commit 392d2bf

Please sign in to comment.