Skip to content

Commit 9b44807

Browse files
adding () to function names
1 parent 758776b commit 9b44807

File tree

1 file changed

+1
-1
lines changed

1 file changed

+1
-1
lines changed

R/predict.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -226,5 +226,5 @@ multi_predict.default <- function(object, ...)
226226

227227
#' @export
228228
predict.model_spec <- function(object, ...) {
229-
stop("You must use `fit` on your model specification before you can use `predict`.", call. = FALSE)
229+
stop("You must use `fit()` on your model specification before you can use `predict()`.", call. = FALSE)
230230
}

0 commit comments

Comments
 (0)