Skip to content

Commit

Permalink
actually use s3 predict...
Browse files Browse the repository at this point in the history
  • Loading branch information
EmilHvitfeldt committed Jul 8, 2024
1 parent d225cb0 commit 12c064a
Show file tree
Hide file tree
Showing 3 changed files with 5 additions and 5 deletions.
2 changes: 1 addition & 1 deletion NAMESPACE
Original file line number Diff line number Diff line change
Expand Up @@ -16,12 +16,12 @@ S3method(orbital,step_scale)
S3method(orbital,step_select)
S3method(orbital,step_zv)
S3method(orbital,workflow)
S3method(predict,orbital_class)
S3method(print,orbital_class)
export(orbital)
export(orbital_dt)
export(orbital_inline)
export(orbital_json_read)
export(orbital_json_write)
export(orbital_sql)
export(predict)
export(to_r_fun)
2 changes: 1 addition & 1 deletion R/predict.R
Original file line number Diff line number Diff line change
Expand Up @@ -24,7 +24,7 @@
#'
#' predict(orbital_obj, mtcars)
#' @export
predict <- function(object, new_data, ...) {
predict.orbital_class <- function(object, new_data, ...) {
rlang::check_dots_empty()
res <- dplyr::mutate(new_data, !!!orbital_inline(object))

Expand Down
6 changes: 3 additions & 3 deletions man/predict.Rd → man/predict.orbital_class.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

0 comments on commit 12c064a

Please sign in to comment.