You signed in with another tab or window. Reload to refresh your session.You signed out in another tab or window. Reload to refresh your session.You switched accounts on another tab or window. Reload to refresh your session.Dismiss alert
Hey! Hope you are having a good day. I'm having trouble with removing the warning message:
The workflow being saved contains a recipe, which is 9.66 Mb in
memory. If this was not intentional, please set the control
setting save_workflow = FALSE.
Even though I do have save_workflow = FALSE in my control.
Reproducible example
library(reprex)
library(dplyr)
#> #> Attaching package: 'dplyr'#> The following objects are masked from 'package:stats':#> #> filter, lag#> The following objects are masked from 'package:base':#> #> intersect, setdiff, setequal, union
library(readr)
library(parsnip)
library(recipes)
#> #> Attaching package: 'recipes'#> The following object is masked from 'package:stats':#> #> step
library(rsample)
library(tune)
library(workflowsets)
library(finetune)
set.seed(1)
jj<- read_csv("https://raw.githubusercontent.com/rfordatascience/tidytuesday/master/data/2023/2023-05-09/childcare_costs.csv") |>
na.omit()
#> Rows: 34567 Columns: 61#> ── Column specification ────────────────────────────────────────────────────────#> Delimiter: ","#> dbl (61): county_fips_code, study_year, unr_16, funr_16, munr_16, unr_20to64...#> #> ℹ Use `spec()` to retrieve the full column specification for this data.#> ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.data_split<-jj|>
initial_split()
train<- training(data_split)
folds<- vfold_cv(train, v=3)
xgb_rec<-
recipe(mcsa~., data=train)
xgb_spec<-
boost_tree(
tree_depth= tune()
) |>
set_engine("xgboost") |>
set_mode("regression")
set<-
workflow_set(
preproc=list(rec=xgb_rec),
models=list(boosting=xgb_spec)
)
sim_ctrl<-
control_sim_anneal(
save_workflow=FALSE
)
sim_results<-set|>
workflow_map(
fn="tune_sim_anneal",
resamples=folds,
iter=2,
control=sim_ctrl,
initial=1
)
#> ℹ The workflow being saved contains a recipe, which is 9.66 Mb in ℹ memory. If#> this was not intentional, please set the control setting ℹ `save_workflow =#> FALSE`.#> Optimizing rmse#> Initial best: 7.30250#> ℹ The workflow being saved contains a recipe, which is 9.66 Mb in ℹ memory. If#> this was not intentional, please set the control setting ℹ `save_workflow =#> FALSE`.#> 1 ◯ accept suboptimal rmse=7.3391 (+/-0.2557)#> ℹ The workflow being saved contains a recipe, which is 9.66 Mb in ℹ memory. If#> this was not intentional, please set the control setting ℹ `save_workflow =#> FALSE`.#> 2 ◯ accept suboptimal rmse=7.392 (+/-0.2306)
The problem
Hey! Hope you are having a good day. I'm having trouble with removing the warning message:
The workflow being saved contains a recipe, which is 9.66 Mb in
memory. If this was not intentional, please set the control
setting
save_workflow = FALSE
.Even though I do have save_workflow = FALSE in my control.
Reproducible example
Created on 2025-03-10 with reprex v2.1.1
Session info
The text was updated successfully, but these errors were encountered: