Skip to content

Commit

Permalink
fix lints
Browse files Browse the repository at this point in the history
  • Loading branch information
olivroy committed Nov 26, 2024
1 parent aff95ba commit c71758f
Show file tree
Hide file tree
Showing 3 changed files with 6 additions and 5 deletions.
4 changes: 2 additions & 2 deletions R/col_vals_between.R
Original file line number Diff line number Diff line change
Expand Up @@ -428,8 +428,8 @@ col_vals_between <- function(

agent <- x

# Avoid rlang warning
# Quosure lists can't be concatenated with objects other than quosures as of rlang 0.3.0.
# Avoid rlang (>= 0.3.0) soft deprecation warning
# Quosure lists can't be concatenated with objects other than quosures.
left <- as.list(left)
right <- as.list(right)

Expand Down
4 changes: 2 additions & 2 deletions R/col_vals_not_between.R
Original file line number Diff line number Diff line change
Expand Up @@ -431,8 +431,8 @@ col_vals_not_between <- function(

agent <- x

# Avoid rlang deprecation warning
# Quosure lists can't be concatenated with objects other than quosures as of rlang 0.3.0.
# Avoid rlang (>= 0.3.0)soft deprecation warning
# Quosure lists can't be concatenated with objects other than quosures

left <- as.list(left)
right <- as.list(right)
Expand Down
3 changes: 2 additions & 1 deletion R/utils.R
Original file line number Diff line number Diff line change
Expand Up @@ -1685,7 +1685,8 @@ deparse_expr <- function(expr, collapse = " ", ...) {
if (rlang::is_scalar_atomic(expr)) {
as.character(expr)
} else if (rlang::is_quosure(expr)) {
deparsed <- paste(deparse(rlang::quo_get_expr(expr), ...), collapse = collapse)
expr <- rlang::quo_get_expr(expr)
deparsed <- paste(deparse(expr, ...), collapse = collapse)
paste("<expr>", deparsed)
} else {
deparsed <- paste(deparse(expr, ...), collapse = collapse)
Expand Down

0 comments on commit c71758f

Please sign in to comment.