Skip to content

Commit a188159

Browse files
authored
use type checkers in update() methods (#1178)
1 parent d32fc65 commit a188159

File tree

2 files changed

+12
-3
lines changed

2 files changed

+12
-3
lines changed

R/update.R

Lines changed: 3 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -58,8 +58,9 @@ NULL
5858
#' @export
5959
#' @keywords internal
6060
#' @rdname add_on_exports
61-
update_spec <- function(object, parameters, args_enquo_list, fresh, cls, ...) {
62-
61+
update_spec <- function(object, parameters, args_enquo_list, fresh, cls, ...,
62+
call = caller_env()) {
63+
check_bool(fresh, call = call)
6364
eng_args <- update_engine_parameters(object$eng_args, fresh, ...)
6465

6566
if (!is.null(parameters)) {

man/add_on_exports.Rd

Lines changed: 9 additions & 1 deletion
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

0 commit comments

Comments
 (0)