A trained workflow is one that has gone through fit()
,
which preprocesses the underlying data, and fits the parsnip model.
Examples
library(parsnip)
library(recipes)
library(magrittr)
rec <- recipe(mpg ~ cyl, mtcars)
mod <- linear_reg()
mod <- set_engine(mod, "lm")
wf <- workflow() %>%
add_recipe(rec) %>%
add_model(mod)
# Before any preprocessing or model fitting has been done
is_trained_workflow(wf)
#> [1] FALSE
wf <- fit(wf, mtcars)
# After all preprocessing and model fitting
is_trained_workflow(wf)
#> [1] TRUE