Skip to content

Commit

Permalink
remove unnecessary as.character invocation
Browse files Browse the repository at this point in the history
  • Loading branch information
kevinushey committed Sep 30, 2024
1 parent 16c05d5 commit 1ebdc59
Showing 1 changed file with 4 additions and 4 deletions.
8 changes: 4 additions & 4 deletions R/call.R
Original file line number Diff line number Diff line change
Expand Up @@ -66,10 +66,10 @@ renv_call_matches <- function(call, names, nargs = NULL) {

ok <- FALSE

if (is.call(call) &&
is.symbol(sym <- call[[1L]]) &&
any(names == as.character(sym)))
ok <- is.null(nargs) || length(call) == nargs + 1L
if (is.call(call))
if (is.symbol(sym <- call[[1L]]))
if (any(names == sym))
ok <- is.null(nargs) || length(call) == nargs + 1L

ok

Expand Down

0 comments on commit 1ebdc59

Please sign in to comment.