Hi, thanks for letting me know about the reprex package, that sounds amazingly useful for community posts like this. I've run it and the output is below.
library(tune)
library(dials)
#> Loading required package: scales
library(parsnip)
library(rsample)
#> Loading required package: tidyr
library(recipes)
#> Loading required package: 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
#>
#> Attaching package: 'recipes'
#> The following object is masked from 'package:stats':
#>
#> step
library(yardstick)
#> For binary classification, the first factor level is assumed to be the event.
#> Set the global option `yardstick.event_first` to `FALSE` to change this.
library(textrecipes)
library(janitor)
#>
#> Attaching package: 'janitor'
#> The following objects are masked from 'package:stats':
#>
#> chisq.test, fisher.test
library(tidyverse)
## Read file
car_prices_tbl <- read_csv("C:/Workspace/cars/data.csv") %>%
clean_names() %>%
select(msrp, everything())
#> Parsed with column specification:
#> cols(
#> Make = col_character(),
#> Model = col_character(),
#> Year = col_double(),
#> `Engine Fuel Type` = col_character(),
#> `Engine HP` = col_double(),
#> `Engine Cylinders` = col_double(),
#> `Transmission Type` = col_character(),
#> Driven_Wheels = col_character(),
#> `Number of Doors` = col_double(),
#> `Market Category` = col_character(),
#> `Vehicle Size` = col_character(),
#> `Vehicle Style` = col_character(),
#> `highway MPG` = col_double(),
#> `city mpg` = col_double(),
#> Popularity = col_double(),
#> MSRP = col_double()
#> )
## Split data
set.seed(123)
car_initial_split <- initial_split(car_prices_tbl, prop = 0.80)
car_initial_split
#> <9532/2382/11914>
## Preprocessing Step
preprocessing_recipe <- recipe(msrp ~ ., data = training(car_initial_split)) %>%
# Encode Categorical Data Types
step_string2factor(all_nominal()) %>%
step_mutate(
engine_cylinders = as.factor(engine_cylinders),
number_of_doors = as.factor(number_of_doors)
) %>%
# Feature Engineering - Market Category
step_mutate(market_category = market_category %>% str_replace_all("_", "")) %>%
step_tokenize(market_category) %>%
step_tokenfilter(market_category, min_times = 0.05, max_times = 1, percentage = TRUE) %>%
step_tf(market_category, weight_scheme = "binary") %>%
# Combine low-frequency categories
step_other(all_nominal(), threshold = 0.02, other = "other") %>%
# Impute missing
step_knnimpute(engine_fuel_type, engine_hp, engine_cylinders, number_of_doors,
neighbors = 5) %>%
# Remove unnecessary columns
step_rm(model) %>%
prep()
#> Warning in tokenfilter_fun(training[, col_names[i], drop = TRUE], x$max_times, :
#> max_features was set to '100', but only 7 was available and selected.
car_training_preprocessed_tbl <- preprocessing_recipe %>% bake(training(car_initial_split))
## Cross Validation
set.seed(123)
car_cv_folds <- training(car_initial_split) %>%
bake(preprocessing_recipe, new_data = .) %>%
vfold_cv(v = 5)
## GLM model
glmnet_model <- linear_reg(
mode = "regression",
penalty = tune(),
mixture = tune()
) %>%
set_engine("glmnet")
## Params Set
glmnet_params <- parameters(penalty(), mixture())
glmnet_params
#> Collection of 2 parameters for tuning
#>
#> id parameter type object class
#> penalty penalty nparam[+]
#> mixture mixture nparam[+]
set.seed(123)
glmnet_grid <- grid_max_entropy(glmnet_params, size = 20)
glmnet_grid
#> # A tibble: 20 x 2
#> penalty mixture
#> <dbl> <dbl>
#> 1 2.94e- 1 0.702
#> 2 1.48e- 4 0.996
#> 3 1.60e- 1 0.444
#> 4 5.86e- 1 0.975
#> 5 1.69e- 9 0.0491
#> 6 1.10e- 5 0.699
#> 7 2.76e- 2 0.988
#> 8 4.95e- 8 0.753
#> 9 1.07e- 5 0.382
#> 10 7.87e- 8 0.331
#> 11 4.07e- 1 0.180
#> 12 1.70e- 3 0.590
#> 13 2.52e-10 0.382
#> 14 2.47e-10 0.666
#> 15 2.31e- 9 0.921
#> 16 1.31e- 7 0.546
#> 17 1.49e- 6 0.973
#> 18 1.28e- 3 0.0224
#> 19 7.49e- 7 0.0747
#> 20 2.37e- 3 0.351
## Tune Model
glmnet_stage_1_cv_results_tbl <- tune_grid(
formula = msrp ~ .,
model = glmnet_model,
resamples = car_cv_folds,
grid = glmnet_grid,
metrics = metric_set(mae, mape, rmse, rsq),
control = control_grid(verbose = TRUE)
)
#> i Fold1: formula
#> v Fold1: formula
#> i Fold1: model 1/20
#> v Fold1: model 1/20
#> i Fold1: model 1/20
#> x Fold1: model 1/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold1: model 2/20
#> v Fold1: model 2/20
#> i Fold1: model 2/20
#> x Fold1: model 2/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold1: model 3/20
#> v Fold1: model 3/20
#> i Fold1: model 3/20
#> x Fold1: model 3/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold1: model 4/20
#> v Fold1: model 4/20
#> i Fold1: model 4/20
#> x Fold1: model 4/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold1: model 5/20
#> v Fold1: model 5/20
#> i Fold1: model 5/20
#> x Fold1: model 5/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold1: model 6/20
#> v Fold1: model 6/20
#> i Fold1: model 6/20
#> x Fold1: model 6/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold1: model 7/20
#> v Fold1: model 7/20
#> i Fold1: model 7/20
#> x Fold1: model 7/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold1: model 8/20
#> v Fold1: model 8/20
#> i Fold1: model 8/20
#> x Fold1: model 8/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold1: model 9/20
#> v Fold1: model 9/20
#> i Fold1: model 9/20
#> x Fold1: model 9/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold1: model 10/20
#> v Fold1: model 10/20
#> i Fold1: model 10/20
#> x Fold1: model 10/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold1: model 11/20
#> v Fold1: model 11/20
#> i Fold1: model 11/20
#> x Fold1: model 11/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold1: model 12/20
#> v Fold1: model 12/20
#> i Fold1: model 12/20
#> x Fold1: model 12/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold1: model 13/20
#> v Fold1: model 13/20
#> i Fold1: model 13/20
#> x Fold1: model 13/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold1: model 14/20
#> v Fold1: model 14/20
#> i Fold1: model 14/20
#> x Fold1: model 14/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold1: model 15/20
#> v Fold1: model 15/20
#> i Fold1: model 15/20
#> x Fold1: model 15/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold1: model 16/20
#> v Fold1: model 16/20
#> i Fold1: model 16/20
#> x Fold1: model 16/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold1: model 17/20
#> v Fold1: model 17/20
#> i Fold1: model 17/20
#> x Fold1: model 17/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold1: model 18/20
#> v Fold1: model 18/20
#> i Fold1: model 18/20
#> x Fold1: model 18/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold1: model 19/20
#> v Fold1: model 19/20
#> i Fold1: model 19/20
#> x Fold1: model 19/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold1: model 20/20
#> v Fold1: model 20/20
#> i Fold1: model 20/20
#> x Fold1: model 20/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold2: formula
#> v Fold2: formula
#> i Fold2: model 1/20
#> v Fold2: model 1/20
#> i Fold2: model 1/20
#> x Fold2: model 1/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold2: model 2/20
#> v Fold2: model 2/20
#> i Fold2: model 2/20
#> x Fold2: model 2/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold2: model 3/20
#> v Fold2: model 3/20
#> i Fold2: model 3/20
#> x Fold2: model 3/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold2: model 4/20
#> v Fold2: model 4/20
#> i Fold2: model 4/20
#> x Fold2: model 4/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold2: model 5/20
#> v Fold2: model 5/20
#> i Fold2: model 5/20
#> x Fold2: model 5/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold2: model 6/20
#> v Fold2: model 6/20
#> i Fold2: model 6/20
#> x Fold2: model 6/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold2: model 7/20
#> v Fold2: model 7/20
#> i Fold2: model 7/20
#> x Fold2: model 7/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold2: model 8/20
#> v Fold2: model 8/20
#> i Fold2: model 8/20
#> x Fold2: model 8/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold2: model 9/20
#> v Fold2: model 9/20
#> i Fold2: model 9/20
#> x Fold2: model 9/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold2: model 10/20
#> v Fold2: model 10/20
#> i Fold2: model 10/20
#> x Fold2: model 10/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold2: model 11/20
#> v Fold2: model 11/20
#> i Fold2: model 11/20
#> x Fold2: model 11/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold2: model 12/20
#> v Fold2: model 12/20
#> i Fold2: model 12/20
#> x Fold2: model 12/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold2: model 13/20
#> v Fold2: model 13/20
#> i Fold2: model 13/20
#> x Fold2: model 13/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold2: model 14/20
#> v Fold2: model 14/20
#> i Fold2: model 14/20
#> x Fold2: model 14/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold2: model 15/20
#> v Fold2: model 15/20
#> i Fold2: model 15/20
#> x Fold2: model 15/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold2: model 16/20
#> v Fold2: model 16/20
#> i Fold2: model 16/20
#> x Fold2: model 16/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold2: model 17/20
#> v Fold2: model 17/20
#> i Fold2: model 17/20
#> x Fold2: model 17/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold2: model 18/20
#> v Fold2: model 18/20
#> i Fold2: model 18/20
#> x Fold2: model 18/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold2: model 19/20
#> v Fold2: model 19/20
#> i Fold2: model 19/20
#> x Fold2: model 19/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold2: model 20/20
#> v Fold2: model 20/20
#> i Fold2: model 20/20
#> x Fold2: model 20/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold3: formula
#> v Fold3: formula
#> i Fold3: model 1/20
#> v Fold3: model 1/20
#> i Fold3: model 1/20
#> x Fold3: model 1/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold3: model 2/20
#> v Fold3: model 2/20
#> i Fold3: model 2/20
#> x Fold3: model 2/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold3: model 3/20
#> v Fold3: model 3/20
#> i Fold3: model 3/20
#> x Fold3: model 3/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold3: model 4/20
#> v Fold3: model 4/20
#> i Fold3: model 4/20
#> x Fold3: model 4/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold3: model 5/20
#> v Fold3: model 5/20
#> i Fold3: model 5/20
#> x Fold3: model 5/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold3: model 6/20
#> v Fold3: model 6/20
#> i Fold3: model 6/20
#> x Fold3: model 6/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold3: model 7/20
#> v Fold3: model 7/20
#> i Fold3: model 7/20
#> x Fold3: model 7/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold3: model 8/20
#> v Fold3: model 8/20
#> i Fold3: model 8/20
#> x Fold3: model 8/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold3: model 9/20
#> v Fold3: model 9/20
#> i Fold3: model 9/20
#> x Fold3: model 9/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold3: model 10/20
#> v Fold3: model 10/20
#> i Fold3: model 10/20
#> x Fold3: model 10/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold3: model 11/20
#> v Fold3: model 11/20
#> i Fold3: model 11/20
#> x Fold3: model 11/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold3: model 12/20
#> v Fold3: model 12/20
#> i Fold3: model 12/20
#> x Fold3: model 12/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold3: model 13/20
#> v Fold3: model 13/20
#> i Fold3: model 13/20
#> x Fold3: model 13/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold3: model 14/20
#> v Fold3: model 14/20
#> i Fold3: model 14/20
#> x Fold3: model 14/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold3: model 15/20
#> v Fold3: model 15/20
#> i Fold3: model 15/20
#> x Fold3: model 15/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold3: model 16/20
#> v Fold3: model 16/20
#> i Fold3: model 16/20
#> x Fold3: model 16/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold3: model 17/20
#> v Fold3: model 17/20
#> i Fold3: model 17/20
#> x Fold3: model 17/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold3: model 18/20
#> v Fold3: model 18/20
#> i Fold3: model 18/20
#> x Fold3: model 18/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold3: model 19/20
#> v Fold3: model 19/20
#> i Fold3: model 19/20
#> x Fold3: model 19/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold3: model 20/20
#> v Fold3: model 20/20
#> i Fold3: model 20/20
#> x Fold3: model 20/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold4: formula
#> v Fold4: formula
#> i Fold4: model 1/20
#> v Fold4: model 1/20
#> i Fold4: model 1/20
#> x Fold4: model 1/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold4: model 2/20
#> v Fold4: model 2/20
#> i Fold4: model 2/20
#> x Fold4: model 2/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold4: model 3/20
#> v Fold4: model 3/20
#> i Fold4: model 3/20
#> x Fold4: model 3/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold4: model 4/20
#> v Fold4: model 4/20
#> i Fold4: model 4/20
#> x Fold4: model 4/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold4: model 5/20
#> v Fold4: model 5/20
#> i Fold4: model 5/20
#> x Fold4: model 5/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold4: model 6/20
#> v Fold4: model 6/20
#> i Fold4: model 6/20
#> x Fold4: model 6/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold4: model 7/20
#> v Fold4: model 7/20
#> i Fold4: model 7/20
#> x Fold4: model 7/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold4: model 8/20
#> v Fold4: model 8/20
#> i Fold4: model 8/20
#> x Fold4: model 8/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold4: model 9/20
#> v Fold4: model 9/20
#> i Fold4: model 9/20
#> x Fold4: model 9/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold4: model 10/20
#> v Fold4: model 10/20
#> i Fold4: model 10/20
#> x Fold4: model 10/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold4: model 11/20
#> v Fold4: model 11/20
#> i Fold4: model 11/20
#> x Fold4: model 11/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold4: model 12/20
#> v Fold4: model 12/20
#> i Fold4: model 12/20
#> x Fold4: model 12/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold4: model 13/20
#> v Fold4: model 13/20
#> i Fold4: model 13/20
#> x Fold4: model 13/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold4: model 14/20
#> v Fold4: model 14/20
#> i Fold4: model 14/20
#> x Fold4: model 14/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold4: model 15/20
#> v Fold4: model 15/20
#> i Fold4: model 15/20
#> x Fold4: model 15/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold4: model 16/20
#> v Fold4: model 16/20
#> i Fold4: model 16/20
#> x Fold4: model 16/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold4: model 17/20
#> v Fold4: model 17/20
#> i Fold4: model 17/20
#> x Fold4: model 17/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold4: model 18/20
#> v Fold4: model 18/20
#> i Fold4: model 18/20
#> x Fold4: model 18/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold4: model 19/20
#> v Fold4: model 19/20
#> i Fold4: model 19/20
#> x Fold4: model 19/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold4: model 20/20
#> v Fold4: model 20/20
#> i Fold4: model 20/20
#> x Fold4: model 20/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold5: formula
#> v Fold5: formula
#> i Fold5: model 1/20
#> v Fold5: model 1/20
#> i Fold5: model 1/20
#> x Fold5: model 1/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold5: model 2/20
#> v Fold5: model 2/20
#> i Fold5: model 2/20
#> x Fold5: model 2/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold5: model 3/20
#> v Fold5: model 3/20
#> i Fold5: model 3/20
#> x Fold5: model 3/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold5: model 4/20
#> v Fold5: model 4/20
#> i Fold5: model 4/20
#> x Fold5: model 4/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold5: model 5/20
#> v Fold5: model 5/20
#> i Fold5: model 5/20
#> x Fold5: model 5/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold5: model 6/20
#> v Fold5: model 6/20
#> i Fold5: model 6/20
#> x Fold5: model 6/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold5: model 7/20
#> v Fold5: model 7/20
#> i Fold5: model 7/20
#> x Fold5: model 7/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold5: model 8/20
#> v Fold5: model 8/20
#> i Fold5: model 8/20
#> x Fold5: model 8/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold5: model 9/20
#> v Fold5: model 9/20
#> i Fold5: model 9/20
#> x Fold5: model 9/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold5: model 10/20
#> v Fold5: model 10/20
#> i Fold5: model 10/20
#> x Fold5: model 10/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold5: model 11/20
#> v Fold5: model 11/20
#> i Fold5: model 11/20
#> x Fold5: model 11/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold5: model 12/20
#> v Fold5: model 12/20
#> i Fold5: model 12/20
#> x Fold5: model 12/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold5: model 13/20
#> v Fold5: model 13/20
#> i Fold5: model 13/20
#> x Fold5: model 13/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold5: model 14/20
#> v Fold5: model 14/20
#> i Fold5: model 14/20
#> x Fold5: model 14/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold5: model 15/20
#> v Fold5: model 15/20
#> i Fold5: model 15/20
#> x Fold5: model 15/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold5: model 16/20
#> v Fold5: model 16/20
#> i Fold5: model 16/20
#> x Fold5: model 16/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold5: model 17/20
#> v Fold5: model 17/20
#> i Fold5: model 17/20
#> x Fold5: model 17/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold5: model 18/20
#> v Fold5: model 18/20
#> i Fold5: model 18/20
#> x Fold5: model 18/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold5: model 19/20
#> v Fold5: model 19/20
#> i Fold5: model 19/20
#> x Fold5: model 19/20: Error: Result 1 must be a single string, not NULL of length 0
#> i Fold5: model 20/20
#> v Fold5: model 20/20
#> i Fold5: model 20/20
#> x Fold5: model 20/20: Error: Result 1 must be a single string, not NULL of length 0
#> Warning: All models failed in tune_grid(). See the `.notes` column.
glmnet_stage_1_cv_results_tbl
#> # 5-fold cross-validation
#> # A tibble: 5 x 4
#> splits id .metrics .notes
#> * <list> <chr> <list> <list>
#> 1 <split [7.6K/1.9K]> Fold1 <NULL> <tibble [20 x 1]>
#> 2 <split [7.6K/1.9K]> Fold2 <NULL> <tibble [20 x 1]>
#> 3 <split [7.6K/1.9K]> Fold3 <NULL> <tibble [20 x 1]>
#> 4 <split [7.6K/1.9K]> Fold4 <NULL> <tibble [20 x 1]>
#> 5 <split [7.6K/1.9K]> Fold5 <NULL> <tibble [20 x 1]>
Created on 2020-02-25 by the reprex package (v0.3.0)
They look identical except for the error during the tune_grid
step