Skip to content

Commit

Permalink
Run styler (#2543)
Browse files Browse the repository at this point in the history
* Run formatter on source code

* revert two styler changes
  • Loading branch information
IndrajeetPatil authored Apr 2, 2024
1 parent a7d3679 commit 24d8bc3
Show file tree
Hide file tree
Showing 2 changed files with 2 additions and 2 deletions.
2 changes: 1 addition & 1 deletion R/implicit_integer_linter.R
Original file line number Diff line number Diff line change
Expand Up @@ -62,7 +62,7 @@ implicit_integer_linter <- function(allow_colon = FALSE) {
is_negative <- !is.na(xml_find_first(number_expr, "parent::expr/preceding-sibling::OP-MINUS"))

lint_message <-
sprintf("Use %1$dL or %1$d.0 to avoid implicit integers.", ((-1L) ^ is_negative) * as.integer(number))
sprintf("Use %1$dL or %1$d.0 to avoid implicit integers.", ((-1L)^is_negative) * as.integer(number))

xml_nodes_to_lints(
number_expr,
Expand Down
2 changes: 1 addition & 1 deletion R/unnecessary_nesting_linter.R
Original file line number Diff line number Diff line change
Expand Up @@ -197,7 +197,7 @@ unnecessary_nesting_linter <- function(
collapse = " | "
)

unnecessary_else_brace_xpath <- "//IF/parent::expr[parent::expr[preceding-sibling::ELSE and count(expr) = 1]]"
unnecessary_else_brace_xpath <- "//IF/parent::expr[parent::expr[preceding-sibling::ELSE and count(expr) = 1]]"

Linter(linter_level = "expression", function(source_expression) {
xml <- source_expression$xml_parsed_content
Expand Down

0 comments on commit 24d8bc3

Please sign in to comment.