Skip to content

Commit

Permalink
Apply suggestions from code review
Browse files Browse the repository at this point in the history
Co-authored-by: Simon P. Couch <[email protected]>
  • Loading branch information
topepo and simonpcouch authored Oct 21, 2024
1 parent 692ffae commit cb3fc21
Showing 1 changed file with 1 addition and 3 deletions.
4 changes: 1 addition & 3 deletions R/checks.R
Original file line number Diff line number Diff line change
Expand Up @@ -13,9 +13,7 @@ check_single_logical <- function(x, call = rlang::caller_env()) {
invisible(x)
}

check_number_whole_vec <- function(x, call = rlang::caller_env(), ...) {
cl <- match.call()
arg <- as.character(cl$x)
check_number_whole_vec <- function(x, call = rlang::caller_env(), arg = rlang::caller_arg(x), ...) {

for (i in x) {
check_number_whole(i, arg = arg, call = call, ...)
Expand Down

0 comments on commit cb3fc21

Please sign in to comment.