Skip to content

Commit

Permalink
Fix unnecessary concatenation
Browse files Browse the repository at this point in the history
  • Loading branch information
bairdj committed Jul 28, 2023
1 parent 2279132 commit 9b42407
Showing 1 changed file with 2 additions and 2 deletions.
4 changes: 2 additions & 2 deletions R/pipe_consistency_linter.R
Original file line number Diff line number Diff line change
Expand Up @@ -60,14 +60,14 @@ pipe_consistency_linter <- function(pipe = c("auto", "%>%", "|>")) {
)
} else if (pipe == "%>%" && n_native > 0L) {
xml_nodes_to_lints(
xml = c(match_native),
xml = match_native,
source_expression = source_expression,
lint_message = "Use magrittr pipe operator (%>%) instead of native pipe operator (|>).",
type = "style"
)
} else if (pipe == "|>" && n_magrittr > 0L) {
xml_nodes_to_lints(
xml = c(match_magrittr),
xml = match_magrittr,
source_expression = source_expression,
lint_message = "Use native pipe operator (|>) instead of magrittr pipe operator (%>%).",
type = "style"
Expand Down

0 comments on commit 9b42407

Please sign in to comment.