Skip to content

Commit 7caf085

Browse files
committed
missing export
1 parent 5810f30 commit 7caf085

File tree

2 files changed

+2
-0
lines changed

2 files changed

+2
-0
lines changed

NAMESPACE

Lines changed: 1 addition & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -152,6 +152,7 @@ export(predict_numeric.model_fit)
152152
export(predict_quantile.model_fit)
153153
export(predict_raw)
154154
export(predict_raw.model_fit)
155+
export(prepare_data)
155156
export(rand_forest)
156157
export(repair_call)
157158
export(req_pkgs)

R/predict.R

Lines changed: 1 addition & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -231,6 +231,7 @@ make_pred_call <- function(x) {
231231
#' @param new_data A data frame
232232
#' @return A data frame or matrix
233233
#' @keywords internal
234+
#' @export
234235
prepare_data <- function(object, new_data) {
235236
fit_interface <- object$spec$method$fit$interface
236237

0 commit comments

Comments
 (0)