Overview
I have produced a random forest regression model and I would like to fit the model using the function fit_samples(). However, I am experiencing this error message:
Error Message:
! Fold01: model: tune columns were requested but there were 14 predictors in the data. 14 will be u...
x Fold01: internal: Error: Must group by variables found in `.data`.
* Column `mtry` is not found.
! Fold02: model: tune columns were requested but there were 14 predictors in the data. 14 will be u...
x Fold02: internal: Error: Must group by variables found in `.data`.
* Column `mtry` is not found.
! Fold03: model: tune columns were requested but there were 14 predictors in the data. 14 will be u...
x Fold03: internal: Error: Must group by variables found in `.data`.
* Column `mtry` is not found.
I have done an online search for a solution, but there appears to not be a question that aligns with my particular issue. I am not an advanced R user and I am trying my best to slowly manoeuvre myself through this Tidymodels package
If anyone can help with this error message, I would be deeply appreciative.
Many thanks in advance
R-code
#Open libraries
library(tidymodels)
library(ranger)
seed(45L)
#split this single dataset into two: a training set and a testing set
data_split <- initial_split(FID)
#Create data frames for the two sets:
train_data <- training(data_split)
test_data <- testing(data_split)
#resample the data with 10-fold cross-validation (10-fold by default)
cv <- vfold_cv(train_data, v=10)
###########################################################
##Produce the recipe
rec <- recipe(Frequency ~ ., data = FID) %>%
step_nzv(all_predictors(), freq_cut = 0, unique_cut = 0) %>% # remove variables with zero variances
step_novel(all_nominal()) %>% # prepares test data to handle previously unseen factor levels
step_medianimpute(all_numeric(), -all_outcomes(), -has_role("id vars")) %>% # replaces missing numeric observations with the median
step_dummy(all_nominal(), -has_role("id vars")) # dummy codes categorical variables
#Produce the random forest model
mod_rf <- rand_forest(
mtry = tune(),
trees = 1000,
min_n = tune()
) %>%
set_mode("regression") %>%
set_engine("ranger")
##Workflow
wflow_rf <- workflow() %>%
add_model(mod_rf) %>%
add_recipe(rec)
##Fit model
fit_rf<-fit_resamples(
wflow_rf,
cv,
metrics = metric_set(rmse, rsq),
control = control_resamples(save_pred = TRUE,
extract = function(x) extract_model(x)))
Data Frame FID
structure(list(Year = c(2015, 2015, 2015, 2015, 2015, 2015, 2015,
2015, 2015, 2015, 2015, 2015, 2016, 2016, 2016, 2016, 2016, 2016,
2016, 2016, 2016, 2016, 2016, 2016, 2017, 2017, 2017, 2017, 2017,
2017, 2017, 2017, 2017, 2017, 2017, 2017), Month = structure(c(1L,
2L, 3L, 4L, 5L, 6L, 7L, 8L, 9L, 10L, 11L, 12L, 1L, 2L, 3L, 4L,
5L, 6L, 7L, 8L, 9L, 10L, 11L, 12L, 1L, 2L, 3L, 4L, 5L, 6L, 7L,
8L, 9L, 10L, 11L, 12L), .Label = c("January", "February", "March",
"April", "May", "June", "July", "August", "September", "October",
"November", "December"), class = "factor"), Frequency = c(36,
28, 39, 46, 5, 0, 0, 22, 10, 15, 8, 33, 33, 29, 31, 23, 8, 9,
7, 40, 41, 41, 30, 30, 44, 37, 41, 42, 20, 0, 7, 27, 35, 27,
43, 38), Days = c(31, 28, 31, 30, 6, 0, 0, 29, 15,
29, 29, 31, 31, 29, 30, 30, 7, 0, 7, 30, 30, 31, 30, 27, 31,
28, 30, 30, 21, 0, 7, 26, 29, 27, 29, 29)), row.names = c(NA,
-36L), class = "data.frame")