Skip to content

Commit

Permalink
update comment
Browse files Browse the repository at this point in the history
  • Loading branch information
MichaelChirico committed Jul 29, 2023
1 parent 0f38960 commit 034f7f9
Showing 1 changed file with 1 addition and 1 deletion.
2 changes: 1 addition & 1 deletion R/infix_spaces_linter.R
Original file line number Diff line number Diff line change
Expand Up @@ -145,7 +145,7 @@ infix_spaces_linter <- function(exclude_operators = NULL, allow_multiple_spaces
# NB: preceding-sibling::* and not preceding-sibling::expr because
# of the foo(a=1) case, where the tree is <SYMBOL_SUB><EQ_SUB><expr>
# NB: parent::*[count(expr) + count(OP-LEFT-PAREN) > 1] for the unary case, e.g. x[-1]
# OP-LEFT-PAREN for EQ_SUB case with missing argument like alist(a =)
# SYMBOL_SUB for case with missing argument like alist(a =)
# NB: the last not() disables lints inside box::use() declarations
xpath <- paste(collapse = "|", glue::glue("//{infix_tokens}[
parent::*[count(expr | SYMBOL_SUB) > 1]
Expand Down

0 comments on commit 034f7f9

Please sign in to comment.