Skip to content

Commit 0d1f175

Browse files
committed
use call argument
1 parent a912ffb commit 0d1f175

File tree

1 file changed

+3
-2
lines changed

1 file changed

+3
-2
lines changed

R/aaa_models.R

Lines changed: 3 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -325,11 +325,12 @@ check_arg_val <- function(arg) {
325325
invisible(NULL)
326326
}
327327

328-
check_submodels_val <- function(has_submodel, call) {
328+
check_submodels_val <- function(has_submodel, call = caller_env()) {
329329
if (!is.logical(has_submodel) || length(has_submodel) != 1) {
330330
cli::cli_abort(
331331
"The {.arg submodels} argument should be a single logical. \\
332-
not {.obj_type_friendly {has_submodel}}"
332+
not {.obj_type_friendly {has_submodel}}",
333+
call = call
333334
)
334335
}
335336
invisible(NULL)

0 commit comments

Comments
 (0)