# nolint start
library(mlexperiments)
# nolint start
library(mlexperiments)
See https://github.com/kapsner/mlexperiments/blob/main/R/learner_rpart.R for implementation details.
library(mlbench)
data("BostonHousing")
<- BostonHousing |>
dataset ::as.data.table() |>
data.tablena.omit()
<- colnames(dataset)[1:13]
feature_cols <- "medv"
target_col <- "chas" cat_vars
<- 123
seed if (isTRUE(as.logical(Sys.getenv("_R_CHECK_LIMIT_CORES_")))) {
# on cran
<- 2L
ncores else {
} <- ifelse(
ncores test = parallel::detectCores() > 4,
yes = 4L,
no = ifelse(
test = parallel::detectCores() < 2L,
yes = 1L,
no = parallel::detectCores()
)
)
}options("mlexperiments.bayesian.max_init" = 10L)
<- splitTools::partition(
data_split y = dataset[, get(target_col)],
p = c(train = 0.7, test = 0.3),
type = "stratified",
seed = seed
)
<- data.matrix(
train_x $train, .SD, .SDcols = feature_cols]
dataset[data_split
)<- dataset[data_split$train, get(target_col)]
train_y
<- data.matrix(
test_x $test, .SD, .SDcols = feature_cols]
dataset[data_split
)<- dataset[data_split$test, get(target_col)] test_y
<- splitTools::create_folds(
fold_list y = train_y,
k = 3,
type = "stratified",
seed = seed
)
# required learner arguments, not optimized
<- list(method = "anova")
learner_args
# set arguments for predict function and performance metric,
# required for mlexperiments::MLCrossValidation and
# mlexperiments::MLNestedCV
<- list(type = "vector")
predict_args <- metric("mse")
performance_metric <- NULL
performance_metric_args <- FALSE
return_models
# required for grid search and initialization of bayesian optimization
<- expand.grid(
parameter_grid minsplit = seq(2L, 82L, 10L),
cp = seq(0.01, 0.1, 0.01),
maxdepth = seq(2L, 30L, 5L)
)# reduce to a maximum of 10 rows
if (nrow(parameter_grid) > 10) {
set.seed(123)
<- sample(seq_len(nrow(parameter_grid)), 10, FALSE)
sample_rows <- kdry::mlh_subset(parameter_grid, sample_rows)
parameter_grid
}
# required for bayesian optimization
<- list(
parameter_bounds minsplit = c(2L, 100L),
cp = c(0.01, 0.1),
maxdepth = c(2L, 30L)
)<- list(
optim_args iters.n = ncores,
kappa = 3.5,
acq = "ucb"
)
<- mlexperiments::MLTuneParameters$new(
tuner learner = LearnerRpart$new(),
strategy = "grid",
ncores = ncores,
seed = seed
)
$parameter_grid <- parameter_grid
tuner$learner_args <- learner_args
tuner$split_type <- "stratified"
tuner
$set_data(
tunerx = train_x,
y = train_y,
cat_vars = cat_vars
)
<- tuner$execute(k = 3)
tuner_results_grid #>
#> Regression: using 'mean squared error' as optimization metric.
#>
#> Regression: using 'mean squared error' as optimization metric.
#>
#> Regression: using 'mean squared error' as optimization metric.
#>
#> Regression: using 'mean squared error' as optimization metric.
#>
#> Regression: using 'mean squared error' as optimization metric.
#>
#> Regression: using 'mean squared error' as optimization metric.
#>
#> Regression: using 'mean squared error' as optimization metric.
#>
#> Regression: using 'mean squared error' as optimization metric.
#>
#> Parameter settings [=====================================================================================>----------] 9/10 ( 90%)
#> Regression: using 'mean squared error' as optimization metric.
#>
#> Parameter settings [===============================================================================================] 10/10 (100%)
#> Regression: using 'mean squared error' as optimization metric.
head(tuner_results_grid)
#> setting_id metric_optim_mean minsplit cp maxdepth method
#> 1: 1 26.14038 2 0.07 22 anova
#> 2: 2 26.14038 32 0.02 27 anova
#> 3: 3 26.14038 72 0.10 7 anova
#> 4: 4 26.14038 32 0.09 27 anova
#> 5: 5 26.14038 52 0.02 12 anova
#> 6: 6 26.14038 2 0.04 7 anova
<- mlexperiments::MLTuneParameters$new(
tuner learner = LearnerRpart$new(),
strategy = "bayesian",
ncores = ncores,
seed = seed
)
$parameter_grid <- parameter_grid
tuner$parameter_bounds <- parameter_bounds
tuner
$learner_args <- learner_args
tuner$optim_args <- optim_args
tuner
$split_type <- "stratified"
tuner
$set_data(
tunerx = train_x,
y = train_y,
cat_vars = cat_vars
)
<- tuner$execute(k = 3)
tuner_results_bayesian #>
#> Registering parallel backend using 4 cores.
head(tuner_results_bayesian)
#> Epoch setting_id minsplit cp maxdepth gpUtility acqOptimum inBounds Elapsed Score metric_optim_mean errorMessage method
#> 1: 0 1 2 0.07 22 NA FALSE TRUE 0.049 -26.14038 26.14038 NA anova
#> 2: 0 2 32 0.02 27 NA FALSE TRUE 0.049 -26.14038 26.14038 NA anova
#> 3: 0 3 72 0.10 7 NA FALSE TRUE 0.049 -26.14038 26.14038 NA anova
#> 4: 0 4 32 0.09 27 NA FALSE TRUE 0.049 -26.14038 26.14038 NA anova
#> 5: 0 5 52 0.02 12 NA FALSE TRUE 0.027 -26.14038 26.14038 NA anova
#> 6: 0 6 2 0.04 7 NA FALSE TRUE 0.027 -26.14038 26.14038 NA anova
<- mlexperiments::MLCrossValidation$new(
validator learner = LearnerRpart$new(),
fold_list = fold_list,
ncores = ncores,
seed = seed
)
$learner_args <- tuner$results$best.setting[-1]
validator
$predict_args <- predict_args
validator$performance_metric <- performance_metric
validator$performance_metric_args <- performance_metric_args
validator$return_models <- return_models
validator
$set_data(
validatorx = train_x,
y = train_y,
cat_vars = cat_vars
)
<- validator$execute()
validator_results #>
#> CV fold: Fold1
#>
#> CV fold: Fold2
#>
#> CV fold: Fold3
head(validator_results)
#> fold performance minsplit cp maxdepth method
#> 1: Fold1 29.20022 2 0.07 22 anova
#> 2: Fold2 17.76631 2 0.07 22 anova
#> 3: Fold3 31.45460 2 0.07 22 anova
<- mlexperiments::MLNestedCV$new(
validator learner = LearnerRpart$new(),
strategy = "grid",
fold_list = fold_list,
k_tuning = 3L,
ncores = ncores,
seed = seed
)
$parameter_grid <- parameter_grid
validator$learner_args <- learner_args
validator$split_type <- "stratified"
validator
$predict_args <- predict_args
validator$performance_metric <- performance_metric
validator$performance_metric_args <- performance_metric_args
validator$return_models <- return_models
validator
$set_data(
validatorx = train_x,
y = train_y,
cat_vars = cat_vars
)
<- validator$execute()
validator_results #>
#> CV fold: Fold1
#>
#> Regression: using 'mean squared error' as optimization metric.
#>
#> Regression: using 'mean squared error' as optimization metric.
#>
#> Regression: using 'mean squared error' as optimization metric.
#>
#> Regression: using 'mean squared error' as optimization metric.
#>
#> Regression: using 'mean squared error' as optimization metric.
#>
#> Regression: using 'mean squared error' as optimization metric.
#>
#> Regression: using 'mean squared error' as optimization metric.
#>
#> Regression: using 'mean squared error' as optimization metric.
#>
#> Parameter settings [=====================================================================================>----------] 9/10 ( 90%)
#> Regression: using 'mean squared error' as optimization metric.
#>
#> Parameter settings [===============================================================================================] 10/10 (100%)
#> Regression: using 'mean squared error' as optimization metric.
#>
#> CV fold: Fold2
#> CV progress [====================================================================>-----------------------------------] 2/3 ( 67%)
#>
#> Regression: using 'mean squared error' as optimization metric.
#>
#> Regression: using 'mean squared error' as optimization metric.
#>
#> Regression: using 'mean squared error' as optimization metric.
#>
#> Regression: using 'mean squared error' as optimization metric.
#>
#> Regression: using 'mean squared error' as optimization metric.
#>
#> Regression: using 'mean squared error' as optimization metric.
#>
#> Regression: using 'mean squared error' as optimization metric.
#>
#> Regression: using 'mean squared error' as optimization metric.
#>
#> Regression: using 'mean squared error' as optimization metric.
#>
#> Parameter settings [===============================================================================================] 10/10 (100%)
#> Regression: using 'mean squared error' as optimization metric.
#>
#> CV fold: Fold3
#> CV progress [========================================================================================================] 3/3 (100%)
#>
#> Regression: using 'mean squared error' as optimization metric.
#>
#> Regression: using 'mean squared error' as optimization metric.
#>
#> Regression: using 'mean squared error' as optimization metric.
#>
#> Regression: using 'mean squared error' as optimization metric.
#>
#> Regression: using 'mean squared error' as optimization metric.
#>
#> Regression: using 'mean squared error' as optimization metric.
#>
#> Regression: using 'mean squared error' as optimization metric.
#>
#> Regression: using 'mean squared error' as optimization metric.
#>
#> Parameter settings [=====================================================================================>----------] 9/10 ( 90%)
#> Regression: using 'mean squared error' as optimization metric.
#>
#> Parameter settings [===============================================================================================] 10/10 (100%)
#> Regression: using 'mean squared error' as optimization metric.
head(validator_results)
#> fold performance minsplit cp maxdepth method
#> 1: Fold1 29.20022 2 0.07 22 anova
#> 2: Fold2 17.76631 2 0.07 22 anova
#> 3: Fold3 31.45460 2 0.07 22 anova
<- mlexperiments::MLNestedCV$new(
validator learner = LearnerRpart$new(),
strategy = "bayesian",
fold_list = fold_list,
k_tuning = 3L,
ncores = ncores,
seed = seed
)
$parameter_grid <- parameter_grid
validator$learner_args <- learner_args
validator$split_type <- "stratified"
validator
$parameter_bounds <- parameter_bounds
validator$optim_args <- optim_args
validator
$predict_args <- predict_args
validator$performance_metric <- performance_metric
validator$performance_metric_args <- performance_metric_args
validator$return_models <- TRUE
validator
$set_data(
validatorx = train_x,
y = train_y,
cat_vars = cat_vars
)
<- validator$execute()
validator_results #>
#> CV fold: Fold1
#>
#> Registering parallel backend using 4 cores.
#>
#> CV fold: Fold2
#> CV progress [====================================================================>-----------------------------------] 2/3 ( 67%)
#>
#> Registering parallel backend using 4 cores.
#>
#> CV fold: Fold3
#> CV progress [========================================================================================================] 3/3 (100%)
#>
#> Registering parallel backend using 4 cores.
head(validator_results)
#> fold performance minsplit cp maxdepth method
#> 1: Fold1 29.20022 2 0.07 22 anova
#> 2: Fold2 17.76631 2 0.07 22 anova
#> 3: Fold3 31.45460 2 0.07 22 anova
See https://github.com/kapsner/mlexperiments/blob/main/R/learner_lm.R for implementation details.
<- mlexperiments::MLCrossValidation$new(
validator_lm learner = LearnerLm$new(),
fold_list = fold_list,
ncores = ncores,
seed = seed
)
$predict_args <- list(type = "response")
validator_lm$performance_metric <- performance_metric
validator_lm$performance_metric_args <- performance_metric_args
validator_lm$return_models <- TRUE
validator_lm
$set_data(
validator_lmx = train_x,
y = train_y,
cat_vars = cat_vars
)
<- validator_lm$execute()
validator_lm_results #>
#> CV fold: Fold1
#> Parameter 'ncores' is ignored for learner 'LearnerLm'.
#>
#> CV fold: Fold2
#> Parameter 'ncores' is ignored for learner 'LearnerLm'.
#>
#> CV fold: Fold3
#> Parameter 'ncores' is ignored for learner 'LearnerLm'.
head(validator_lm_results)
#> fold performance
#> 1: Fold1 35.49058
#> 2: Fold2 22.04977
#> 3: Fold3 21.39721
::validate_fold_equality(
mlexperimentsexperiments = list(validator, validator_lm)
)#>
#> Testing for identical folds in 1 and 2.
#>
#> Testing for identical folds in 2 and 1.
<- mlexperiments::predictions(
preds_rpart object = validator,
newdata = test_x
)
<- mlexperiments::predictions(
preds_lm object = validator_lm,
newdata = test_x
)
<- mlexperiments::performance(
perf_rpart object = validator,
prediction_results = preds_rpart,
y_ground_truth = test_y,
type = "regression"
)
<- mlexperiments::performance(
perf_lm object = validator_lm,
prediction_results = preds_lm,
y_ground_truth = test_y,
type = "regression"
)
# combine results for plotting
<- rbind(
final_results cbind(algorithm = "rpart", perf_rpart),
cbind(algorithm = "lm", perf_lm)
)
# p <- ggpubr::ggdotchart(
# data = final_results,
# x = "algorithm",
# y = "mse",
# color = "model",
# rotate = TRUE
# )
# p