Tree Methods

  • Note: Use the following data:
    • current.env.RData
    • future.env.Rdata
    • Pinus_edulis.csv
    • ne_50m_admin_0_countries.zip

Initial Set Up

##Set working directory
setwd("~/Desktop/University of Utah PhD /Course Work/Spring 2023 Semester/GEOG6160 - Spatial Modeling/Labs/lab07")

##List Files to check for the appropriate data
list.files("../datafiles/")
##  [1] "absence.csv"              "ca"                      
##  [3] "ca.zip"                   "columbus.shp"            
##  [5] "corridor_width.csv"       "current_env.nc"          
##  [7] "current.env.RData"        "ElevationData.txt"       
##  [9] "future_env.nc"            "future.env.RData"        
## [11] "housing.csv"              "leydet_gol.csv"          
## [13] "local-elevation.asc"      "ne_50m_admin_0_countries"
## [15] "Pinus_edulis.csv"         "roadclip"                
## [17] "roadclip.zip"             "sonar.csv"
##Create a vector for the missing packages
#pckgs = c("dismo", "tree", "rpart.plot", "vip", "pdp")

##Install the packages
#install.packages(pckgs)
##Activate the required packages

library(raster) ##functions for working with gridded spatial data
## Loading required package: sp
library(dismo) ##utility functions for species distribution models
library(tree) ##simple classification and regression trees
library(rpart) ##Regression tree package
library(rpart.plot) ##better CART graphics
library(vip) ##better variable importance plots
## 
## Attaching package: 'vip'
## The following object is masked from 'package:utils':
## 
##     vi
library(pdp) ##partial dependency plots
library(RColorBrewer) ##color palettes for mapping
library(dplyr) ##Adjusting dataframes
## 
## Attaching package: 'dplyr'
## The following objects are masked from 'package:raster':
## 
##     intersect, select, union
## The following objects are masked from 'package:stats':
## 
##     filter, lag
## The following objects are masked from 'package:base':
## 
##     intersect, setdiff, setequal, union
library(mlr3) ##Machine learning
## 
## Attaching package: 'mlr3'
## The following object is masked from 'package:raster':
## 
##     resample
library(mlr3learners) ##ML learners
library(mlr3tuning) ##hyperparameter tuning for machine learning models
## Loading required package: paradox
library(paradox) ##required package for mlr3tuning
library(sf) ##Simple features
## Linking to GEOS 3.11.0, GDAL 3.5.3, PROJ 9.1.0; sf_use_s2() is TRUE
library(tmap) ##mapping

Data Processing

Getting Data 1: Location Data

## Read in the locations of Pinyon Pine (pinus edulis)
pe = read.csv("../datafiles/Pinus_edulis.csv")

## Set as a simple feature
pe = st_as_sf(pe,
              coords = c("longitude", "latitude"))

## Read in countries shapefile
borders = st_read("../datafiles/ne_50m_admin_0_countries/ne_50m_admin_0_countries.shp", quiet = TRUE)
##Extract USA
usa = borders[borders$ADMIN == "United States of America", ]

##Plot
tm_shape(pe) +
  tm_symbols(col = "orange",
             alpha = 0.5,
             size = 0.5) +
  tm_shape(usa) +
  tm_borders()
## Warning: Currect projection of shape pe unknown. Long-lat (WGS84) is assumed.

##Lab example plot

plot(st_geometry(pe), xlim = c(-120,-80), ylim = c(25,55), 
     pch = 21, bg = "darkorange", axes=TRUE)
plot(st_geometry(borders), add = TRUE)

Getting Online Data

Note: If you need to get your own species data, the dismo package includes a function gbif() that allows you to download records directly from the GBIF. To demonstrate this, we’ll use it here to get occurrence records of the timber rattlesnake Crotalus horridus. This function allows selection by Latin name, so here we specify the genus and species names separately (this will take a few second to retrieve all the records:

## Specify the latin name to retrieve the data
rattler = gbif("crotalus", "horridus")
## 10324 records found
## 0-300-600-900-1200-1500-1800-2100-2400-2700-3000-3300-3600-3900-4200-4500-4800-5100-5400-5700-6000-6300-6600-6900-7200-7500-7800-8100-8400-8700-9000-9300-9600-9900-10200-10324 records downloaded
## Polar bear example
#polar.bear = gbif("ursus", "maritimus")

Note: The returned object has much more information about the occurrence records, including metadata about the original study that supplied the data. Note that all records are returned irrespective of whether or not they have associated geolocations, so we subset only the records that have coordinates (the function does have an argument to exclude records with no longitude or latitude).

## Subset the rattler data that includes lat/long data
## Note that ! is an inverse operator
rattler = subset(rattler, !is.na(rattler$lon))

## Set as a simple feature
rattler = st_as_sf(rattler,
                   coords = c("lon", "lat"))
## Initial Visualization
plot(st_geometry(rattler),
     pch = 21,
     bg = "green",
     axes = TRUE)
plot(st_geometry(borders),
     add = TRUE)

**Getting Data 2: Environmental Data

Note: There are a large number of available data sources for environmental data that can be used in species distribution models. We’ll take data from the Worldclim project (Hijmans et al. 2005), a collection of standardized climate data at a variety of spatial resolutions. This data can be downloaded directly using the getData() function, which allows direct downloads from this and other datasets. The data contains monthly averages of temperature and precipitation and a set of bioclimatic variables, which represent aggregate climate variables assumed to be linked to species distributions. I’ve already downloaded the bioclimatic variables for you and clipped them to the region you’re going to work in. These are available in two RData files containing modern (current.env.RData) and future (future.env.RData) climates for the study area.

## Load the data provided with the lab (these data were already downloaded)
## In Raster format

## Current Environment
load("../datafiles/current.env.RData")

## Future Environment
load("../datafiles/future.env.RData")
##Check
##It is in a raster format (stacked)
current.env
## class      : RasterStack 
## dimensions : 480, 720, 345600, 19  (nrow, ncol, ncell, nlayers)
## resolution : 0.04166667, 0.04166667  (x, y)
## extent     : -130, -100, 30, 50  (xmin, xmax, ymin, ymax)
## crs        : +proj=longlat +datum=WGS84 +ellps=WGS84 +towgs84=0,0,0 
## names      :   bio1,   bio2,   bio3,   bio4,   bio5,   bio6,   bio7,   bio8,   bio9,  bio10,  bio11,  bio12,  bio13,  bio14,  bio15, ... 
## min values :   -7.1,    5.6,    2.4,  165.9,    6.0,  -24.1,   11.8,  -13.5,  -15.3,    0.5,  -15.9,   46.0,    7.0,    0.0,    5.0, ... 
## max values :   23.9,   21.3,    6.5, 1299.2,   45.6,   10.0,   50.9,   33.2,   32.9,   36.0,   15.4, 3345.0,  556.0,   77.0,  123.0, ...

Note: This tells us that the files are 480*720 pixels, with 19 layers, each representing a single climate variables (the variables are listed in the appendix of today’s lab). There’s also information about the extent and resolution of the data. If you need to get different data or data for another region, look at the help for the getData() function.

##Check

future.env
## class      : RasterStack 
## dimensions : 480, 720, 345600, 19  (nrow, ncol, ncell, nlayers)
## resolution : 0.04166667, 0.04166667  (x, y)
## extent     : -130, -100, 30, 50  (xmin, xmax, ymin, ymax)
## crs        : +proj=longlat +ellps=WGS84 +towgs84=0,0,0,0,0,0,0 +no_defs 
## names      : he85bi701, he85bi702, he85bi703, he85bi704, he85bi705, he85bi706, he85bi707, he85bi708, he85bi709, he85bi7010, he85bi7011, he85bi7012, he85bi7013, he85bi7014, he85bi7015, ... 
## min values :      -1.4,       5.5,       2.5,     195.7,      13.1,     -17.1,      12.0,      -8.5,      -6.6,        7.2,       -8.5,       48.0,        9.0,        0.0,       10.0, ... 
## max values :      29.1,      21.9,       6.3,    1204.3,      50.6,      13.8,      52.3,      38.4,      36.9,       41.6,       20.3,     3447.0,      672.0,       66.0,      127.0, ...
## You can extract any single layer using the raster() function (e.g. raster(current.env, 1)) will give you the first layer)

library(RColorBrewer)
my.pal = brewer.pal(n = 9,
                    "GnBu")
##Climate Data
plot(raster(current.env,
            layer = 1),
            col = rev(my.pal))
##Rev = reverse color scale

##Add the Pinyon tree locations
plot(st_geometry(pe),
     add = TRUE,
     pch = 21,
     bg = "indianred4")

##Reminder pch: symbol
##bg: BackGround color

Merging locations and environment

Note: Finally, we make up a dataset for modeling. We want to model the species distribution using a binary classification task, where 1 indicates presence and 0 indicates absence. However, we only have observations of presences (nobody records when they don’t see a species). To get around this, we’ll generate some ‘pseudo-absences’: locations that represent an absence of this species. There are several ways to generate these. One of the easiest is to simply pick random locations within the study area using the randomPoints() function. This takes as inputs:

  • A mask layer defining the study area
  • The number of selected points (we’ll get the same number as observed values)
  • The set of presence points

This generates a matrix of coordinates that we then need to convert to a spatial sf object. This is a bit long-winded, but allows to easily plot the new points.

## Generate random points
##Initially generates as a matrix
absence = randomPoints(mask = raster(current.env, 1),
                       n = nrow(pe),
                       p = st_coordinates(pe))

## n = number of points (in this case the same number of rows as the pe data frame)
## p = presence points (points where there are already points, so they aren't duplicated during the random generation process)

## Set as an sf object
## Need to convert from a matrix to a data frame 
absence = st_as_sf(as.data.frame(absence),
                   coords = c("x", "y"))
##Visualize 

##Climate Data
plot(raster(current.env,
            layer = 1),
            col = rev(my.pal))
##Rev = reverse color scale

##Add the Pinyon tree locations
plot(st_geometry(pe),
     add = TRUE,
     pch = 21,
     bg = "indianred4")

##Add the absence locations
plot(st_geometry(absence),
     add = TRUE,
     pch = 21,
     bg = "grey95")

Note: One problem with this method is that we sample absences very far from the observed points. As the environment of these points is very unlike the places where the species are found, these will always predict as absences, and can bias our assessment of the model. A better approach is to restrict the absences to a small region around the observed points. We could crop the environmental mask to a smaller region, or use a buffer approach. We’ll do the second of these here. We first general 200km buffers around each observed presence using the circles() function. Then use the spsample() function to pick random points within these buffers:

## Create a buffer around the existing Pinyon locations
## d = radius in meters
x = circles(p = st_coordinates(pe),
            d = 200000,
            lonlat = TRUE)

## Use spsample to resample points within this radius
## as "sf" coerces the data into a simple feature
absence = as(spsample(x@polygons,
             type = "random",
             n = nrow(pe)), 
             Class = "sf")
##Climate Data
plot(raster(current.env,
            layer = 1),
            col = rev(my.pal))
##Rev = reverse color scale

##Add the Pinyon tree locations
plot(st_geometry(pe),
     add = TRUE,
     pch = 21,
     bg = "indianred4")

##Add the absence locations
plot(st_geometry(absence),
     add = TRUE,
     pch = 21,
     bg = "grey95")

Note: Now we have the presence and absence points, we need to extract the environmental values for these points (these will be a features for machine learning). To do this we use the following steps:

  • Concatenate the presence and absence coordinates
  • Use the extract() function to get the associated climate values from the environmental grids
  • Create a binary (0/1) vector for use as labels
  • Combine the features and labels into a data frame
  • Reset the row names to numeric indices
## Concatenate the presence and absence coordinates using rbind()
## Absence is one the "bottom half of the dataframe"
pe.crds = rbind(st_coordinates(pe), st_coordinates(absence))

## Extract to get the associated climate values
pe.env = raster::extract(x = current.env,
                         y = pe.crds,
                         method = "simple")

## Create a binary vector for us as labels
## rep 0 is on the bottom half of the data frame**
pe.pa = as.factor(c(rep(1, times = nrow(pe)), rep(0, times = nrow(pe))))


##Combine into a data frame
pe.df = data.frame(pe.crds,
                   pa = pe.pa,
                   pe.env)

## Change rownames to a numeric index
dim(pe.df)
## [1] 598  22
## 598 rows; 22 columns(variables or features)
row.names(pe.df) = 1:598

## Final Check
head(pe.df)
##           X        Y pa bio1 bio2 bio3  bio4 bio5  bio6 bio7 bio8 bio9 bio10
## 1 -104.8967 38.86601  1  8.0 16.6  4.2 789.0 28.7 -10.5 39.2 18.5 -1.7  18.5
## 2 -104.8832 38.87549  1  6.4 16.7  4.2 778.1 27.0 -12.1 39.1 16.7 -3.2  16.7
## 3 -104.8393 38.72277  1  5.8 16.2  4.2 778.0 26.1 -12.4 38.5 16.1 -3.8  16.1
## 4 -104.8972 38.86471  1  8.0 16.6  4.2 789.0 28.7 -10.5 39.2 18.5 -1.7  18.5
## 5 -104.8550 38.90846  1  8.2 16.4  4.1 792.9 28.9 -10.2 39.1 18.8 -1.5  18.8
## 6 -112.1357 36.05780  1  7.8 16.2  4.4 721.5 27.8  -8.5 36.3 16.9 10.6  17.3
##   bio11 bio12 bio13 bio14 bio15 bio16 bio17 bio18 bio19
## 1  -1.7   427    73     9    60   194    34   194    34
## 2  -3.2   452    76    10    59   204    38   204    38
## 3  -3.8   474    81    11    58   214    43   214    43
## 4  -1.7   427    73     9    60   194    34   194    34
## 5  -1.5   426    72     9    60   194    34   194    34
## 6  -0.9   411    55    14    32   133    57   115   112

Classification and Regression Trees

Note: Classification and Regression Trees (CART) is a non-linear, non-parametric modeling approach that can be used with a wide variety of data. Regression trees are used with continuous outcome data, and classification trees with binary or categorical data, but the interface for these is the same in R.

R has a number of packages for performing CART and associated analyses. We’re going to use the tree package to demonstrate how this works with the California data, then we’ll move to using mlr3 which uses the rpart package. While the syntax will be different, there is little difference in the way these work:

We’ll build a classification model for the Pinus edulis data set using mlr3. CART methods are implemented in mlr3 using the rpart package and the two learners are classif.rpart for a classification tree and regr.rpart for a regression tree.

As a recall,

  • we need to identify the task
  • define a performance measure
  • define a resampling strategy
  • Finally, then we train the learner and evaluate the outcomes
## Set the task
task_pe = TaskClassif$new(id = "pe",
                          backend = pe.df,
                          target = "pa")

## Check the task details
task_pe$col_roles
## $feature
##  [1] "X"     "Y"     "bio1"  "bio10" "bio11" "bio12" "bio13" "bio14" "bio15"
## [10] "bio16" "bio17" "bio18" "bio19" "bio2"  "bio3"  "bio4"  "bio5"  "bio6" 
## [19] "bio7"  "bio8"  "bio9" 
## 
## $target
## [1] "pa"
## 
## $name
## character(0)
## 
## $order
## character(0)
## 
## $stratum
## character(0)
## 
## $group
## character(0)
## 
## $weight
## character(0)

Note: The task is currently using all features including the coordinates (X and Y). We can exclude these from the feature list:

## Remove X and Y from the feature list
## Using setdiff to make a new feature vector in the task without x and y
task_pe$col_roles$feature = setdiff(task_pe$col_roles$feature,
                                    c("X", "Y"))

## Check
task_pe$feature_names
##  [1] "bio1"  "bio10" "bio11" "bio12" "bio13" "bio14" "bio15" "bio16" "bio17"
## [10] "bio18" "bio19" "bio2"  "bio3"  "bio4"  "bio5"  "bio6"  "bio7"  "bio8" 
## [19] "bio9"
## Set the performance measure
## Remember you can use msrs() to get a list of the measures
## Since this is classification use classif.auc

measure = msr("classif.auc")
##Set the learner (use default parameters)
## Prediction types are located here: mlr_reflections$learner_predict_types
lrn_ct = lrn("classif.rpart",
             predict_type = "prob")
## Use the holdout method (leave out 20%)
resamp_hout = rsmp("holdout",
                   ratio = 0.8)

## Instantiate to ensure the resampling has taken place on the pe task
resamp_hout$instantiate(task_pe)
## Run the resampler to build and store the model using the training data set

rr = resample(task = task_pe,
              learner = lrn_ct,
              resampling = resamp_hout,
              store_models = TRUE)
## INFO  [16:32:15.299] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## Check the performance using the performance measure
rr$score(measure)
##                 task task_id                   learner    learner_id
## 1: <TaskClassif[50]>      pe <LearnerClassifRpart[38]> classif.rpart
##                 resampling resampling_id iteration              prediction
## 1: <ResamplingHoldout[20]>       holdout         1 <PredictionClassif[20]>
##    classif.auc
## 1:   0.8020979
## Print the score
rr$aggregate(measure)
## classif.auc 
##   0.8020979

Note: With the default settings, this has worked fairly well, but we will next try to improve on this by tuning the hyperparameters. Before doing so, we can extract any of the trees that were built during the resampling. These are stored in a list in rr$learners, and you can select an individual models using R’s list index [[i]]. As we are using a hold-out, there is only one learner in this list ([[1]]). With a 5-fold cross-validation, there would be 5 ([[1]]…[[5]]).

## Extract the only learner [[1]] for this resampling run
## This is the written version of our tree/model
rr$learners[[1]]$model
## n= 478 
## 
## node), split, n, loss, yval, (yprob)
##       * denotes terminal node
## 
##  1) root 478 234 0 (0.51046025 0.48953975)  
##    2) bio17< 35.5 158  30 0 (0.81012658 0.18987342)  
##      4) bio5>=32.05 120   9 0 (0.92500000 0.07500000) *
##      5) bio5< 32.05 38  17 1 (0.44736842 0.55263158)  
##       10) bio10< 21.45 29  12 0 (0.58620690 0.41379310)  
##         20) bio4>=806.3 13   1 0 (0.92307692 0.07692308) *
##         21) bio4< 806.3 16   5 1 (0.31250000 0.68750000) *
##       11) bio10>=21.45 9   0 1 (0.00000000 1.00000000) *
##    3) bio17>=35.5 320 116 1 (0.36250000 0.63750000)  
##      6) bio8< 15.55 103  33 0 (0.67961165 0.32038835)  
##       12) bio3< 4.15 73  15 0 (0.79452055 0.20547945)  
##         24) bio11< -5.8 33   2 0 (0.93939394 0.06060606) *
##         25) bio11>=-5.8 40  13 0 (0.67500000 0.32500000)  
##           50) bio15>=12.5 33   7 0 (0.78787879 0.21212121) *
##           51) bio15< 12.5 7   1 1 (0.14285714 0.85714286) *
##       13) bio3>=4.15 30  12 1 (0.40000000 0.60000000)  
##         26) bio16< 113 8   1 0 (0.87500000 0.12500000) *
##         27) bio16>=113 22   5 1 (0.22727273 0.77272727) *
##      7) bio8>=15.55 217  46 1 (0.21198157 0.78801843)  
##       14) bio12< 340.5 61  26 1 (0.42622951 0.57377049)  
##         28) bio3>=3.65 33   9 0 (0.72727273 0.27272727) *
##         29) bio3< 3.65 28   2 1 (0.07142857 0.92857143) *
##       15) bio12>=340.5 156  20 1 (0.12820513 0.87179487)  
##         30) bio8>=20.65 24  11 1 (0.45833333 0.54166667)  
##           60) bio15>=40.5 13   2 0 (0.84615385 0.15384615) *
##           61) bio15< 40.5 11   0 1 (0.00000000 1.00000000) *
##         31) bio8< 20.65 132   9 1 (0.06818182 0.93181818) *

Note: We’ll use the rpart.plot package to visualize the first of these. This allows you to make a large number of tweaks to a tree plot. Here extra=106 adds the following to each terminal node: the predicted value, the proportion of 1s and the percentage of observations in that node:

## Initial visualization of the first tree
prp(rr$learners[[1]]$model,
    extra = 106,
    roundint = FALSE)

Tuning

Note: Classification and regression trees have a large number of hyper parameters and benefit from tuning. We can do this using the mlr3tuning package. There are several steps here:

1. Define the task, learner and measure. We’ll use the definitions from the previous section

2. Define the parameters to test Parameter sets can be generated using the paradox package. This should have been installed along with mlr3, so load this now.

## Check the hyperparameters in our learner
lrn_ct$param_set
## <ParamSet>
##                 id    class lower upper nlevels        default value
##  1:             cp ParamDbl     0     1     Inf           0.01      
##  2:     keep_model ParamLgl    NA    NA       2          FALSE      
##  3:     maxcompete ParamInt     0   Inf     Inf              4      
##  4:       maxdepth ParamInt     1    30      30             30      
##  5:   maxsurrogate ParamInt     0   Inf     Inf              5      
##  6:      minbucket ParamInt     1   Inf     Inf <NoDefault[3]>      
##  7:       minsplit ParamInt     1   Inf     Inf             20      
##  8: surrogatestyle ParamInt     0     1       2              0      
##  9:   usesurrogate ParamInt     0     2       3              2      
## 10:           xval ParamInt     0   Inf     Inf             10     0

This table also gives the type of parameter (e.g. double precision or integer), the lower and upper bounds and the default value. We’ll test values for the complexity parameter (cp) between 0.001 and 0.1, and the minimum number of observations to considering partitioning a node (minsplit) from 1 to 12.

## Build parameter set
tune_ps = ParamSet$new(list(
  ParamDbl$new("cp", lower = 0.0001, upper = 0.1),
  ParamInt$new("minsplit", lower = 2, upper = 20)
))

## Check
tune_ps
## <ParamSet>
##          id    class lower upper nlevels        default value
## 1:       cp ParamDbl 1e-04   0.1     Inf <NoDefault[3]>      
## 2: minsplit ParamInt 2e+00  20.0      19 <NoDefault[3]>

3. Define a stopping condition Next we defining one or more stopping criteria for the tuning. This is largely to ensure that tuning for highly complex algorithms is manageable. The available stopping criteria include:

  • limiting clock time
  • limiting the number of iterations or evaluations
  • stopping when a specific level of performance has been reached
  • stopping when performance no longer improves by more than some amount

We’ll use the second of these. The function to set the terminator is term(), and we set the number of evaluations to 50.

## Limit the number of iterations/evaluations to 50
evals = trm("evals",
            n_evals = 50)

4. Define the Tuner Now, we set up a sampling strategy for searching among different hyperparameter values. There are a couple of options here; we will use a grid search, where the argument resolution gives the number of steps between the lower and upper bounds defined in our ParamSet.

## Define the tuner to grid search with 10 steps between the lower and upper bounds
tuner = tnr("grid_search",
            resolution = 10)

5. Run the tuner The mlr3tuning package offers a couple of ways to tune. Either by first running the tuning, then using these parameters to train the final model, or combining these using AutoTuner(). We’ll use the second of these here - it’s a little neater, and has one other advantage as we will see in later.

First create a new AutoTuner using the various other functions and parameters that we have just defined

## New autotuner
at_ct = AutoTuner$new(learner = lrn_ct,
                      resampling = rsmp("holdout"),
                      measure = measure,
                      search_space = tune_ps,
                      terminator = evals,
                      tuner = tuner)

Note: We use a holdout method in the AutoTuner to split the data. This will be used to assess how the model’s skill changes as we vary the parameters. Each time it will evaluate the measure on the holdout test set. Whichever parameter set gives the best performance will then be automatically used to train a final model. The AutoTuner object inherits from the Learner methods we have previously seen, so to tune and train the model, just type:

## Train the model
at_ct$train(task_pe)
## View the Results
at_ct$tuning_result
##       cp minsplit learner_param_vals  x_domain classif.auc
## 1: 1e-04       16          <list[3]> <list[2]>   0.7889978
##all results
#at_ct$tuning_instance

Nested Resampling

Note: The previous code has trained a model, but it has not evaluated it. While this used a resampling strategy (the holdout), this is only used to select the best value of the hyperparameters. To evaluate the final trained model, we need to use an independent dataset. Fortunately, this is quite easy to set up using the AutoTuner.

To understand the following code, we need to define the inner vs. the outer resampling strategy.

  • The outer strategy divides the dataset into a training and testing data set, where the test set is used to evaluate the predictive skill of the model

  • The inner strategy takes the training data, and divides it into two new sets to tune the model - one set to train for each combination of parameters, and one set to evaluate and help select the best values of these parameters

Here, we’ll use a hold-out for the inner strategy, and a 3-fold cross validation for the outer.

## Build the resample for the inner
resampling_inner = rsmp("holdout",
                        ratio = 0.8)

## Build the resample for the outer (in this case 3-fold)
resampling_outer = rsmp("cv", 
                        folds = 3)
## Remake the AutoTuner with the inner strategy
at_ct = AutoTuner$new(learner = lrn_ct,
                      resampling = resampling_inner,
                      measure = measure,
                      search_space = tune_ps,
                      terminator = evals,
                      tuner = tuner)
## And now run resample using the AutoTuner as the learner, and the outer resampling strategy (this will take a minute or so to run):

rr_ct = resample(task = task_pe,
                 learner = at_ct,
                 resampling = resampling_outer,
                 store_models = TRUE)
## INFO  [16:32:17.334] [mlr3] Applying learner 'classif.rpart.tuned' on task 'pe' (iter 1/3)
## INFO  [16:32:17.350] [bbotk] Starting to optimize 2 parameter(s) with '<TunerGridSearch>' and '<TerminatorEvals> [n_evals=50, k=0]'
## INFO  [16:32:17.352] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:17.358] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:17.361] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:17.368] [mlr3] Finished benchmark
## INFO  [16:32:17.378] [bbotk] Result of batch 1:
## INFO  [16:32:17.378] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:17.378] [bbotk]  0.0556       18   0.7332708        0      0            0.003
## INFO  [16:32:17.378] [bbotk]                                 uhash
## INFO  [16:32:17.378] [bbotk]  83553553-5111-48d2-9094-d4d38fb691c8
## INFO  [16:32:17.379] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:17.384] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:17.387] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:17.394] [mlr3] Finished benchmark
## INFO  [16:32:17.405] [bbotk] Result of batch 2:
## INFO  [16:32:17.405] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:17.405] [bbotk]  0.0112        2   0.7595372        0      0            0.005
## INFO  [16:32:17.405] [bbotk]                                 uhash
## INFO  [16:32:17.405] [bbotk]  7a2cb536-8957-4eed-a1f3-5ebe4d6d3d92
## INFO  [16:32:17.406] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:17.411] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:17.414] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:17.421] [mlr3] Finished benchmark
## INFO  [16:32:17.431] [bbotk] Result of batch 3:
## INFO  [16:32:17.432] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:17.432] [bbotk]  0.0334       12   0.8005003        0      0            0.003
## INFO  [16:32:17.432] [bbotk]                                 uhash
## INFO  [16:32:17.432] [bbotk]  1e27a90d-10e0-4e26-aade-2a1ea9cb16c5
## INFO  [16:32:17.433] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:17.438] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:17.440] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:17.455] [mlr3] Finished benchmark
## INFO  [16:32:17.465] [bbotk] Result of batch 4:
## INFO  [16:32:17.465] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:17.465] [bbotk]  0.0223       12   0.7836148        0      0            0.011
## INFO  [16:32:17.465] [bbotk]                                 uhash
## INFO  [16:32:17.465] [bbotk]  4481f0ea-f0ab-49b3-824c-ca1daec65a17
## INFO  [16:32:17.466] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:17.471] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:17.473] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:17.480] [mlr3] Finished benchmark
## INFO  [16:32:17.491] [bbotk] Result of batch 5:
## INFO  [16:32:17.491] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:17.491] [bbotk]  0.0334        4   0.8005003        0      0            0.005
## INFO  [16:32:17.491] [bbotk]                                 uhash
## INFO  [16:32:17.491] [bbotk]  21997efb-e619-40bd-a47a-b102f89f5f6b
## INFO  [16:32:17.492] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:17.497] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:17.499] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:17.507] [mlr3] Finished benchmark
## INFO  [16:32:17.517] [bbotk] Result of batch 6:
## INFO  [16:32:17.518] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:17.518] [bbotk]  0.0778       10   0.7332708        0      0            0.004
## INFO  [16:32:17.518] [bbotk]                                 uhash
## INFO  [16:32:17.518] [bbotk]  1cff635b-8f80-42e5-8c24-d12850173a34
## INFO  [16:32:17.518] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:17.524] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:17.526] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:17.533] [mlr3] Finished benchmark
## INFO  [16:32:17.544] [bbotk] Result of batch 7:
## INFO  [16:32:17.545] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:17.545] [bbotk]  0.0778        8   0.7332708        0      0            0.005
## INFO  [16:32:17.545] [bbotk]                                 uhash
## INFO  [16:32:17.545] [bbotk]  22f37d7a-4d30-4b9f-9314-0a09991e8235
## INFO  [16:32:17.545] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:17.550] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:17.553] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:17.560] [mlr3] Finished benchmark
## INFO  [16:32:17.570] [bbotk] Result of batch 8:
## INFO  [16:32:17.571] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:17.571] [bbotk]  0.0778       20   0.7332708        0      0            0.004
## INFO  [16:32:17.571] [bbotk]                                 uhash
## INFO  [16:32:17.571] [bbotk]  fd724292-2535-45e7-83c4-4f10feb1f07d
## INFO  [16:32:17.572] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:17.577] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:17.579] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:17.587] [mlr3] Finished benchmark
## INFO  [16:32:17.597] [bbotk] Result of batch 9:
## INFO  [16:32:17.598] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:17.598] [bbotk]  0.0223       10   0.7836148        0      0            0.004
## INFO  [16:32:17.598] [bbotk]                                 uhash
## INFO  [16:32:17.598] [bbotk]  ae103a6a-0346-4683-875c-d454518ed843
## INFO  [16:32:17.598] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:17.603] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:17.606] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:17.613] [mlr3] Finished benchmark
## INFO  [16:32:17.624] [bbotk] Result of batch 10:
## INFO  [16:32:17.625] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:17.625] [bbotk]  0.0334       10   0.8005003        0      0            0.005
## INFO  [16:32:17.625] [bbotk]                                 uhash
## INFO  [16:32:17.625] [bbotk]  d6b6381d-5076-4a6c-b326-7f486de1a039
## INFO  [16:32:17.625] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:17.631] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:17.633] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:17.641] [mlr3] Finished benchmark
## INFO  [16:32:17.651] [bbotk] Result of batch 11:
## INFO  [16:32:17.652] [bbotk]   cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:17.652] [bbotk]  0.1        4   0.7332708        0      0            0.003
## INFO  [16:32:17.652] [bbotk]                                 uhash
## INFO  [16:32:17.652] [bbotk]  a15f0f94-b3eb-454f-aa21-f48bcd6cc37b
## INFO  [16:32:17.652] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:17.672] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:17.675] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:17.682] [mlr3] Finished benchmark
## INFO  [16:32:17.693] [bbotk] Result of batch 12:
## INFO  [16:32:17.693] [bbotk]     cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:17.693] [bbotk]  1e-04       12    0.822389        0      0            0.004
## INFO  [16:32:17.693] [bbotk]                                 uhash
## INFO  [16:32:17.693] [bbotk]  fda1556c-15ae-4f4e-a062-b0eeb6beb8c3
## INFO  [16:32:17.694] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:17.699] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:17.701] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:17.708] [mlr3] Finished benchmark
## INFO  [16:32:17.719] [bbotk] Result of batch 13:
## INFO  [16:32:17.719] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:17.719] [bbotk]  0.0778       12   0.7332708        0      0            0.005
## INFO  [16:32:17.719] [bbotk]                                 uhash
## INFO  [16:32:17.719] [bbotk]  476de85c-fd2d-4154-abe1-c41f850d6158
## INFO  [16:32:17.720] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:17.725] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:17.727] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:17.735] [mlr3] Finished benchmark
## INFO  [16:32:17.745] [bbotk] Result of batch 14:
## INFO  [16:32:17.745] [bbotk]     cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:17.745] [bbotk]  1e-04       14   0.8217636        0      0            0.004
## INFO  [16:32:17.745] [bbotk]                                 uhash
## INFO  [16:32:17.745] [bbotk]  3755fe90-d152-47a4-99a2-2969eb7b847b
## INFO  [16:32:17.746] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:17.751] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:17.754] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:17.761] [mlr3] Finished benchmark
## INFO  [16:32:17.771] [bbotk] Result of batch 15:
## INFO  [16:32:17.772] [bbotk]   cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:17.772] [bbotk]  0.1       20   0.7332708        0      0            0.003
## INFO  [16:32:17.772] [bbotk]                                 uhash
## INFO  [16:32:17.772] [bbotk]  1d8e54df-fc16-4e47-9b9c-f8dfbb30733e
## INFO  [16:32:17.773] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:17.778] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:17.781] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:17.788] [mlr3] Finished benchmark
## INFO  [16:32:17.798] [bbotk] Result of batch 16:
## INFO  [16:32:17.799] [bbotk]     cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:17.799] [bbotk]  1e-04       10   0.8273921        0      0            0.005
## INFO  [16:32:17.799] [bbotk]                                 uhash
## INFO  [16:32:17.799] [bbotk]  80922092-0e5f-4bcf-aa93-200f4b701e41
## INFO  [16:32:17.800] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:17.805] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:17.807] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:17.815] [mlr3] Finished benchmark
## INFO  [16:32:17.825] [bbotk] Result of batch 17:
## INFO  [16:32:17.825] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:17.825] [bbotk]  0.0334        6   0.8005003        0      0            0.003
## INFO  [16:32:17.825] [bbotk]                                 uhash
## INFO  [16:32:17.825] [bbotk]  fd8b535d-94d9-4bba-9609-41057f3544e2
## INFO  [16:32:17.826] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:17.831] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:17.833] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:17.840] [mlr3] Finished benchmark
## INFO  [16:32:17.851] [bbotk] Result of batch 18:
## INFO  [16:32:17.851] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:17.851] [bbotk]  0.0778        4   0.7332708        0      0            0.004
## INFO  [16:32:17.851] [bbotk]                                 uhash
## INFO  [16:32:17.851] [bbotk]  cf13d82a-c1cc-47fb-89ff-27dea7301e67
## INFO  [16:32:17.852] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:17.857] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:17.860] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:17.867] [mlr3] Finished benchmark
## INFO  [16:32:17.877] [bbotk] Result of batch 19:
## INFO  [16:32:17.884] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:17.884] [bbotk]  0.0112       16   0.7776735        0      0            0.003
## INFO  [16:32:17.884] [bbotk]                                 uhash
## INFO  [16:32:17.884] [bbotk]  bb972c84-1a96-40e3-818c-ce7465d7612f
## INFO  [16:32:17.885] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:17.891] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:17.894] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:17.901] [mlr3] Finished benchmark
## INFO  [16:32:17.911] [bbotk] Result of batch 20:
## INFO  [16:32:17.912] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:17.912] [bbotk]  0.0445       20   0.7332708        0      0            0.003
## INFO  [16:32:17.912] [bbotk]                                 uhash
## INFO  [16:32:17.912] [bbotk]  78a8888a-82f8-4834-b8f9-f1adae45242b
## INFO  [16:32:17.912] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:17.917] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:17.920] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:17.927] [mlr3] Finished benchmark
## INFO  [16:32:17.937] [bbotk] Result of batch 21:
## INFO  [16:32:17.938] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:17.938] [bbotk]  0.0556        8   0.7332708        0      0            0.004
## INFO  [16:32:17.938] [bbotk]                                 uhash
## INFO  [16:32:17.938] [bbotk]  31b94355-8d7a-44b3-b917-cebc7231c8af
## INFO  [16:32:17.939] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:17.944] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:17.946] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:17.953] [mlr3] Finished benchmark
## INFO  [16:32:17.964] [bbotk] Result of batch 22:
## INFO  [16:32:17.964] [bbotk]   cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:17.964] [bbotk]  0.1       10   0.7332708        0      0            0.005
## INFO  [16:32:17.964] [bbotk]                                 uhash
## INFO  [16:32:17.964] [bbotk]  05b34e4e-b695-4852-92e6-cce50d13c6db
## INFO  [16:32:17.965] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:17.970] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:17.972] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:17.979] [mlr3] Finished benchmark
## INFO  [16:32:17.990] [bbotk] Result of batch 23:
## INFO  [16:32:17.990] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:17.990] [bbotk]  0.0667       14   0.7332708        0      0            0.004
## INFO  [16:32:17.990] [bbotk]                                 uhash
## INFO  [16:32:17.990] [bbotk]  ecec8fe0-2c3d-414d-9077-40f984a822ea
## INFO  [16:32:17.991] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:17.996] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:17.999] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:18.006] [mlr3] Finished benchmark
## INFO  [16:32:18.016] [bbotk] Result of batch 24:
## INFO  [16:32:18.017] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:18.017] [bbotk]  0.0667       12   0.7332708        0      0            0.003
## INFO  [16:32:18.017] [bbotk]                                 uhash
## INFO  [16:32:18.017] [bbotk]  88ef6fe3-6d11-4be4-866f-f4a2b6728a5a
## INFO  [16:32:18.017] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:18.022] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:18.025] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:18.032] [mlr3] Finished benchmark
## INFO  [16:32:18.043] [bbotk] Result of batch 25:
## INFO  [16:32:18.043] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:18.043] [bbotk]  0.0223       14   0.7836148        0      0            0.005
## INFO  [16:32:18.043] [bbotk]                                 uhash
## INFO  [16:32:18.043] [bbotk]  8a0a881c-4973-42b1-8b52-6a4784fd011d
## INFO  [16:32:18.044] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:18.049] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:18.051] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:18.059] [mlr3] Finished benchmark
## INFO  [16:32:18.069] [bbotk] Result of batch 26:
## INFO  [16:32:18.070] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:18.070] [bbotk]  0.0112       14   0.7964353        0      0            0.004
## INFO  [16:32:18.070] [bbotk]                                 uhash
## INFO  [16:32:18.070] [bbotk]  83b71321-8ad3-462e-967f-75216cf851f4
## INFO  [16:32:18.070] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:18.075] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:18.078] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:18.085] [mlr3] Finished benchmark
## INFO  [16:32:18.103] [bbotk] Result of batch 27:
## INFO  [16:32:18.103] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:18.103] [bbotk]  0.0556        2   0.7332708        0      0            0.004
## INFO  [16:32:18.103] [bbotk]                                 uhash
## INFO  [16:32:18.103] [bbotk]  e256c4f8-a959-4dad-9389-08bf737690cd
## INFO  [16:32:18.104] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:18.109] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:18.111] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:18.119] [mlr3] Finished benchmark
## INFO  [16:32:18.129] [bbotk] Result of batch 28:
## INFO  [16:32:18.129] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:18.129] [bbotk]  0.0778       14   0.7332708        0      0            0.003
## INFO  [16:32:18.129] [bbotk]                                 uhash
## INFO  [16:32:18.129] [bbotk]  dc667c6b-3a4d-44ac-ba3b-fbc67e830765
## INFO  [16:32:18.130] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:18.135] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:18.137] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:18.144] [mlr3] Finished benchmark
## INFO  [16:32:18.155] [bbotk] Result of batch 29:
## INFO  [16:32:18.155] [bbotk]   cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:18.155] [bbotk]  0.1       18   0.7332708        0      0            0.005
## INFO  [16:32:18.155] [bbotk]                                 uhash
## INFO  [16:32:18.155] [bbotk]  b692f0a2-8751-4732-b195-0b75a8f41376
## INFO  [16:32:18.156] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:18.161] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:18.163] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:18.170] [mlr3] Finished benchmark
## INFO  [16:32:18.182] [bbotk] Result of batch 30:
## INFO  [16:32:18.182] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:18.182] [bbotk]  0.0223        4   0.7836148        0      0            0.004
## INFO  [16:32:18.182] [bbotk]                                 uhash
## INFO  [16:32:18.182] [bbotk]  8b923acb-8514-4940-a9a8-ed9681df0cce
## INFO  [16:32:18.183] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:18.188] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:18.191] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:18.198] [mlr3] Finished benchmark
## INFO  [16:32:18.209] [bbotk] Result of batch 31:
## INFO  [16:32:18.210] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:18.210] [bbotk]  0.0889       10   0.7332708        0      0            0.003
## INFO  [16:32:18.210] [bbotk]                                 uhash
## INFO  [16:32:18.210] [bbotk]  fab96e68-c9f0-43ec-9d52-6a145eb5ef77
## INFO  [16:32:18.210] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:18.215] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:18.218] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:18.225] [mlr3] Finished benchmark
## INFO  [16:32:18.236] [bbotk] Result of batch 32:
## INFO  [16:32:18.237] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:18.237] [bbotk]  0.0223       20   0.7836148        0      0            0.005
## INFO  [16:32:18.237] [bbotk]                                 uhash
## INFO  [16:32:18.237] [bbotk]  a1fcb8d3-37dc-4550-858e-8f9c81381b49
## INFO  [16:32:18.237] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:18.243] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:18.245] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:18.252] [mlr3] Finished benchmark
## INFO  [16:32:18.264] [bbotk] Result of batch 33:
## INFO  [16:32:18.264] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:18.264] [bbotk]  0.0112        6   0.7595372        0      0            0.005
## INFO  [16:32:18.264] [bbotk]                                 uhash
## INFO  [16:32:18.264] [bbotk]  b9d9a83a-f466-472c-b145-b0e5e2d85376
## INFO  [16:32:18.265] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:18.270] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:18.272] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:18.279] [mlr3] Finished benchmark
## INFO  [16:32:18.291] [bbotk] Result of batch 34:
## INFO  [16:32:18.292] [bbotk]   cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:18.292] [bbotk]  0.1       12   0.7332708        0      0            0.004
## INFO  [16:32:18.292] [bbotk]                                 uhash
## INFO  [16:32:18.292] [bbotk]  30fb1755-7338-4db6-9303-9d6f0fc52361
## INFO  [16:32:18.292] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:18.297] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:18.300] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:18.307] [mlr3] Finished benchmark
## INFO  [16:32:18.326] [bbotk] Result of batch 35:
## INFO  [16:32:18.326] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:18.326] [bbotk]  0.0667        6   0.7332708        0      0            0.004
## INFO  [16:32:18.326] [bbotk]                                 uhash
## INFO  [16:32:18.326] [bbotk]  6ab82843-d6e7-41ca-9cd6-b4b87e5b49f6
## INFO  [16:32:18.327] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:18.332] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:18.335] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:18.342] [mlr3] Finished benchmark
## INFO  [16:32:18.353] [bbotk] Result of batch 36:
## INFO  [16:32:18.354] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:18.354] [bbotk]  0.0223        2   0.7836148        0      0            0.004
## INFO  [16:32:18.354] [bbotk]                                 uhash
## INFO  [16:32:18.354] [bbotk]  e02d90a0-b028-4221-8689-2cc13db117be
## INFO  [16:32:18.354] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:18.360] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:18.362] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:18.369] [mlr3] Finished benchmark
## INFO  [16:32:18.380] [bbotk] Result of batch 37:
## INFO  [16:32:18.381] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:18.381] [bbotk]  0.0667       18   0.7332708        0      0            0.005
## INFO  [16:32:18.381] [bbotk]                                 uhash
## INFO  [16:32:18.381] [bbotk]  7f93c2fe-4dcb-4f74-97aa-df30d83e9476
## INFO  [16:32:18.382] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:18.387] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:18.389] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:18.397] [mlr3] Finished benchmark
## INFO  [16:32:18.408] [bbotk] Result of batch 38:
## INFO  [16:32:18.409] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:18.409] [bbotk]  0.0112       10   0.7914321        0      0            0.004
## INFO  [16:32:18.409] [bbotk]                                 uhash
## INFO  [16:32:18.409] [bbotk]  b62ccfe6-a581-49e8-8652-35f8863d8a9d
## INFO  [16:32:18.409] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:18.414] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:18.417] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:18.424] [mlr3] Finished benchmark
## INFO  [16:32:18.436] [bbotk] Result of batch 39:
## INFO  [16:32:18.436] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:18.436] [bbotk]  0.0667        2   0.7332708        0      0            0.004
## INFO  [16:32:18.436] [bbotk]                                 uhash
## INFO  [16:32:18.436] [bbotk]  5cbd835d-739d-419f-bdb2-dd29da9c2fcb
## INFO  [16:32:18.437] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:18.442] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:18.444] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:18.452] [mlr3] Finished benchmark
## INFO  [16:32:18.463] [bbotk] Result of batch 40:
## INFO  [16:32:18.464] [bbotk]     cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:18.464] [bbotk]  1e-04        4   0.8430269        0      0            0.005
## INFO  [16:32:18.464] [bbotk]                                 uhash
## INFO  [16:32:18.464] [bbotk]  7a673a0d-2b77-4a0a-a505-a5691b804867
## INFO  [16:32:18.465] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:18.470] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:18.472] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:18.480] [mlr3] Finished benchmark
## INFO  [16:32:18.491] [bbotk] Result of batch 41:
## INFO  [16:32:18.491] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:18.491] [bbotk]  0.0112       18   0.7836148        0      0            0.004
## INFO  [16:32:18.491] [bbotk]                                 uhash
## INFO  [16:32:18.491] [bbotk]  0542df9e-3b94-43cb-bcd8-215b1525a8e4
## INFO  [16:32:18.492] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:18.497] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:18.500] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:18.507] [mlr3] Finished benchmark
## INFO  [16:32:18.518] [bbotk] Result of batch 42:
## INFO  [16:32:18.519] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:18.519] [bbotk]  0.0445        6   0.7332708        0      0            0.003
## INFO  [16:32:18.519] [bbotk]                                 uhash
## INFO  [16:32:18.519] [bbotk]  ab544608-7886-45dd-ac19-c4a124680490
## INFO  [16:32:18.519] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:18.524] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:18.527] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:18.542] [mlr3] Finished benchmark
## INFO  [16:32:18.552] [bbotk] Result of batch 43:
## INFO  [16:32:18.553] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:18.553] [bbotk]  0.0778        6   0.7332708        0      0            0.004
## INFO  [16:32:18.553] [bbotk]                                 uhash
## INFO  [16:32:18.553] [bbotk]  4a167ca3-9677-4c35-b39e-fd19b781e97c
## INFO  [16:32:18.554] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:18.559] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:18.561] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:18.568] [mlr3] Finished benchmark
## INFO  [16:32:18.578] [bbotk] Result of batch 44:
## INFO  [16:32:18.579] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:18.579] [bbotk]  0.0889        6   0.7332708        0      0            0.004
## INFO  [16:32:18.579] [bbotk]                                 uhash
## INFO  [16:32:18.579] [bbotk]  e35f5482-9342-40b3-b3f6-ec4edd62bb1f
## INFO  [16:32:18.580] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:18.585] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:18.587] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:18.594] [mlr3] Finished benchmark
## INFO  [16:32:18.605] [bbotk] Result of batch 45:
## INFO  [16:32:18.605] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:18.605] [bbotk]  0.0889       18   0.7332708        0      0            0.004
## INFO  [16:32:18.605] [bbotk]                                 uhash
## INFO  [16:32:18.605] [bbotk]  1503283b-16f2-4224-aaeb-923761a4f839
## INFO  [16:32:18.606] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:18.611] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:18.613] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:18.620] [mlr3] Finished benchmark
## INFO  [16:32:18.631] [bbotk] Result of batch 46:
## INFO  [16:32:18.632] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:18.632] [bbotk]  0.0445       14   0.7332708        0      0            0.005
## INFO  [16:32:18.632] [bbotk]                                 uhash
## INFO  [16:32:18.632] [bbotk]  086fd21a-3f11-4053-876c-b55092297c9e
## INFO  [16:32:18.632] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:18.637] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:18.640] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:18.647] [mlr3] Finished benchmark
## INFO  [16:32:18.658] [bbotk] Result of batch 47:
## INFO  [16:32:18.658] [bbotk]   cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:18.658] [bbotk]  0.1        2   0.7332708        0      0            0.005
## INFO  [16:32:18.658] [bbotk]                                 uhash
## INFO  [16:32:18.658] [bbotk]  e1de4b72-a496-40a9-bb45-ef1a99a5d137
## INFO  [16:32:18.659] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:18.664] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:18.666] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:18.674] [mlr3] Finished benchmark
## INFO  [16:32:18.685] [bbotk] Result of batch 48:
## INFO  [16:32:18.686] [bbotk]     cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:18.686] [bbotk]  1e-04        8   0.7954972        0      0            0.004
## INFO  [16:32:18.686] [bbotk]                                 uhash
## INFO  [16:32:18.686] [bbotk]  3ba39547-6fb2-4497-9d21-5c86bbb098df
## INFO  [16:32:18.686] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:18.691] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:18.694] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:18.701] [mlr3] Finished benchmark
## INFO  [16:32:18.712] [bbotk] Result of batch 49:
## INFO  [16:32:18.713] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:18.713] [bbotk]  0.0223        6   0.7836148        0      0            0.005
## INFO  [16:32:18.713] [bbotk]                                 uhash
## INFO  [16:32:18.713] [bbotk]  3c2f81de-c6da-4632-972a-34448c5cd92a
## INFO  [16:32:18.713] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:18.719] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:18.721] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:18.729] [mlr3] Finished benchmark
## INFO  [16:32:18.740] [bbotk] Result of batch 50:
## INFO  [16:32:18.741] [bbotk]     cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:18.741] [bbotk]  1e-04        6   0.8217636        0      0            0.004
## INFO  [16:32:18.741] [bbotk]                                 uhash
## INFO  [16:32:18.741] [bbotk]  117ed929-b0e4-43d2-9d23-860c25f8f75d
## INFO  [16:32:18.743] [bbotk] Finished optimizing after 50 evaluation(s)
## INFO  [16:32:18.749] [bbotk] Result:
## INFO  [16:32:18.750] [bbotk]     cp minsplit learner_param_vals  x_domain classif.auc
## INFO  [16:32:18.750] [bbotk]  1e-04        4          <list[3]> <list[2]>   0.8430269
## INFO  [16:32:18.767] [mlr3] Applying learner 'classif.rpart.tuned' on task 'pe' (iter 2/3)
## INFO  [16:32:18.781] [bbotk] Starting to optimize 2 parameter(s) with '<TunerGridSearch>' and '<TerminatorEvals> [n_evals=50, k=0]'
## INFO  [16:32:18.783] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:18.788] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:18.790] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:18.797] [mlr3] Finished benchmark
## INFO  [16:32:18.807] [bbotk] Result of batch 1:
## INFO  [16:32:18.807] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:18.807] [bbotk]  0.0667        8   0.6039003        0      0            0.005
## INFO  [16:32:18.807] [bbotk]                                 uhash
## INFO  [16:32:18.807] [bbotk]  9c43268e-67e7-4789-abd8-bd2ee3b160d1
## INFO  [16:32:18.808] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:18.813] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:18.815] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:18.822] [mlr3] Finished benchmark
## INFO  [16:32:18.833] [bbotk] Result of batch 2:
## INFO  [16:32:18.833] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:18.833] [bbotk]  0.0889       20   0.6039003        0      0            0.005
## INFO  [16:32:18.833] [bbotk]                                 uhash
## INFO  [16:32:18.833] [bbotk]  dc401e5a-c771-453a-89ec-5ecc954ef9a8
## INFO  [16:32:18.834] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:18.839] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:18.841] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:18.848] [mlr3] Finished benchmark
## INFO  [16:32:18.859] [bbotk] Result of batch 3:
## INFO  [16:32:18.860] [bbotk]   cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:18.860] [bbotk]  0.1        4   0.6039003        0      0            0.005
## INFO  [16:32:18.860] [bbotk]                                 uhash
## INFO  [16:32:18.860] [bbotk]  49296064-cba6-4e7e-94a8-e571988b930f
## INFO  [16:32:18.860] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:18.865] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:18.868] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:18.875] [mlr3] Finished benchmark
## INFO  [16:32:18.885] [bbotk] Result of batch 4:
## INFO  [16:32:18.886] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:18.886] [bbotk]  0.0223       14   0.7480818        0      0            0.003
## INFO  [16:32:18.886] [bbotk]                                 uhash
## INFO  [16:32:18.886] [bbotk]  41304673-11a6-48c1-8d8a-827eaee5780f
## INFO  [16:32:18.886] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:18.891] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:18.894] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:18.901] [mlr3] Finished benchmark
## INFO  [16:32:18.911] [bbotk] Result of batch 5:
## INFO  [16:32:18.912] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:18.912] [bbotk]  0.0778        2   0.6039003        0      0            0.004
## INFO  [16:32:18.912] [bbotk]                                 uhash
## INFO  [16:32:18.912] [bbotk]  c872ef16-3ff9-4d2e-9af8-85c09094d89d
## INFO  [16:32:18.913] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:18.918] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:18.920] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:18.928] [mlr3] Finished benchmark
## INFO  [16:32:18.938] [bbotk] Result of batch 6:
## INFO  [16:32:18.939] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:18.939] [bbotk]  0.0112        8   0.8059463        0      0            0.004
## INFO  [16:32:18.939] [bbotk]                                 uhash
## INFO  [16:32:18.939] [bbotk]  453c9450-514f-4629-a191-b88ee7ecc992
## INFO  [16:32:18.939] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:18.944] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:18.947] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:18.962] [mlr3] Finished benchmark
## INFO  [16:32:18.972] [bbotk] Result of batch 7:
## INFO  [16:32:18.972] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:18.972] [bbotk]  0.0445        2   0.7410486        0      0            0.012
## INFO  [16:32:18.972] [bbotk]                                 uhash
## INFO  [16:32:18.972] [bbotk]  6ae6a655-a8b8-496a-9c63-0806ead83bee
## INFO  [16:32:18.973] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:18.978] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:18.980] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:18.988] [mlr3] Finished benchmark
## INFO  [16:32:18.998] [bbotk] Result of batch 8:
## INFO  [16:32:18.999] [bbotk]     cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:18.999] [bbotk]  1e-04        6   0.8059463        0      0            0.004
## INFO  [16:32:18.999] [bbotk]                                 uhash
## INFO  [16:32:18.999] [bbotk]  814c9ea9-3a14-4416-b9b7-e2702231a798
## INFO  [16:32:18.999] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:19.004] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:19.007] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:19.014] [mlr3] Finished benchmark
## INFO  [16:32:19.024] [bbotk] Result of batch 9:
## INFO  [16:32:19.024] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:19.024] [bbotk]  0.0889       10   0.6039003        0      0            0.003
## INFO  [16:32:19.024] [bbotk]                                 uhash
## INFO  [16:32:19.024] [bbotk]  70ac17ac-99a6-4812-b218-e4679a81b1c0
## INFO  [16:32:19.025] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:19.030] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:19.032] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:19.039] [mlr3] Finished benchmark
## INFO  [16:32:19.050] [bbotk] Result of batch 10:
## INFO  [16:32:19.051] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:19.051] [bbotk]  0.0223        4   0.7480818        0      0            0.005
## INFO  [16:32:19.051] [bbotk]                                 uhash
## INFO  [16:32:19.051] [bbotk]  eb885e7a-b016-428c-89f3-b7d5ea75fa23
## INFO  [16:32:19.051] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:19.056] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:19.059] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:19.066] [mlr3] Finished benchmark
## INFO  [16:32:19.077] [bbotk] Result of batch 11:
## INFO  [16:32:19.078] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:19.078] [bbotk]  0.0223       12   0.7480818        0      0            0.005
## INFO  [16:32:19.078] [bbotk]                                 uhash
## INFO  [16:32:19.078] [bbotk]  a5b5dfc7-63c3-47f3-a0f5-d6fa757822bb
## INFO  [16:32:19.079] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:19.084] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:19.086] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:19.093] [mlr3] Finished benchmark
## INFO  [16:32:19.104] [bbotk] Result of batch 12:
## INFO  [16:32:19.105] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:19.105] [bbotk]  0.0667        2   0.6039003        0      0            0.005
## INFO  [16:32:19.105] [bbotk]                                 uhash
## INFO  [16:32:19.105] [bbotk]  d148b2e7-ff7f-481d-87c6-a82b37bf8145
## INFO  [16:32:19.105] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:19.110] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:19.113] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:19.120] [mlr3] Finished benchmark
## INFO  [16:32:19.130] [bbotk] Result of batch 13:
## INFO  [16:32:19.131] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:19.131] [bbotk]  0.0445       20   0.7410486        0      0            0.004
## INFO  [16:32:19.131] [bbotk]                                 uhash
## INFO  [16:32:19.131] [bbotk]  f8d060c1-45bd-4904-933c-c51c730a02a4
## INFO  [16:32:19.132] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:19.137] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:19.139] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:19.147] [mlr3] Finished benchmark
## INFO  [16:32:19.157] [bbotk] Result of batch 14:
## INFO  [16:32:19.158] [bbotk]     cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:19.158] [bbotk]  1e-04       10   0.7880435        0      0            0.004
## INFO  [16:32:19.158] [bbotk]                                 uhash
## INFO  [16:32:19.158] [bbotk]  16ed89f0-c9b6-4408-8b33-a37364811ce0
## INFO  [16:32:19.159] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:19.172] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:19.174] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:19.181] [mlr3] Finished benchmark
## INFO  [16:32:19.191] [bbotk] Result of batch 15:
## INFO  [16:32:19.192] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:19.192] [bbotk]  0.0334        2   0.7410486        0      0            0.005
## INFO  [16:32:19.192] [bbotk]                                 uhash
## INFO  [16:32:19.192] [bbotk]  6058d536-da14-4e6b-8726-8aa88633ca5d
## INFO  [16:32:19.193] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:19.198] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:19.200] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:19.207] [mlr3] Finished benchmark
## INFO  [16:32:19.217] [bbotk] Result of batch 16:
## INFO  [16:32:19.218] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:19.218] [bbotk]  0.0445       18   0.7410486        0      0            0.005
## INFO  [16:32:19.218] [bbotk]                                 uhash
## INFO  [16:32:19.218] [bbotk]  dc0bd4b3-154f-470c-8eae-4ec97aff366e
## INFO  [16:32:19.219] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:19.224] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:19.226] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:19.233] [mlr3] Finished benchmark
## INFO  [16:32:19.244] [bbotk] Result of batch 17:
## INFO  [16:32:19.244] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:19.244] [bbotk]  0.0223        8   0.7480818        0      0            0.005
## INFO  [16:32:19.244] [bbotk]                                 uhash
## INFO  [16:32:19.244] [bbotk]  cc7f0b74-2f01-4ffe-8bfb-55dd20a1bf04
## INFO  [16:32:19.245] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:19.250] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:19.252] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:19.260] [mlr3] Finished benchmark
## INFO  [16:32:19.270] [bbotk] Result of batch 18:
## INFO  [16:32:19.271] [bbotk]   cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:19.271] [bbotk]  0.1        2   0.6039003        0      0            0.003
## INFO  [16:32:19.271] [bbotk]                                 uhash
## INFO  [16:32:19.271] [bbotk]  daeb7061-f75b-41d3-a3a2-e742dfc33585
## INFO  [16:32:19.271] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:19.277] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:19.279] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:19.286] [mlr3] Finished benchmark
## INFO  [16:32:19.297] [bbotk] Result of batch 19:
## INFO  [16:32:19.297] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:19.297] [bbotk]  0.0334        4   0.7410486        0      0            0.005
## INFO  [16:32:19.297] [bbotk]                                 uhash
## INFO  [16:32:19.297] [bbotk]  d03eb24b-9926-4b01-acdd-3ab9180568bf
## INFO  [16:32:19.298] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:19.303] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:19.306] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:19.313] [mlr3] Finished benchmark
## INFO  [16:32:19.323] [bbotk] Result of batch 20:
## INFO  [16:32:19.324] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:19.324] [bbotk]  0.0556       18   0.6039003        0      0            0.003
## INFO  [16:32:19.324] [bbotk]                                 uhash
## INFO  [16:32:19.324] [bbotk]  f1e9bbc7-a769-4916-8330-44400cec6307
## INFO  [16:32:19.324] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:19.329] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:19.332] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:19.339] [mlr3] Finished benchmark
## INFO  [16:32:19.349] [bbotk] Result of batch 21:
## INFO  [16:32:19.350] [bbotk]   cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:19.350] [bbotk]  0.1        6   0.6039003        0      0            0.003
## INFO  [16:32:19.350] [bbotk]                                 uhash
## INFO  [16:32:19.350] [bbotk]  6f36fbd0-7ae4-421a-9f06-fd1a365d50d7
## INFO  [16:32:19.350] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:19.355] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:19.358] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:19.365] [mlr3] Finished benchmark
## INFO  [16:32:19.383] [bbotk] Result of batch 22:
## INFO  [16:32:19.384] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:19.384] [bbotk]  0.0556       12   0.6039003        0      0            0.005
## INFO  [16:32:19.384] [bbotk]                                 uhash
## INFO  [16:32:19.384] [bbotk]  69125903-2395-4d99-b997-7c2530507274
## INFO  [16:32:19.385] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:19.390] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:19.392] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:19.399] [mlr3] Finished benchmark
## INFO  [16:32:19.409] [bbotk] Result of batch 23:
## INFO  [16:32:19.410] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:19.410] [bbotk]  0.0334       16   0.7410486        0      0            0.005
## INFO  [16:32:19.410] [bbotk]                                 uhash
## INFO  [16:32:19.410] [bbotk]  492615dc-c1ae-49c6-a2a1-cf6c909dec8b
## INFO  [16:32:19.411] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:19.416] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:19.418] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:19.425] [mlr3] Finished benchmark
## INFO  [16:32:19.435] [bbotk] Result of batch 24:
## INFO  [16:32:19.436] [bbotk]   cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:19.436] [bbotk]  0.1       14   0.6039003        0      0            0.004
## INFO  [16:32:19.436] [bbotk]                                 uhash
## INFO  [16:32:19.436] [bbotk]  02ef5348-8d3a-4a2c-90a5-a6a9296e1036
## INFO  [16:32:19.436] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:19.442] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:19.444] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:19.451] [mlr3] Finished benchmark
## INFO  [16:32:19.461] [bbotk] Result of batch 25:
## INFO  [16:32:19.462] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:19.462] [bbotk]  0.0778       16   0.6039003        0      0            0.005
## INFO  [16:32:19.462] [bbotk]                                 uhash
## INFO  [16:32:19.462] [bbotk]  be8df102-9244-41ad-bea1-7075745b1e07
## INFO  [16:32:19.463] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:19.468] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:19.470] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:19.477] [mlr3] Finished benchmark
## INFO  [16:32:19.488] [bbotk] Result of batch 26:
## INFO  [16:32:19.489] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:19.489] [bbotk]  0.0778       14   0.6039003        0      0            0.005
## INFO  [16:32:19.489] [bbotk]                                 uhash
## INFO  [16:32:19.489] [bbotk]  e9e1d0ca-d933-4178-a3ea-36300310e115
## INFO  [16:32:19.489] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:19.494] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:19.497] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:19.504] [mlr3] Finished benchmark
## INFO  [16:32:19.515] [bbotk] Result of batch 27:
## INFO  [16:32:19.516] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:19.516] [bbotk]  0.0223       10   0.7480818        0      0            0.005
## INFO  [16:32:19.516] [bbotk]                                 uhash
## INFO  [16:32:19.516] [bbotk]  2f69515a-0212-4351-b5a0-9f7122e56699
## INFO  [16:32:19.517] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:19.522] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:19.524] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:19.532] [mlr3] Finished benchmark
## INFO  [16:32:19.543] [bbotk] Result of batch 28:
## INFO  [16:32:19.543] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:19.543] [bbotk]  0.0334       14   0.7410486        0      0            0.003
## INFO  [16:32:19.543] [bbotk]                                 uhash
## INFO  [16:32:19.543] [bbotk]  837facc4-5e30-43ef-8d05-b5d80d75623a
## INFO  [16:32:19.544] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:19.549] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:19.551] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:19.558] [mlr3] Finished benchmark
## INFO  [16:32:19.569] [bbotk] Result of batch 29:
## INFO  [16:32:19.570] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:19.570] [bbotk]  0.0334       20   0.7410486        0      0            0.005
## INFO  [16:32:19.570] [bbotk]                                 uhash
## INFO  [16:32:19.570] [bbotk]  0c1d0636-c6b1-4e43-bf92-a0ab7faf730c
## INFO  [16:32:19.571] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:19.576] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:19.586] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:19.594] [mlr3] Finished benchmark
## INFO  [16:32:19.605] [bbotk] Result of batch 30:
## INFO  [16:32:19.606] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:19.606] [bbotk]  0.0556       14   0.6039003        0      0            0.005
## INFO  [16:32:19.606] [bbotk]                                 uhash
## INFO  [16:32:19.606] [bbotk]  b4e2c0cd-8ce8-4d74-bc13-c46ecbf23acd
## INFO  [16:32:19.606] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:19.611] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:19.614] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:19.621] [mlr3] Finished benchmark
## INFO  [16:32:19.631] [bbotk] Result of batch 31:
## INFO  [16:32:19.632] [bbotk]   cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:19.632] [bbotk]  0.1       12   0.6039003        0      0            0.003
## INFO  [16:32:19.632] [bbotk]                                 uhash
## INFO  [16:32:19.632] [bbotk]  77446d57-c8df-4aca-85a6-dca2898fa6e4
## INFO  [16:32:19.632] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:19.638] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:19.640] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:19.647] [mlr3] Finished benchmark
## INFO  [16:32:19.658] [bbotk] Result of batch 32:
## INFO  [16:32:19.658] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:19.658] [bbotk]  0.0223        6   0.7480818        0      0            0.005
## INFO  [16:32:19.658] [bbotk]                                 uhash
## INFO  [16:32:19.658] [bbotk]  82ab6014-4bc9-44c9-b0e5-e2ee79efed46
## INFO  [16:32:19.659] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:19.664] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:19.667] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:19.674] [mlr3] Finished benchmark
## INFO  [16:32:19.684] [bbotk] Result of batch 33:
## INFO  [16:32:19.685] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:19.685] [bbotk]  0.0889        4   0.6039003        0      0            0.003
## INFO  [16:32:19.685] [bbotk]                                 uhash
## INFO  [16:32:19.685] [bbotk]  6b21dd55-1667-4643-8c2f-1b7fda070499
## INFO  [16:32:19.685] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:19.690] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:19.693] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:19.700] [mlr3] Finished benchmark
## INFO  [16:32:19.711] [bbotk] Result of batch 34:
## INFO  [16:32:19.712] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:19.712] [bbotk]  0.0112       18   0.7928389        0      0            0.004
## INFO  [16:32:19.712] [bbotk]                                 uhash
## INFO  [16:32:19.712] [bbotk]  1cfcf770-2efe-4771-8521-fa525dba1fbe
## INFO  [16:32:19.713] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:19.718] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:19.720] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:19.727] [mlr3] Finished benchmark
## INFO  [16:32:19.738] [bbotk] Result of batch 35:
## INFO  [16:32:19.739] [bbotk]   cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:19.739] [bbotk]  0.1       20   0.6039003        0      0            0.005
## INFO  [16:32:19.739] [bbotk]                                 uhash
## INFO  [16:32:19.739] [bbotk]  9a8eafca-5842-4994-bd54-bccc80fb9218
## INFO  [16:32:19.739] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:19.745] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:19.747] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:19.755] [mlr3] Finished benchmark
## INFO  [16:32:19.765] [bbotk] Result of batch 36:
## INFO  [16:32:19.766] [bbotk]     cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:19.766] [bbotk]  1e-04       14   0.8200128        0      0            0.004
## INFO  [16:32:19.766] [bbotk]                                 uhash
## INFO  [16:32:19.766] [bbotk]  2c15e870-125b-4bfd-a2c5-41c19a867929
## INFO  [16:32:19.767] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:19.772] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:19.774] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:19.781] [mlr3] Finished benchmark
## INFO  [16:32:19.801] [bbotk] Result of batch 37:
## INFO  [16:32:19.801] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:19.801] [bbotk]  0.0445        4   0.7410486        0      0            0.005
## INFO  [16:32:19.801] [bbotk]                                 uhash
## INFO  [16:32:19.801] [bbotk]  55423b28-f2b0-4169-9955-cc15be5bd5dc
## INFO  [16:32:19.802] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:19.807] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:19.810] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:19.817] [mlr3] Finished benchmark
## INFO  [16:32:19.828] [bbotk] Result of batch 38:
## INFO  [16:32:19.828] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:19.828] [bbotk]  0.0112        6   0.7471228        0      0            0.004
## INFO  [16:32:19.828] [bbotk]                                 uhash
## INFO  [16:32:19.828] [bbotk]  0d837829-08c0-4fdc-a734-abc746461aa6
## INFO  [16:32:19.829] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:19.834] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:19.837] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:19.844] [mlr3] Finished benchmark
## INFO  [16:32:19.854] [bbotk] Result of batch 39:
## INFO  [16:32:19.855] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:19.855] [bbotk]  0.0889       16   0.6039003        0      0            0.003
## INFO  [16:32:19.855] [bbotk]                                 uhash
## INFO  [16:32:19.855] [bbotk]  932d9609-e10c-4c08-82fa-3544941e5081
## INFO  [16:32:19.855] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:19.860] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:19.863] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:19.870] [mlr3] Finished benchmark
## INFO  [16:32:19.880] [bbotk] Result of batch 40:
## INFO  [16:32:19.881] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:19.881] [bbotk]  0.0889        6   0.6039003        0      0            0.003
## INFO  [16:32:19.881] [bbotk]                                 uhash
## INFO  [16:32:19.881] [bbotk]  3ba3e634-27d4-41f4-8a40-8d4fe766c5ff
## INFO  [16:32:19.881] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:19.886] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:19.889] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:19.896] [mlr3] Finished benchmark
## INFO  [16:32:19.906] [bbotk] Result of batch 41:
## INFO  [16:32:19.907] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:19.907] [bbotk]  0.0556        8   0.6039003        0      0            0.003
## INFO  [16:32:19.907] [bbotk]                                 uhash
## INFO  [16:32:19.907] [bbotk]  c838b543-d4fd-4b21-8265-d8bd09d7263d
## INFO  [16:32:19.908] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:19.913] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:19.916] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:19.923] [mlr3] Finished benchmark
## INFO  [16:32:19.933] [bbotk] Result of batch 42:
## INFO  [16:32:19.934] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:19.934] [bbotk]  0.0112       16   0.8088235        0      0            0.004
## INFO  [16:32:19.934] [bbotk]                                 uhash
## INFO  [16:32:19.934] [bbotk]  e643c86b-86d9-465f-964e-920c3815b584
## INFO  [16:32:19.935] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:19.940] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:19.943] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:19.950] [mlr3] Finished benchmark
## INFO  [16:32:19.960] [bbotk] Result of batch 43:
## INFO  [16:32:19.961] [bbotk]   cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:19.961] [bbotk]  0.1       16   0.6039003        0      0            0.003
## INFO  [16:32:19.961] [bbotk]                                 uhash
## INFO  [16:32:19.961] [bbotk]  0cf64ed1-c7f8-4a1e-a4cc-6e34e67d0543
## INFO  [16:32:19.961] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:19.966] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:19.969] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:19.976] [mlr3] Finished benchmark
## INFO  [16:32:19.986] [bbotk] Result of batch 44:
## INFO  [16:32:19.987] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:19.987] [bbotk]  0.0445        6   0.7410486        0      0            0.004
## INFO  [16:32:19.987] [bbotk]                                 uhash
## INFO  [16:32:19.987] [bbotk]  28022470-af43-4009-ba57-381094211657
## INFO  [16:32:19.988] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:19.993] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:19.995] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:20.010] [mlr3] Finished benchmark
## INFO  [16:32:20.021] [bbotk] Result of batch 45:
## INFO  [16:32:20.021] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:20.021] [bbotk]  0.0778       12   0.6039003        0      0            0.012
## INFO  [16:32:20.021] [bbotk]                                 uhash
## INFO  [16:32:20.021] [bbotk]  8e8e706f-0b64-4e45-8992-69b8a9b185ef
## INFO  [16:32:20.022] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:20.027] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:20.029] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:20.036] [mlr3] Finished benchmark
## INFO  [16:32:20.046] [bbotk] Result of batch 46:
## INFO  [16:32:20.047] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:20.047] [bbotk]  0.0556        4   0.6039003        0      0            0.005
## INFO  [16:32:20.047] [bbotk]                                 uhash
## INFO  [16:32:20.047] [bbotk]  16c603d7-42d1-456b-91d1-23f8e7cae8b7
## INFO  [16:32:20.048] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:20.053] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:20.056] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:20.063] [mlr3] Finished benchmark
## INFO  [16:32:20.073] [bbotk] Result of batch 47:
## INFO  [16:32:20.074] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:20.074] [bbotk]  0.0334       12   0.7410486        0      0            0.003
## INFO  [16:32:20.074] [bbotk]                                 uhash
## INFO  [16:32:20.074] [bbotk]  bd0a0532-6f8c-4fdc-b382-801567ae057b
## INFO  [16:32:20.075] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:20.080] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:20.082] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:20.089] [mlr3] Finished benchmark
## INFO  [16:32:20.100] [bbotk] Result of batch 48:
## INFO  [16:32:20.101] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:20.101] [bbotk]  0.0223       18   0.7480818        0      0            0.005
## INFO  [16:32:20.101] [bbotk]                                 uhash
## INFO  [16:32:20.101] [bbotk]  300c164d-134f-4b3f-87ac-f038f35565ae
## INFO  [16:32:20.101] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:20.106] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:20.109] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:20.116] [mlr3] Finished benchmark
## INFO  [16:32:20.127] [bbotk] Result of batch 49:
## INFO  [16:32:20.127] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:20.127] [bbotk]  0.0667        4   0.6039003        0      0            0.003
## INFO  [16:32:20.127] [bbotk]                                 uhash
## INFO  [16:32:20.127] [bbotk]  43c66ba4-39f1-48d3-aa80-36744d91041d
## INFO  [16:32:20.128] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:20.133] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:20.136] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:20.143] [mlr3] Finished benchmark
## INFO  [16:32:20.154] [bbotk] Result of batch 50:
## INFO  [16:32:20.154] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:20.154] [bbotk]  0.0334       18   0.7410486        0      0            0.003
## INFO  [16:32:20.154] [bbotk]                                 uhash
## INFO  [16:32:20.154] [bbotk]  c4caf492-b812-4568-8e49-a152fbdfbbf2
## INFO  [16:32:20.156] [bbotk] Finished optimizing after 50 evaluation(s)
## INFO  [16:32:20.157] [bbotk] Result:
## INFO  [16:32:20.157] [bbotk]     cp minsplit learner_param_vals  x_domain classif.auc
## INFO  [16:32:20.157] [bbotk]  1e-04       14          <list[3]> <list[2]>   0.8200128
## INFO  [16:32:20.172] [mlr3] Applying learner 'classif.rpart.tuned' on task 'pe' (iter 3/3)
## INFO  [16:32:20.186] [bbotk] Starting to optimize 2 parameter(s) with '<TunerGridSearch>' and '<TerminatorEvals> [n_evals=50, k=0]'
## INFO  [16:32:20.188] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:20.193] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:20.195] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:20.210] [mlr3] Finished benchmark
## INFO  [16:32:20.220] [bbotk] Result of batch 1:
## INFO  [16:32:20.220] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:20.220] [bbotk]  0.0334       18   0.8491515        0      0            0.012
## INFO  [16:32:20.220] [bbotk]                                 uhash
## INFO  [16:32:20.220] [bbotk]  9c03860f-9d05-4b86-b753-4a7478e9fcfb
## INFO  [16:32:20.221] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:20.226] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:20.229] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:20.235] [mlr3] Finished benchmark
## INFO  [16:32:20.246] [bbotk] Result of batch 2:
## INFO  [16:32:20.247] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:20.247] [bbotk]  0.0778       14   0.8189818        0      0            0.003
## INFO  [16:32:20.247] [bbotk]                                 uhash
## INFO  [16:32:20.247] [bbotk]  dc316347-e710-43a2-9712-8b98c09b44c6
## INFO  [16:32:20.247] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:20.252] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:20.255] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:20.262] [mlr3] Finished benchmark
## INFO  [16:32:20.272] [bbotk] Result of batch 3:
## INFO  [16:32:20.273] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:20.273] [bbotk]  0.0778       10   0.8189818        0      0            0.004
## INFO  [16:32:20.273] [bbotk]                                 uhash
## INFO  [16:32:20.273] [bbotk]  01f6f8a5-8743-4d58-9a31-e41ebcfdada0
## INFO  [16:32:20.274] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:20.279] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:20.281] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:20.289] [mlr3] Finished benchmark
## INFO  [16:32:20.300] [bbotk] Result of batch 4:
## INFO  [16:32:20.300] [bbotk]     cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:20.300] [bbotk]  1e-04        4    0.894406        0      0            0.006
## INFO  [16:32:20.300] [bbotk]                                 uhash
## INFO  [16:32:20.300] [bbotk]  1f9e6e09-695e-4da9-a507-d81c48628409
## INFO  [16:32:20.301] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:20.306] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:20.309] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:20.316] [mlr3] Finished benchmark
## INFO  [16:32:20.327] [bbotk] Result of batch 5:
## INFO  [16:32:20.327] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:20.327] [bbotk]  0.0334       14   0.8491515        0      0            0.003
## INFO  [16:32:20.327] [bbotk]                                 uhash
## INFO  [16:32:20.327] [bbotk]  d5683065-5abf-4b83-8858-dc5a1b46af38
## INFO  [16:32:20.328] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:20.333] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:20.336] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:20.343] [mlr3] Finished benchmark
## INFO  [16:32:20.353] [bbotk] Result of batch 6:
## INFO  [16:32:20.354] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:20.354] [bbotk]  0.0778       20   0.8189818        0      0            0.003
## INFO  [16:32:20.354] [bbotk]                                 uhash
## INFO  [16:32:20.354] [bbotk]  00d19f0c-8676-4707-aabb-1194914ab6f5
## INFO  [16:32:20.355] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:20.360] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:20.362] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:20.370] [mlr3] Finished benchmark
## INFO  [16:32:20.380] [bbotk] Result of batch 7:
## INFO  [16:32:20.381] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:20.381] [bbotk]  0.0112       14    0.867379        0      0            0.004
## INFO  [16:32:20.381] [bbotk]                                 uhash
## INFO  [16:32:20.381] [bbotk]  38eee3a2-ac1c-4b72-b62c-82a77a6aa5b4
## INFO  [16:32:20.382] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:20.387] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:20.389] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:20.396] [mlr3] Finished benchmark
## INFO  [16:32:20.407] [bbotk] Result of batch 8:
## INFO  [16:32:20.407] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:20.407] [bbotk]  0.0445        4   0.8258957        0      0            0.005
## INFO  [16:32:20.407] [bbotk]                                 uhash
## INFO  [16:32:20.407] [bbotk]  424c53ab-d251-4bf8-912a-2532ef549d10
## INFO  [16:32:20.408] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:20.421] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:20.423] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:20.431] [mlr3] Finished benchmark
## INFO  [16:32:20.442] [bbotk] Result of batch 9:
## INFO  [16:32:20.443] [bbotk]     cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:20.443] [bbotk]  1e-04        2   0.8664362        0      0            0.005
## INFO  [16:32:20.443] [bbotk]                                 uhash
## INFO  [16:32:20.443] [bbotk]  ae32ae36-2ddd-4602-99f4-330c5f1fd35f
## INFO  [16:32:20.443] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:20.448] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:20.451] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:20.458] [mlr3] Finished benchmark
## INFO  [16:32:20.468] [bbotk] Result of batch 10:
## INFO  [16:32:20.469] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:20.469] [bbotk]  0.0334       10   0.8491515        0      0            0.004
## INFO  [16:32:20.469] [bbotk]                                 uhash
## INFO  [16:32:20.469] [bbotk]  2b3291ca-894f-4eae-a92a-e15058a8d8c4
## INFO  [16:32:20.470] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:20.475] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:20.477] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:20.485] [mlr3] Finished benchmark
## INFO  [16:32:20.495] [bbotk] Result of batch 11:
## INFO  [16:32:20.496] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:20.496] [bbotk]  0.0112        4    0.814582        0      0            0.004
## INFO  [16:32:20.496] [bbotk]                                 uhash
## INFO  [16:32:20.496] [bbotk]  35b7559c-c117-4b2e-bcdd-f1bbd2ed9157
## INFO  [16:32:20.497] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:20.502] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:20.504] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:20.511] [mlr3] Finished benchmark
## INFO  [16:32:20.522] [bbotk] Result of batch 12:
## INFO  [16:32:20.523] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:20.523] [bbotk]  0.0667       12   0.8189818        0      0            0.005
## INFO  [16:32:20.523] [bbotk]                                 uhash
## INFO  [16:32:20.523] [bbotk]  c8b98b40-b140-448f-b151-98a026429845
## INFO  [16:32:20.523] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:20.528] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:20.531] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:20.538] [mlr3] Finished benchmark
## INFO  [16:32:20.548] [bbotk] Result of batch 13:
## INFO  [16:32:20.549] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:20.549] [bbotk]  0.0334       12   0.8491515        0      0            0.004
## INFO  [16:32:20.549] [bbotk]                                 uhash
## INFO  [16:32:20.549] [bbotk]  3e67c245-3381-48fa-9e83-ced3386f8ca7
## INFO  [16:32:20.550] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:20.555] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:20.557] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:20.564] [mlr3] Finished benchmark
## INFO  [16:32:20.575] [bbotk] Result of batch 14:
## INFO  [16:32:20.576] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:20.576] [bbotk]  0.0889        8   0.8189818        0      0            0.004
## INFO  [16:32:20.576] [bbotk]                                 uhash
## INFO  [16:32:20.576] [bbotk]  75036a14-1e55-4209-8553-9bffa447832c
## INFO  [16:32:20.576] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:20.582] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:20.584] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:20.592] [mlr3] Finished benchmark
## INFO  [16:32:20.602] [bbotk] Result of batch 15:
## INFO  [16:32:20.603] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:20.603] [bbotk]  0.0334        2   0.8491515        0      0            0.004
## INFO  [16:32:20.603] [bbotk]                                 uhash
## INFO  [16:32:20.603] [bbotk]  6d073ee9-0fed-4d82-812e-f5d01cb82fa1
## INFO  [16:32:20.603] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:20.609] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:20.611] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:20.627] [mlr3] Finished benchmark
## INFO  [16:32:20.637] [bbotk] Result of batch 16:
## INFO  [16:32:20.638] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:20.638] [bbotk]  0.0556       12   0.8158391        0      0            0.006
## INFO  [16:32:20.638] [bbotk]                                 uhash
## INFO  [16:32:20.638] [bbotk]  9f2c23ed-da7e-4e43-8fa4-42f9d2fb6c7c
## INFO  [16:32:20.638] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:20.643] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:20.646] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:20.653] [mlr3] Finished benchmark
## INFO  [16:32:20.663] [bbotk] Result of batch 17:
## INFO  [16:32:20.664] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:20.664] [bbotk]  0.0889        4   0.8189818        0      0            0.003
## INFO  [16:32:20.664] [bbotk]                                 uhash
## INFO  [16:32:20.664] [bbotk]  e5452583-68a4-4bd5-a9e3-2e7f9f2703aa
## INFO  [16:32:20.665] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:20.670] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:20.672] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:20.679] [mlr3] Finished benchmark
## INFO  [16:32:20.690] [bbotk] Result of batch 18:
## INFO  [16:32:20.691] [bbotk]   cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:20.691] [bbotk]  0.1        2   0.8189818        0      0            0.005
## INFO  [16:32:20.691] [bbotk]                                 uhash
## INFO  [16:32:20.691] [bbotk]  c12da7f2-45cc-4f27-b29a-9fdbc9b1d311
## INFO  [16:32:20.691] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:20.696] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:20.699] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:20.706] [mlr3] Finished benchmark
## INFO  [16:32:20.717] [bbotk] Result of batch 19:
## INFO  [16:32:20.717] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:20.717] [bbotk]  0.0445       14   0.8258957        0      0            0.005
## INFO  [16:32:20.717] [bbotk]                                 uhash
## INFO  [16:32:20.717] [bbotk]  74a98c2b-f675-442c-8347-81f846d02e7b
## INFO  [16:32:20.718] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:20.723] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:20.725] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:20.733] [mlr3] Finished benchmark
## INFO  [16:32:20.743] [bbotk] Result of batch 20:
## INFO  [16:32:20.744] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:20.744] [bbotk]  0.0778       12   0.8189818        0      0            0.003
## INFO  [16:32:20.744] [bbotk]                                 uhash
## INFO  [16:32:20.744] [bbotk]  ecc05ec4-0863-4740-9f55-840ca74c2c28
## INFO  [16:32:20.745] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:20.750] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:20.752] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:20.759] [mlr3] Finished benchmark
## INFO  [16:32:20.770] [bbotk] Result of batch 21:
## INFO  [16:32:20.771] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:20.771] [bbotk]  0.0556       10   0.8158391        0      0            0.005
## INFO  [16:32:20.771] [bbotk]                                 uhash
## INFO  [16:32:20.771] [bbotk]  eef6754d-de40-4d81-81c7-cd49e7cf648b
## INFO  [16:32:20.771] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:20.776] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:20.779] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:20.786] [mlr3] Finished benchmark
## INFO  [16:32:20.796] [bbotk] Result of batch 22:
## INFO  [16:32:20.797] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:20.797] [bbotk]  0.0667       14   0.8189818        0      0            0.004
## INFO  [16:32:20.797] [bbotk]                                 uhash
## INFO  [16:32:20.797] [bbotk]  7f50356a-37c8-4be2-a426-0d913a1a12c3
## INFO  [16:32:20.798] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:20.803] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:20.805] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:20.813] [mlr3] Finished benchmark
## INFO  [16:32:20.831] [bbotk] Result of batch 23:
## INFO  [16:32:20.832] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:20.832] [bbotk]  0.0112       10   0.8299811        0      0            0.004
## INFO  [16:32:20.832] [bbotk]                                 uhash
## INFO  [16:32:20.832] [bbotk]  2aa9c759-426f-40a8-ad8c-9ba22596813b
## INFO  [16:32:20.832] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:20.837] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:20.840] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:20.847] [mlr3] Finished benchmark
## INFO  [16:32:20.859] [bbotk] Result of batch 24:
## INFO  [16:32:20.860] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:20.860] [bbotk]  0.0556        2   0.8158391        0      0            0.003
## INFO  [16:32:20.860] [bbotk]                                 uhash
## INFO  [16:32:20.860] [bbotk]  df439af3-c489-46f5-b81b-eb8601d4583c
## INFO  [16:32:20.861] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:20.866] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:20.869] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:20.876] [mlr3] Finished benchmark
## INFO  [16:32:20.887] [bbotk] Result of batch 25:
## INFO  [16:32:20.888] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:20.888] [bbotk]  0.0556       16   0.8158391        0      0            0.003
## INFO  [16:32:20.888] [bbotk]                                 uhash
## INFO  [16:32:20.888] [bbotk]  f49d2dfe-a0a0-42ac-999d-f7e5aeccadac
## INFO  [16:32:20.888] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:20.893] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:20.896] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:20.903] [mlr3] Finished benchmark
## INFO  [16:32:20.913] [bbotk] Result of batch 26:
## INFO  [16:32:20.914] [bbotk]   cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:20.914] [bbotk]  0.1       14   0.8189818        0      0            0.004
## INFO  [16:32:20.914] [bbotk]                                 uhash
## INFO  [16:32:20.914] [bbotk]  a309c7ad-33ad-48c2-84dc-e9c5684d2bcc
## INFO  [16:32:20.914] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:20.919] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:20.922] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:20.929] [mlr3] Finished benchmark
## INFO  [16:32:20.940] [bbotk] Result of batch 27:
## INFO  [16:32:20.941] [bbotk]     cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:20.941] [bbotk]  1e-04        6   0.8554368        0      0            0.005
## INFO  [16:32:20.941] [bbotk]                                 uhash
## INFO  [16:32:20.941] [bbotk]  7392df45-e1cf-454d-9256-3ec82e151b1f
## INFO  [16:32:20.941] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:20.946] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:20.949] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:20.957] [mlr3] Finished benchmark
## INFO  [16:32:20.968] [bbotk] Result of batch 28:
## INFO  [16:32:20.968] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:20.968] [bbotk]  0.0445        6   0.8258957        0      0            0.005
## INFO  [16:32:20.968] [bbotk]                                 uhash
## INFO  [16:32:20.968] [bbotk]  59fcbee0-397a-4462-915e-ed44a8a46af7
## INFO  [16:32:20.969] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:20.974] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:20.977] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:20.984] [mlr3] Finished benchmark
## INFO  [16:32:20.994] [bbotk] Result of batch 29:
## INFO  [16:32:20.995] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:20.995] [bbotk]  0.0778       18   0.8189818        0      0            0.003
## INFO  [16:32:20.995] [bbotk]                                 uhash
## INFO  [16:32:20.995] [bbotk]  d9fdf8ed-38de-4eb4-a057-d2ba117e0c98
## INFO  [16:32:20.995] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:21.000] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:21.003] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:21.010] [mlr3] Finished benchmark
## INFO  [16:32:21.020] [bbotk] Result of batch 30:
## INFO  [16:32:21.021] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:21.021] [bbotk]  0.0556       20   0.8158391        0      0            0.003
## INFO  [16:32:21.021] [bbotk]                                 uhash
## INFO  [16:32:21.021] [bbotk]  719a3b91-205c-43d6-8be2-aea48cff5ddc
## INFO  [16:32:21.021] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:21.027] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:21.037] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:21.045] [mlr3] Finished benchmark
## INFO  [16:32:21.055] [bbotk] Result of batch 31:
## INFO  [16:32:21.056] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:21.056] [bbotk]  0.0334       20   0.8491515        0      0            0.004
## INFO  [16:32:21.056] [bbotk]                                 uhash
## INFO  [16:32:21.056] [bbotk]  df72c547-31ca-4a07-8b9a-90f45fa154f6
## INFO  [16:32:21.057] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:21.062] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:21.064] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:21.071] [mlr3] Finished benchmark
## INFO  [16:32:21.082] [bbotk] Result of batch 32:
## INFO  [16:32:21.082] [bbotk]   cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:21.082] [bbotk]  0.1       12   0.8189818        0      0            0.005
## INFO  [16:32:21.082] [bbotk]                                 uhash
## INFO  [16:32:21.082] [bbotk]  7aaa8a62-263b-453a-a4ed-4238a6401da4
## INFO  [16:32:21.083] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:21.089] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:21.091] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:21.099] [mlr3] Finished benchmark
## INFO  [16:32:21.110] [bbotk] Result of batch 33:
## INFO  [16:32:21.110] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:21.110] [bbotk]  0.0223       20   0.8636078        0      0            0.003
## INFO  [16:32:21.110] [bbotk]                                 uhash
## INFO  [16:32:21.110] [bbotk]  03ac98f3-3b26-4e92-9c88-92eac7be46bc
## INFO  [16:32:21.111] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:21.116] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:21.119] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:21.126] [mlr3] Finished benchmark
## INFO  [16:32:21.136] [bbotk] Result of batch 34:
## INFO  [16:32:21.137] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:21.137] [bbotk]  0.0112        8   0.8299811        0      0            0.005
## INFO  [16:32:21.137] [bbotk]                                 uhash
## INFO  [16:32:21.137] [bbotk]  ac5e4baf-da8a-49d2-bfed-c89c75ec122c
## INFO  [16:32:21.138] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:21.143] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:21.145] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:21.153] [mlr3] Finished benchmark
## INFO  [16:32:21.163] [bbotk] Result of batch 35:
## INFO  [16:32:21.164] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:21.164] [bbotk]  0.0778        6   0.8189818        0      0            0.003
## INFO  [16:32:21.164] [bbotk]                                 uhash
## INFO  [16:32:21.164] [bbotk]  9454e811-9354-4614-9ff7-f00c9d64caee
## INFO  [16:32:21.164] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:21.169] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:21.172] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:21.179] [mlr3] Finished benchmark
## INFO  [16:32:21.189] [bbotk] Result of batch 36:
## INFO  [16:32:21.190] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:21.190] [bbotk]  0.0556        6   0.8158391        0      0            0.004
## INFO  [16:32:21.190] [bbotk]                                 uhash
## INFO  [16:32:21.190] [bbotk]  03c6a609-5e7c-4aeb-a1d2-00099df05ad1
## INFO  [16:32:21.191] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:21.196] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:21.198] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:21.205] [mlr3] Finished benchmark
## INFO  [16:32:21.216] [bbotk] Result of batch 37:
## INFO  [16:32:21.217] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:21.217] [bbotk]  0.0667        6   0.8189818        0      0            0.005
## INFO  [16:32:21.217] [bbotk]                                 uhash
## INFO  [16:32:21.217] [bbotk]  298b3960-2968-42b2-b439-0c88d86c11f9
## INFO  [16:32:21.217] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:21.222] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:21.225] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:21.232] [mlr3] Finished benchmark
## INFO  [16:32:21.250] [bbotk] Result of batch 38:
## INFO  [16:32:21.251] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:21.251] [bbotk]  0.0667       10   0.8189818        0      0            0.005
## INFO  [16:32:21.251] [bbotk]                                 uhash
## INFO  [16:32:21.251] [bbotk]  aaeb5ade-030d-45ce-b25d-101e229d7c17
## INFO  [16:32:21.251] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:21.257] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:21.259] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:21.266] [mlr3] Finished benchmark
## INFO  [16:32:21.277] [bbotk] Result of batch 39:
## INFO  [16:32:21.277] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:21.277] [bbotk]  0.0223       10   0.8636078        0      0            0.005
## INFO  [16:32:21.277] [bbotk]                                 uhash
## INFO  [16:32:21.277] [bbotk]  6f690a45-46f7-40ce-96f2-81fefe589ea5
## INFO  [16:32:21.278] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:21.283] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:21.285] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:21.292] [mlr3] Finished benchmark
## INFO  [16:32:21.303] [bbotk] Result of batch 40:
## INFO  [16:32:21.304] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:21.304] [bbotk]  0.0223       12   0.8636078        0      0            0.004
## INFO  [16:32:21.304] [bbotk]                                 uhash
## INFO  [16:32:21.304] [bbotk]  9a6bd447-7c40-4b0b-920c-465fb06be6e0
## INFO  [16:32:21.304] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:21.309] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:21.312] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:21.319] [mlr3] Finished benchmark
## INFO  [16:32:21.329] [bbotk] Result of batch 41:
## INFO  [16:32:21.330] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:21.330] [bbotk]  0.0889       16   0.8189818        0      0            0.003
## INFO  [16:32:21.330] [bbotk]                                 uhash
## INFO  [16:32:21.330] [bbotk]  46953459-d216-41f1-a08c-3553def55453
## INFO  [16:32:21.331] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:21.336] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:21.338] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:21.346] [mlr3] Finished benchmark
## INFO  [16:32:21.357] [bbotk] Result of batch 42:
## INFO  [16:32:21.358] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:21.358] [bbotk]  0.0778        2   0.8189818        0      0            0.004
## INFO  [16:32:21.358] [bbotk]                                 uhash
## INFO  [16:32:21.358] [bbotk]  e8f65119-a4f4-4f01-86d8-d22577138320
## INFO  [16:32:21.358] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:21.364] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:21.366] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:21.373] [mlr3] Finished benchmark
## INFO  [16:32:21.384] [bbotk] Result of batch 43:
## INFO  [16:32:21.384] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:21.384] [bbotk]  0.0667       20   0.8189818        0      0            0.005
## INFO  [16:32:21.384] [bbotk]                                 uhash
## INFO  [16:32:21.384] [bbotk]  3254df4b-7729-432e-ab10-e121181db196
## INFO  [16:32:21.385] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:21.390] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:21.393] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:21.400] [mlr3] Finished benchmark
## INFO  [16:32:21.410] [bbotk] Result of batch 44:
## INFO  [16:32:21.411] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:21.411] [bbotk]  0.0889        6   0.8189818        0      0            0.003
## INFO  [16:32:21.411] [bbotk]                                 uhash
## INFO  [16:32:21.411] [bbotk]  e70c3deb-f65e-40c9-8112-e396358859f2
## INFO  [16:32:21.411] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:21.416] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:21.419] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:21.426] [mlr3] Finished benchmark
## INFO  [16:32:21.437] [bbotk] Result of batch 45:
## INFO  [16:32:21.437] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:21.437] [bbotk]  0.0223        2   0.8636078        0      0            0.005
## INFO  [16:32:21.437] [bbotk]                                 uhash
## INFO  [16:32:21.437] [bbotk]  b3aa3a9c-1a9c-461d-9815-c1e6eb7ceba5
## INFO  [16:32:21.438] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:21.451] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:21.453] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:21.460] [mlr3] Finished benchmark
## INFO  [16:32:21.471] [bbotk] Result of batch 46:
## INFO  [16:32:21.472] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:21.472] [bbotk]  0.0889       14   0.8189818        0      0            0.005
## INFO  [16:32:21.472] [bbotk]                                 uhash
## INFO  [16:32:21.472] [bbotk]  2026be6c-2227-475e-8e12-a51c0b050f31
## INFO  [16:32:21.472] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:21.478] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:21.480] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:21.487] [mlr3] Finished benchmark
## INFO  [16:32:21.498] [bbotk] Result of batch 47:
## INFO  [16:32:21.499] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:21.499] [bbotk]  0.0334       16   0.8491515        0      0            0.005
## INFO  [16:32:21.499] [bbotk]                                 uhash
## INFO  [16:32:21.499] [bbotk]  a075b5fc-cd3f-42a5-a2a7-7d1f71107208
## INFO  [16:32:21.500] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:21.505] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:21.507] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:21.514] [mlr3] Finished benchmark
## INFO  [16:32:21.525] [bbotk] Result of batch 48:
## INFO  [16:32:21.526] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:21.526] [bbotk]  0.0556       14   0.8158391        0      0            0.005
## INFO  [16:32:21.526] [bbotk]                                 uhash
## INFO  [16:32:21.526] [bbotk]  2939cb17-5378-4944-9db9-8297a615cb6f
## INFO  [16:32:21.526] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:21.532] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:21.534] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:21.541] [mlr3] Finished benchmark
## INFO  [16:32:21.552] [bbotk] Result of batch 49:
## INFO  [16:32:21.553] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:21.553] [bbotk]  0.0889        2   0.8189818        0      0            0.004
## INFO  [16:32:21.553] [bbotk]                                 uhash
## INFO  [16:32:21.553] [bbotk]  490c0fe7-475a-4424-9fbb-bbb63308132c
## INFO  [16:32:21.554] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:21.559] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:21.561] [mlr3] Applying learner 'classif.rpart' on task 'pe' (iter 1/1)
## INFO  [16:32:21.569] [mlr3] Finished benchmark
## INFO  [16:32:21.580] [bbotk] Result of batch 50:
## INFO  [16:32:21.581] [bbotk]      cp minsplit classif.auc warnings errors runtime_learners
## INFO  [16:32:21.581] [bbotk]  0.0112       20   0.8636078        0      0            0.004
## INFO  [16:32:21.581] [bbotk]                                 uhash
## INFO  [16:32:21.581] [bbotk]  bfb4d438-b6a9-4afb-850c-b9691e253646
## INFO  [16:32:21.583] [bbotk] Finished optimizing after 50 evaluation(s)
## INFO  [16:32:21.583] [bbotk] Result:
## INFO  [16:32:21.583] [bbotk]     cp minsplit learner_param_vals  x_domain classif.auc
## INFO  [16:32:21.583] [bbotk]  1e-04        4          <list[3]> <list[2]>    0.894406
## Check the selected parameters across each of the cross-validation folds

##sapply apply a function over a list or vector
sapply(rr_ct$learners,
       function(x) 
        x$param_set$values)
## [[1]]
## named list()
## 
## [[2]]
## named list()
## 
## [[3]]
## named list()
rr_ct$score(measures = measure)
##                 task task_id         learner          learner_id
## 1: <TaskClassif[50]>      pe <AutoTuner[46]> classif.rpart.tuned
## 2: <TaskClassif[50]>      pe <AutoTuner[46]> classif.rpart.tuned
## 3: <TaskClassif[50]>      pe <AutoTuner[46]> classif.rpart.tuned
##            resampling resampling_id iteration              prediction
## 1: <ResamplingCV[20]>            cv         1 <PredictionClassif[20]>
## 2: <ResamplingCV[20]>            cv         2 <PredictionClassif[20]>
## 3: <ResamplingCV[20]>            cv         3 <PredictionClassif[20]>
##    classif.auc
## 1:   0.8176937
## 2:   0.8361128
## 3:   0.7697395
## Check the aggregate performance measure

rr_ct$aggregate(measures = measure)
## classif.auc 
##   0.8078487

Interpretation Note: We get a small improvement here, but not much, and in general, rpart doesn’t improve a lot with tuning. We’ll turn now to some more complex methods, to see if we can improve on these results.

Random Forest

Note: Next, we’ll try to build a random forest for the (Pinus edulis data. The mlr3 package uses a random forest routine from the ranger package that can run on multiple cores. To build this, all we need to do is create a new learner (classif.ranger), and run the hold-out resampling on it:

##Install the ranger package required for the next step
install.packages("ranger")
## Build the new learner and run the hold-out resampling
library(ranger)
lrn_rf = lrn("classif.ranger",
             predict_type = "prob",
             importance = "permutation")

##Run the the holdout resampling
rr = resample(task = task_pe,
              learner = lrn_rf,
              resampling = resamp_hout,
              store_models = TRUE)
## INFO  [16:32:22.018] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## Check the performance measure 
rr$score(measures = measure)
##                 task task_id                    learner     learner_id
## 1: <TaskClassif[50]>      pe <LearnerClassifRanger[38]> classif.ranger
##                 resampling resampling_id iteration              prediction
## 1: <ResamplingHoldout[20]>       holdout         1 <PredictionClassif[20]>
##    classif.auc
## 1:    0.886993

Interpretation Note: AUC (area under the curve) - the higher the value, the more of our predictions are predicted correctly.

## Check the available hyperparameters we can use to tune the model
lrn_rf$param_set
## <ParamSet>
##                               id    class lower upper nlevels        default
##  1:                        alpha ParamDbl  -Inf   Inf     Inf            0.5
##  2:       always.split.variables ParamUty    NA    NA     Inf <NoDefault[3]>
##  3:                class.weights ParamUty    NA    NA     Inf               
##  4:                      holdout ParamLgl    NA    NA       2          FALSE
##  5:                   importance ParamFct    NA    NA       4 <NoDefault[3]>
##  6:                   keep.inbag ParamLgl    NA    NA       2          FALSE
##  7:                    max.depth ParamInt     0   Inf     Inf               
##  8:                min.node.size ParamInt     1   Inf     Inf               
##  9:                     min.prop ParamDbl  -Inf   Inf     Inf            0.1
## 10:                      minprop ParamDbl  -Inf   Inf     Inf            0.1
## 11:                         mtry ParamInt     1   Inf     Inf <NoDefault[3]>
## 12:                   mtry.ratio ParamDbl     0     1     Inf <NoDefault[3]>
## 13:            num.random.splits ParamInt     1   Inf     Inf              1
## 14:                  num.threads ParamInt     1   Inf     Inf              1
## 15:                    num.trees ParamInt     1   Inf     Inf            500
## 16:                    oob.error ParamLgl    NA    NA       2           TRUE
## 17:        regularization.factor ParamUty    NA    NA     Inf              1
## 18:      regularization.usedepth ParamLgl    NA    NA       2          FALSE
## 19:                      replace ParamLgl    NA    NA       2           TRUE
## 20:    respect.unordered.factors ParamFct    NA    NA       3         ignore
## 21:              sample.fraction ParamDbl     0     1     Inf <NoDefault[3]>
## 22:                  save.memory ParamLgl    NA    NA       2          FALSE
## 23: scale.permutation.importance ParamLgl    NA    NA       2          FALSE
## 24:                    se.method ParamFct    NA    NA       2        infjack
## 25:                         seed ParamInt  -Inf   Inf     Inf               
## 26:         split.select.weights ParamUty    NA    NA     Inf               
## 27:                    splitrule ParamFct    NA    NA       3           gini
## 28:                      verbose ParamLgl    NA    NA       2           TRUE
## 29:                 write.forest ParamLgl    NA    NA       2           TRUE
##                               id    class lower upper nlevels        default
##        parents       value
##  1:                       
##  2:                       
##  3:                       
##  4:                       
##  5:            permutation
##  6:                       
##  7:                       
##  8:                       
##  9:                       
## 10:                       
## 11:                       
## 12:                       
## 13:  splitrule            
## 14:                      1
## 15:                       
## 16:                       
## 17:                       
## 18:                       
## 19:                       
## 20:                       
## 21:                       
## 22:                       
## 23: importance            
## 24:                       
## 25:                       
## 26:                       
## 27:                       
## 28:                       
## 29:                       
##        parents       value

Note: The two most frequently tuned parameters are mtry (the number of variables used per split) and num.trees (the number of trees built). Next we define a parameter set for these:

## Build parameter set for mtry and num.trees
tune_ps = ParamSet$new(list(
  ParamInt$new("mtry", lower = 1, upper = 8),
  ParamInt$new("num.trees", lower = 100, upper = 1000)
))

Next: we define a new AutoTuner. This is simply a copy of the previous one, but with an updated learner and parameter set. Note that we again set the inner resampling strategy.

## Set up the hyperparameter tuner
at_rf = AutoTuner$new(learner = lrn_rf,
                      resampling = resampling_inner,
                      measure = measure,
                      search_space = tune_ps,
                      terminator = evals,
                      tuner = tuner)

Then: Again, we use resample to tune the model within the outer resampling strategy

Note: This will take a little while to run; remember that this is dividing the original data set up three times, then for each one running tuning the parameters across the parameter set/resolution.

## Tuning the paramaters using the parameter set/solution
rr_rf = resample(task = task_pe,
                 learner = at_rf,
                 resampling = resampling_outer,
                 store_models = TRUE)
## INFO  [16:32:22.339] [mlr3] Applying learner 'classif.ranger.tuned' on task 'pe' (iter 1/3)
## INFO  [16:32:22.374] [bbotk] Starting to optimize 2 parameter(s) with '<TunerGridSearch>' and '<TerminatorEvals> [n_evals=50, k=0]'
## INFO  [16:32:22.375] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:22.385] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:22.387] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:22.611] [mlr3] Finished benchmark
## INFO  [16:32:22.621] [bbotk] Result of batch 1:
## INFO  [16:32:22.621] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:22.621] [bbotk]     8       900   0.9109848        0      0             0.22
## INFO  [16:32:22.621] [bbotk]                                 uhash
## INFO  [16:32:22.621] [bbotk]  542b47c4-ac76-4594-9e8c-f0a6232492e1
## INFO  [16:32:22.622] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:22.631] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:22.634] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:22.699] [mlr3] Finished benchmark
## INFO  [16:32:22.710] [bbotk] Result of batch 2:
## INFO  [16:32:22.711] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:22.711] [bbotk]     3       300   0.9084596        0      0            0.061
## INFO  [16:32:22.711] [bbotk]                                 uhash
## INFO  [16:32:22.711] [bbotk]  10260a2f-f891-4ea5-b97b-b5705d2c74ec
## INFO  [16:32:22.711] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:22.721] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:22.723] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:22.754] [mlr3] Finished benchmark
## INFO  [16:32:22.764] [bbotk] Result of batch 3:
## INFO  [16:32:22.765] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:22.765] [bbotk]     8       100    0.907197        0      0            0.028
## INFO  [16:32:22.765] [bbotk]                                 uhash
## INFO  [16:32:22.765] [bbotk]  02fb6b88-d78d-4276-98fb-7ced7ae09321
## INFO  [16:32:22.765] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:22.786] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:22.788] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:22.896] [mlr3] Finished benchmark
## INFO  [16:32:22.907] [bbotk] Result of batch 4:
## INFO  [16:32:22.908] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:22.908] [bbotk]     4       500   0.9090909        0      0            0.105
## INFO  [16:32:22.908] [bbotk]                                 uhash
## INFO  [16:32:22.908] [bbotk]  44af0b77-0cd0-46d6-8b01-a34374ed680b
## INFO  [16:32:22.908] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:22.918] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:22.920] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:23.090] [mlr3] Finished benchmark
## INFO  [16:32:23.101] [bbotk] Result of batch 5:
## INFO  [16:32:23.101] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:23.101] [bbotk]     7       700   0.9128788        0      0            0.167
## INFO  [16:32:23.101] [bbotk]                                 uhash
## INFO  [16:32:23.101] [bbotk]  442b0ab2-0865-4f7e-816f-6fad8752784f
## INFO  [16:32:23.102] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:23.112] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:23.114] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:23.314] [mlr3] Finished benchmark
## INFO  [16:32:23.325] [bbotk] Result of batch 6:
## INFO  [16:32:23.326] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:23.326] [bbotk]     8       800   0.9122475        0      0            0.197
## INFO  [16:32:23.326] [bbotk]                                 uhash
## INFO  [16:32:23.326] [bbotk]  b30e9474-57c3-4e2c-b333-6072d7cd62b4
## INFO  [16:32:23.326] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:23.336] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:23.338] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:23.537] [mlr3] Finished benchmark
## INFO  [16:32:23.548] [bbotk] Result of batch 7:
## INFO  [16:32:23.549] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:23.549] [bbotk]     6       800    0.915404        0      0            0.186
## INFO  [16:32:23.549] [bbotk]                                 uhash
## INFO  [16:32:23.549] [bbotk]  6e42c96d-16e3-4685-9e72-2277df5c8535
## INFO  [16:32:23.549] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:23.559] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:23.562] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:23.759] [mlr3] Finished benchmark
## INFO  [16:32:23.770] [bbotk] Result of batch 8:
## INFO  [16:32:23.771] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:23.771] [bbotk]     5       900   0.9103535        0      0            0.194
## INFO  [16:32:23.771] [bbotk]                                 uhash
## INFO  [16:32:23.771] [bbotk]  f8759089-3d86-4720-b7c7-896f16b07243
## INFO  [16:32:23.771] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:23.781] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:23.783] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:23.931] [mlr3] Finished benchmark
## INFO  [16:32:23.942] [bbotk] Result of batch 9:
## INFO  [16:32:23.943] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:23.943] [bbotk]     4       700   0.9090909        0      0            0.146
## INFO  [16:32:23.943] [bbotk]                                 uhash
## INFO  [16:32:23.943] [bbotk]  55fa226a-aa69-4a54-b1a8-882d0d7459d6
## INFO  [16:32:23.943] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:23.953] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:23.955] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:24.038] [mlr3] Finished benchmark
## INFO  [16:32:24.060] [bbotk] Result of batch 10:
## INFO  [16:32:24.061] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:24.061] [bbotk]     1       400   0.9097222        0      0            0.079
## INFO  [16:32:24.061] [bbotk]                                 uhash
## INFO  [16:32:24.061] [bbotk]  f814145d-3090-45b2-a5bb-51c088cbe5af
## INFO  [16:32:24.062] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:24.072] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:24.074] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:24.137] [mlr3] Finished benchmark
## INFO  [16:32:24.148] [bbotk] Result of batch 11:
## INFO  [16:32:24.149] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:24.149] [bbotk]     1       300   0.9122475        0      0            0.061
## INFO  [16:32:24.149] [bbotk]                                 uhash
## INFO  [16:32:24.149] [bbotk]  ac150373-aee7-4cd3-8b4b-59c4b2af6e5a
## INFO  [16:32:24.149] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:24.158] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:24.161] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:24.313] [mlr3] Finished benchmark
## INFO  [16:32:24.324] [bbotk] Result of batch 12:
## INFO  [16:32:24.325] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:24.325] [bbotk]     8       600   0.9109848        0      0            0.148
## INFO  [16:32:24.325] [bbotk]                                 uhash
## INFO  [16:32:24.325] [bbotk]  eb96c20f-453e-4bb1-8382-68f3f634cbb9
## INFO  [16:32:24.326] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:24.336] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:24.338] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:24.393] [mlr3] Finished benchmark
## INFO  [16:32:24.403] [bbotk] Result of batch 13:
## INFO  [16:32:24.404] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:24.404] [bbotk]     8       200   0.9078283        0      0            0.051
## INFO  [16:32:24.404] [bbotk]                                 uhash
## INFO  [16:32:24.404] [bbotk]  3251a163-7dd5-499b-bd6d-c2fe2224347b
## INFO  [16:32:24.404] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:24.421] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:24.425] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:24.453] [mlr3] Finished benchmark
## INFO  [16:32:24.464] [bbotk] Result of batch 14:
## INFO  [16:32:24.465] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:24.465] [bbotk]     4       100   0.9084596        0      0            0.024
## INFO  [16:32:24.465] [bbotk]                                 uhash
## INFO  [16:32:24.465] [bbotk]  507b04ec-cf52-45d5-bb84-064ea3bed464
## INFO  [16:32:24.465] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:24.475] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:24.477] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:24.523] [mlr3] Finished benchmark
## INFO  [16:32:24.533] [bbotk] Result of batch 15:
## INFO  [16:32:24.534] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:24.534] [bbotk]     2       200   0.9078283        0      0            0.043
## INFO  [16:32:24.534] [bbotk]                                 uhash
## INFO  [16:32:24.534] [bbotk]  e77bf6cf-6ee2-4bae-82ec-7c1bccf558b7
## INFO  [16:32:24.535] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:24.544] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:24.547] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:24.666] [mlr3] Finished benchmark
## INFO  [16:32:24.676] [bbotk] Result of batch 16:
## INFO  [16:32:24.677] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:24.677] [bbotk]     1       600   0.9103535        0      0            0.116
## INFO  [16:32:24.677] [bbotk]                                 uhash
## INFO  [16:32:24.677] [bbotk]  3d1400fe-0542-447a-86c6-f9391046310b
## INFO  [16:32:24.678] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:24.687] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:24.690] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:24.860] [mlr3] Finished benchmark
## INFO  [16:32:24.881] [bbotk] Result of batch 17:
## INFO  [16:32:24.882] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:24.882] [bbotk]     4       800   0.9090909        0      0            0.166
## INFO  [16:32:24.882] [bbotk]                                 uhash
## INFO  [16:32:24.882] [bbotk]  86ea65d1-32e8-414b-8a59-04069c860114
## INFO  [16:32:24.882] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:24.892] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:24.895] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:24.959] [mlr3] Finished benchmark
## INFO  [16:32:24.970] [bbotk] Result of batch 18:
## INFO  [16:32:24.971] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:24.971] [bbotk]     2       300   0.9090909        0      0            0.062
## INFO  [16:32:24.971] [bbotk]                                 uhash
## INFO  [16:32:24.971] [bbotk]  ff60b982-14e3-4946-9767-242646d650e1
## INFO  [16:32:24.971] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:24.981] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:24.983] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:25.114] [mlr3] Finished benchmark
## INFO  [16:32:25.125] [bbotk] Result of batch 19:
## INFO  [16:32:25.125] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:25.125] [bbotk]     4       600   0.9109848        0      0            0.127
## INFO  [16:32:25.125] [bbotk]                                 uhash
## INFO  [16:32:25.125] [bbotk]  8d478374-69f8-4492-ab0c-fcb0d7bdcdb6
## INFO  [16:32:25.126] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:25.136] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:25.138] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:25.262] [mlr3] Finished benchmark
## INFO  [16:32:25.272] [bbotk] Result of batch 20:
## INFO  [16:32:25.273] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:25.273] [bbotk]     3       600   0.9116162        0      0             0.12
## INFO  [16:32:25.273] [bbotk]                                 uhash
## INFO  [16:32:25.273] [bbotk]  1afc25cf-6117-4dca-85f1-25b98830f85d
## INFO  [16:32:25.274] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:25.293] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:25.296] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:25.473] [mlr3] Finished benchmark
## INFO  [16:32:25.484] [bbotk] Result of batch 21:
## INFO  [16:32:25.485] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:25.485] [bbotk]     8       700   0.9116162        0      0            0.175
## INFO  [16:32:25.485] [bbotk]                                 uhash
## INFO  [16:32:25.485] [bbotk]  1071f911-e46b-4a1b-b41c-7aaee8b9477a
## INFO  [16:32:25.486] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:25.495] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:25.498] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:25.548] [mlr3] Finished benchmark
## INFO  [16:32:25.558] [bbotk] Result of batch 22:
## INFO  [16:32:25.559] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:25.559] [bbotk]     5       200   0.9122475        0      0            0.046
## INFO  [16:32:25.559] [bbotk]                                 uhash
## INFO  [16:32:25.559] [bbotk]  c1ea2ecd-5453-429c-916d-2bd68c77772e
## INFO  [16:32:25.559] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:25.569] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:25.572] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:25.703] [mlr3] Finished benchmark
## INFO  [16:32:25.714] [bbotk] Result of batch 23:
## INFO  [16:32:25.714] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:25.714] [bbotk]     8       500   0.9116162        0      0            0.127
## INFO  [16:32:25.714] [bbotk]                                 uhash
## INFO  [16:32:25.714] [bbotk]  f4ed01d8-19e9-4802-a63e-d8639005f468
## INFO  [16:32:25.715] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:25.725] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:25.728] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:25.838] [mlr3] Finished benchmark
## INFO  [16:32:25.852] [bbotk] Result of batch 24:
## INFO  [16:32:25.853] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:25.853] [bbotk]     1       500   0.9097222        0      0            0.106
## INFO  [16:32:25.853] [bbotk]                                 uhash
## INFO  [16:32:25.853] [bbotk]  d066829e-1b15-4f10-8275-b62523692f35
## INFO  [16:32:25.853] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:25.863] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:25.866] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:26.010] [mlr3] Finished benchmark
## INFO  [16:32:26.020] [bbotk] Result of batch 25:
## INFO  [16:32:26.021] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:26.021] [bbotk]     2       700   0.9128788        0      0            0.141
## INFO  [16:32:26.021] [bbotk]                                 uhash
## INFO  [16:32:26.021] [bbotk]  069c9628-cfaf-460d-90e5-437feed0b4b7
## INFO  [16:32:26.022] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:26.031] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:26.034] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:26.213] [mlr3] Finished benchmark
## INFO  [16:32:26.224] [bbotk] Result of batch 26:
## INFO  [16:32:26.224] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:26.224] [bbotk]     2       900   0.9128788        0      0            0.175
## INFO  [16:32:26.224] [bbotk]                                 uhash
## INFO  [16:32:26.224] [bbotk]  a550376e-a31c-48b7-a24e-583cbb4faab1
## INFO  [16:32:26.225] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:26.235] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:26.237] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:26.266] [mlr3] Finished benchmark
## INFO  [16:32:26.285] [bbotk] Result of batch 27:
## INFO  [16:32:26.286] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:26.286] [bbotk]     6       100    0.907197        0      0            0.026
## INFO  [16:32:26.286] [bbotk]                                 uhash
## INFO  [16:32:26.286] [bbotk]  f97f4ddc-67b9-47dc-bd68-f24b133a2d9a
## INFO  [16:32:26.287] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:26.298] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:26.301] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:26.499] [mlr3] Finished benchmark
## INFO  [16:32:26.510] [bbotk] Result of batch 28:
## INFO  [16:32:26.511] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:26.511] [bbotk]     1      1000   0.9147727        0      0            0.196
## INFO  [16:32:26.511] [bbotk]                                 uhash
## INFO  [16:32:26.511] [bbotk]  dbfb8b61-9658-4a98-80c8-0c60180cfcc2
## INFO  [16:32:26.511] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:26.521] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:26.523] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:26.592] [mlr3] Finished benchmark
## INFO  [16:32:26.603] [bbotk] Result of batch 29:
## INFO  [16:32:26.603] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:26.603] [bbotk]     4       300   0.9147727        0      0            0.064
## INFO  [16:32:26.603] [bbotk]                                 uhash
## INFO  [16:32:26.603] [bbotk]  fffca4ec-8d89-44a2-b235-f95f2056e3ce
## INFO  [16:32:26.604] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:26.614] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:26.616] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:26.723] [mlr3] Finished benchmark
## INFO  [16:32:26.735] [bbotk] Result of batch 30:
## INFO  [16:32:26.735] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:26.735] [bbotk]     3       500   0.9116162        0      0            0.104
## INFO  [16:32:26.735] [bbotk]                                 uhash
## INFO  [16:32:26.735] [bbotk]  5eec659a-19f1-481a-9458-1c47f69eed1c
## INFO  [16:32:26.736] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:26.757] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:26.759] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:26.938] [mlr3] Finished benchmark
## INFO  [16:32:26.948] [bbotk] Result of batch 31:
## INFO  [16:32:26.949] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:26.949] [bbotk]     5       800   0.9109848        0      0            0.174
## INFO  [16:32:26.949] [bbotk]                                 uhash
## INFO  [16:32:26.949] [bbotk]  3877b9ff-e098-4018-9429-8b7ce44b320b
## INFO  [16:32:26.950] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:26.959] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:26.962] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:27.041] [mlr3] Finished benchmark
## INFO  [16:32:27.052] [bbotk] Result of batch 32:
## INFO  [16:32:27.053] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:27.053] [bbotk]     8       300   0.9097222        0      0            0.075
## INFO  [16:32:27.053] [bbotk]                                 uhash
## INFO  [16:32:27.053] [bbotk]  65876354-0fcd-440e-9c37-428011864e5c
## INFO  [16:32:27.053] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:27.063] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:27.066] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:27.186] [mlr3] Finished benchmark
## INFO  [16:32:27.197] [bbotk] Result of batch 33:
## INFO  [16:32:27.198] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:27.198] [bbotk]     2       600   0.9090909        0      0            0.116
## INFO  [16:32:27.198] [bbotk]                                 uhash
## INFO  [16:32:27.198] [bbotk]  b096eaba-2409-4e27-a16b-97d41048f8a6
## INFO  [16:32:27.198] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:27.215] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:27.219] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:27.362] [mlr3] Finished benchmark
## INFO  [16:32:27.373] [bbotk] Result of batch 34:
## INFO  [16:32:27.374] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:27.374] [bbotk]     6       600   0.9116162        0      0            0.138
## INFO  [16:32:27.374] [bbotk]                                 uhash
## INFO  [16:32:27.374] [bbotk]  602ec58a-7f2d-4c11-a25c-edff70213f80
## INFO  [16:32:27.374] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:27.384] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:27.386] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:27.592] [mlr3] Finished benchmark
## INFO  [16:32:27.602] [bbotk] Result of batch 35:
## INFO  [16:32:27.603] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:27.603] [bbotk]     6       900   0.9116162        0      0            0.203
## INFO  [16:32:27.603] [bbotk]                                 uhash
## INFO  [16:32:27.603] [bbotk]  a8b103f7-8550-497d-8303-d334f190f72e
## INFO  [16:32:27.604] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:27.613] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:27.616] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:27.776] [mlr3] Finished benchmark
## INFO  [16:32:27.787] [bbotk] Result of batch 36:
## INFO  [16:32:27.787] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:27.787] [bbotk]     1       800   0.9147727        0      0            0.156
## INFO  [16:32:27.787] [bbotk]                                 uhash
## INFO  [16:32:27.787] [bbotk]  957ec96c-2f39-44ed-bee9-56f7e2239aab
## INFO  [16:32:27.788] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:27.798] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:27.800] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:27.895] [mlr3] Finished benchmark
## INFO  [16:32:27.907] [bbotk] Result of batch 37:
## INFO  [16:32:27.908] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:27.908] [bbotk]     2       400   0.9122475        0      0             0.09
## INFO  [16:32:27.908] [bbotk]                                 uhash
## INFO  [16:32:27.908] [bbotk]  d248c0d0-808a-4cec-8d1e-e7f9cec05cc6
## INFO  [16:32:27.908] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:27.918] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:27.921] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:27.947] [mlr3] Finished benchmark
## INFO  [16:32:27.957] [bbotk] Result of batch 38:
## INFO  [16:32:27.958] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:27.958] [bbotk]     3       100   0.9128788        0      0            0.023
## INFO  [16:32:27.958] [bbotk]                                 uhash
## INFO  [16:32:27.958] [bbotk]  ecc09717-6058-4bd3-9844-51f5a6c12bb5
## INFO  [16:32:27.959] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:27.968] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:27.970] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:28.087] [mlr3] Finished benchmark
## INFO  [16:32:28.098] [bbotk] Result of batch 39:
## INFO  [16:32:28.099] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:28.099] [bbotk]     6       500   0.9109848        0      0            0.112
## INFO  [16:32:28.099] [bbotk]                                 uhash
## INFO  [16:32:28.099] [bbotk]  77a5235a-caac-47ee-8999-fb33b32ea907
## INFO  [16:32:28.099] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:28.109] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:28.112] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:28.139] [mlr3] Finished benchmark
## INFO  [16:32:28.159] [bbotk] Result of batch 40:
## INFO  [16:32:28.160] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:28.160] [bbotk]     5       100   0.9109848        0      0            0.024
## INFO  [16:32:28.160] [bbotk]                                 uhash
## INFO  [16:32:28.160] [bbotk]  0f4ccc0a-15f6-4870-8160-312e148da045
## INFO  [16:32:28.160] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:28.170] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:28.172] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:28.216] [mlr3] Finished benchmark
## INFO  [16:32:28.227] [bbotk] Result of batch 41:
## INFO  [16:32:28.228] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:28.228] [bbotk]     1       200   0.9084596        0      0             0.04
## INFO  [16:32:28.228] [bbotk]                                 uhash
## INFO  [16:32:28.228] [bbotk]  53cd6a24-5efe-4703-b6e9-f39cecd803e0
## INFO  [16:32:28.228] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:28.238] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:28.241] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:28.286] [mlr3] Finished benchmark
## INFO  [16:32:28.297] [bbotk] Result of batch 42:
## INFO  [16:32:28.298] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:28.298] [bbotk]     3       200   0.9116162        0      0            0.043
## INFO  [16:32:28.298] [bbotk]                                 uhash
## INFO  [16:32:28.298] [bbotk]  31be8009-0e84-4ff6-b669-63d9bca27a3d
## INFO  [16:32:28.298] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:28.308] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:28.311] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:28.448] [mlr3] Finished benchmark
## INFO  [16:32:28.459] [bbotk] Result of batch 43:
## INFO  [16:32:28.460] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:28.460] [bbotk]     1       700   0.9097222        0      0            0.133
## INFO  [16:32:28.460] [bbotk]                                 uhash
## INFO  [16:32:28.460] [bbotk]  5675157a-df06-4a8f-9db4-fff121ec4ce9
## INFO  [16:32:28.460] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:28.480] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:28.482] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:28.716] [mlr3] Finished benchmark
## INFO  [16:32:28.726] [bbotk] Result of batch 44:
## INFO  [16:32:28.727] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:28.727] [bbotk]     6      1000   0.9109848        0      0             0.23
## INFO  [16:32:28.727] [bbotk]                                 uhash
## INFO  [16:32:28.727] [bbotk]  2846e763-7a8b-44d5-ac6e-be105ae1bb25
## INFO  [16:32:28.728] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:28.737] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:28.740] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:28.942] [mlr3] Finished benchmark
## INFO  [16:32:28.952] [bbotk] Result of batch 45:
## INFO  [16:32:28.953] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:28.953] [bbotk]     3      1000   0.9135101        0      0            0.198
## INFO  [16:32:28.953] [bbotk]                                 uhash
## INFO  [16:32:28.953] [bbotk]  11f2cc3f-0b29-44c7-a376-1548c3903d5d
## INFO  [16:32:28.954] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:28.963] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:28.966] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:29.065] [mlr3] Finished benchmark
## INFO  [16:32:29.076] [bbotk] Result of batch 46:
## INFO  [16:32:29.076] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:29.076] [bbotk]     7       400   0.9147727        0      0            0.096
## INFO  [16:32:29.076] [bbotk]                                 uhash
## INFO  [16:32:29.076] [bbotk]  b62a104e-8c7c-4aae-931f-32c6b0c63b26
## INFO  [16:32:29.077] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:29.097] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:29.099] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:29.276] [mlr3] Finished benchmark
## INFO  [16:32:29.287] [bbotk] Result of batch 47:
## INFO  [16:32:29.288] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:29.288] [bbotk]     1       900   0.9116162        0      0            0.174
## INFO  [16:32:29.288] [bbotk]                                 uhash
## INFO  [16:32:29.288] [bbotk]  f69ab857-d922-404e-be6e-c456f7b31337
## INFO  [16:32:29.288] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:29.298] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:29.300] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:29.330] [mlr3] Finished benchmark
## INFO  [16:32:29.340] [bbotk] Result of batch 48:
## INFO  [16:32:29.341] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:29.341] [bbotk]     7       100   0.9059343        0      0            0.026
## INFO  [16:32:29.341] [bbotk]                                 uhash
## INFO  [16:32:29.341] [bbotk]  a08814d2-ae80-469e-9a20-1f7582e6a719
## INFO  [16:32:29.341] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:29.351] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:29.354] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:29.455] [mlr3] Finished benchmark
## INFO  [16:32:29.466] [bbotk] Result of batch 49:
## INFO  [16:32:29.467] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:29.467] [bbotk]     2       500   0.9109848        0      0            0.098
## INFO  [16:32:29.467] [bbotk]                                 uhash
## INFO  [16:32:29.467] [bbotk]  a07b5a00-3bcc-4af7-9d9a-ed76a1ea372a
## INFO  [16:32:29.467] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:29.487] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:29.489] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:29.702] [mlr3] Finished benchmark
## INFO  [16:32:29.713] [bbotk] Result of batch 50:
## INFO  [16:32:29.714] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:29.714] [bbotk]     4      1000   0.9097222        0      0            0.209
## INFO  [16:32:29.714] [bbotk]                                 uhash
## INFO  [16:32:29.714] [bbotk]  1f5badb1-5d03-4e8a-9206-77ad7d8f4179
## INFO  [16:32:29.716] [bbotk] Finished optimizing after 50 evaluation(s)
## INFO  [16:32:29.716] [bbotk] Result:
## INFO  [16:32:29.716] [bbotk]  mtry num.trees learner_param_vals  x_domain classif.auc
## INFO  [16:32:29.716] [bbotk]     6       800          <list[4]> <list[2]>    0.915404
## INFO  [16:32:29.972] [mlr3] Applying learner 'classif.ranger.tuned' on task 'pe' (iter 2/3)
## INFO  [16:32:29.995] [bbotk] Starting to optimize 2 parameter(s) with '<TunerGridSearch>' and '<TerminatorEvals> [n_evals=50, k=0]'
## INFO  [16:32:29.996] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:30.006] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:30.016] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:30.183] [mlr3] Finished benchmark
## INFO  [16:32:30.193] [bbotk] Result of batch 1:
## INFO  [16:32:30.194] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:30.194] [bbotk]     7       700   0.8961851        0      0            0.162
## INFO  [16:32:30.194] [bbotk]                                 uhash
## INFO  [16:32:30.194] [bbotk]  ee8f5cd8-ac8a-4dac-9d17-7c1c833adf95
## INFO  [16:32:30.194] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:30.204] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:30.207] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:30.283] [mlr3] Finished benchmark
## INFO  [16:32:30.294] [bbotk] Result of batch 2:
## INFO  [16:32:30.295] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:30.295] [bbotk]     8       300   0.8968105        0      0            0.073
## INFO  [16:32:30.295] [bbotk]                                 uhash
## INFO  [16:32:30.295] [bbotk]  4e89d067-5af5-45f2-ad8d-fddd6943b33a
## INFO  [16:32:30.295] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:30.305] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:30.307] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:30.408] [mlr3] Finished benchmark
## INFO  [16:32:30.418] [bbotk] Result of batch 3:
## INFO  [16:32:30.419] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:30.419] [bbotk]     1       500   0.8905566        0      0            0.096
## INFO  [16:32:30.419] [bbotk]                                 uhash
## INFO  [16:32:30.419] [bbotk]  3fb4edaa-df92-46f6-9c3c-c83874636e98
## INFO  [16:32:30.420] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:30.429] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:30.440] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:30.487] [mlr3] Finished benchmark
## INFO  [16:32:30.498] [bbotk] Result of batch 4:
## INFO  [16:32:30.499] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:30.499] [bbotk]     2       200   0.8986867        0      0            0.042
## INFO  [16:32:30.499] [bbotk]                                 uhash
## INFO  [16:32:30.499] [bbotk]  2569c04d-c712-4dbb-9695-f313b7358218
## INFO  [16:32:30.499] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:30.509] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:30.511] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:30.698] [mlr3] Finished benchmark
## INFO  [16:32:30.709] [bbotk] Result of batch 5:
## INFO  [16:32:30.710] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:30.710] [bbotk]     4       900    0.888055        0      0            0.183
## INFO  [16:32:30.710] [bbotk]                                 uhash
## INFO  [16:32:30.710] [bbotk]  5aa8677e-c265-4c86-8a03-eeae0603f065
## INFO  [16:32:30.710] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:30.720] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:30.723] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:30.798] [mlr3] Finished benchmark
## INFO  [16:32:30.809] [bbotk] Result of batch 6:
## INFO  [16:32:30.810] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:30.810] [bbotk]     7       300   0.9049406        0      0            0.072
## INFO  [16:32:30.810] [bbotk]                                 uhash
## INFO  [16:32:30.810] [bbotk]  341a8dce-f876-42a5-957a-8486c6c375a8
## INFO  [16:32:30.810] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:30.828] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:30.832] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:30.859] [mlr3] Finished benchmark
## INFO  [16:32:30.870] [bbotk] Result of batch 7:
## INFO  [16:32:30.871] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:30.871] [bbotk]     4       100   0.8786742        0      0            0.023
## INFO  [16:32:30.871] [bbotk]                                 uhash
## INFO  [16:32:30.871] [bbotk]  f2037578-edea-44f5-b658-75ac4ce0b420
## INFO  [16:32:30.871] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:30.881] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:30.884] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:31.030] [mlr3] Finished benchmark
## INFO  [16:32:31.041] [bbotk] Result of batch 8:
## INFO  [16:32:31.042] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:31.042] [bbotk]     4       700   0.8968105        0      0            0.142
## INFO  [16:32:31.042] [bbotk]                                 uhash
## INFO  [16:32:31.042] [bbotk]  0685a70a-9e8f-4f5b-ba8f-114d6b9435ee
## INFO  [16:32:31.042] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:31.052] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:31.054] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:31.168] [mlr3] Finished benchmark
## INFO  [16:32:31.179] [bbotk] Result of batch 9:
## INFO  [16:32:31.180] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:31.180] [bbotk]     5       500   0.8961851        0      0             0.11
## INFO  [16:32:31.180] [bbotk]                                 uhash
## INFO  [16:32:31.180] [bbotk]  9bb5a7f5-80c3-4576-9eb7-9498818dc853
## INFO  [16:32:31.181] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:31.200] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:31.203] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:31.337] [mlr3] Finished benchmark
## INFO  [16:32:31.347] [bbotk] Result of batch 10:
## INFO  [16:32:31.348] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:31.348] [bbotk]     5       600   0.8968105        0      0             0.13
## INFO  [16:32:31.348] [bbotk]                                 uhash
## INFO  [16:32:31.348] [bbotk]  34b2b021-de94-47ee-b62d-de0a94f47f42
## INFO  [16:32:31.349] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:31.358] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:31.361] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:31.577] [mlr3] Finished benchmark
## INFO  [16:32:31.588] [bbotk] Result of batch 11:
## INFO  [16:32:31.589] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:31.589] [bbotk]     7       900   0.8968105        0      0            0.212
## INFO  [16:32:31.589] [bbotk]                                 uhash
## INFO  [16:32:31.589] [bbotk]  23549fb8-559c-429b-af12-ef606d745fc9
## INFO  [16:32:31.589] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:31.599] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:31.602] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:31.670] [mlr3] Finished benchmark
## INFO  [16:32:31.681] [bbotk] Result of batch 12:
## INFO  [16:32:31.682] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:31.682] [bbotk]     4       300   0.8899312        0      0            0.064
## INFO  [16:32:31.682] [bbotk]                                 uhash
## INFO  [16:32:31.682] [bbotk]  67df9983-1f47-4390-bf7b-4a14ceb290a4
## INFO  [16:32:31.682] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:31.916] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:31.919] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:32.135] [mlr3] Finished benchmark
## INFO  [16:32:32.145] [bbotk] Result of batch 13:
## INFO  [16:32:32.146] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:32.146] [bbotk]     5      1000   0.8999375        0      0            0.213
## INFO  [16:32:32.146] [bbotk]                                 uhash
## INFO  [16:32:32.146] [bbotk]  7902c067-17e1-4869-aa8e-0282f248743d
## INFO  [16:32:32.146] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:32.155] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:32.158] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:32.331] [mlr3] Finished benchmark
## INFO  [16:32:32.341] [bbotk] Result of batch 14:
## INFO  [16:32:32.342] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:32.342] [bbotk]     2       900   0.8886804        0      0            0.169
## INFO  [16:32:32.342] [bbotk]                                 uhash
## INFO  [16:32:32.342] [bbotk]  03ddfa46-0c2e-4ada-a261-02de8de2b13a
## INFO  [16:32:32.343] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:32.352] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:32.355] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:32.460] [mlr3] Finished benchmark
## INFO  [16:32:32.471] [bbotk] Result of batch 15:
## INFO  [16:32:32.472] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:32.472] [bbotk]     4       500   0.8949343        0      0            0.102
## INFO  [16:32:32.472] [bbotk]                                 uhash
## INFO  [16:32:32.472] [bbotk]  a0ca26d2-a5ea-42d3-96a6-e14385da8bd7
## INFO  [16:32:32.472] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:32.481] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:32.484] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:32.620] [mlr3] Finished benchmark
## INFO  [16:32:32.631] [bbotk] Result of batch 16:
## INFO  [16:32:32.632] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:32.632] [bbotk]     6       600   0.8968105        0      0            0.133
## INFO  [16:32:32.632] [bbotk]                                 uhash
## INFO  [16:32:32.632] [bbotk]  9dd4673e-5e79-4c2b-9adb-9d9f8d5d8186
## INFO  [16:32:32.632] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:32.642] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:32.644] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:32.800] [mlr3] Finished benchmark
## INFO  [16:32:32.811] [bbotk] Result of batch 17:
## INFO  [16:32:32.811] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:32.811] [bbotk]     2       800   0.8918074        0      0            0.151
## INFO  [16:32:32.811] [bbotk]                                 uhash
## INFO  [16:32:32.811] [bbotk]  f8b9b482-3f74-49f2-a8ab-2d861341ce41
## INFO  [16:32:32.812] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:32.822] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:32.825] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:32.961] [mlr3] Finished benchmark
## INFO  [16:32:32.972] [bbotk] Result of batch 18:
## INFO  [16:32:32.973] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:32.973] [bbotk]     2       700   0.8855535        0      0            0.132
## INFO  [16:32:32.973] [bbotk]                                 uhash
## INFO  [16:32:32.973] [bbotk]  452157f3-0a34-426d-9e1e-6c86a15345f1
## INFO  [16:32:32.973] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:32.983] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:32.985] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:33.029] [mlr3] Finished benchmark
## INFO  [16:32:33.040] [bbotk] Result of batch 19:
## INFO  [16:32:33.041] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:33.041] [bbotk]     3       200   0.8955597        0      0            0.041
## INFO  [16:32:33.041] [bbotk]                                 uhash
## INFO  [16:32:33.041] [bbotk]  3cd1e39a-ccd1-47e0-bece-547d102d72bc
## INFO  [16:32:33.042] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:33.052] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:33.055] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:33.151] [mlr3] Finished benchmark
## INFO  [16:32:33.162] [bbotk] Result of batch 20:
## INFO  [16:32:33.163] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:33.163] [bbotk]     6       400   0.8955597        0      0            0.093
## INFO  [16:32:33.163] [bbotk]                                 uhash
## INFO  [16:32:33.163] [bbotk]  0ff72bf4-f854-48dc-80e4-2dd9706b26fc
## INFO  [16:32:33.164] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:33.184] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:33.186] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:33.214] [mlr3] Finished benchmark
## INFO  [16:32:33.224] [bbotk] Result of batch 21:
## INFO  [16:32:33.225] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:33.225] [bbotk]     5       100   0.8986867        0      0            0.025
## INFO  [16:32:33.225] [bbotk]                                 uhash
## INFO  [16:32:33.225] [bbotk]  acc3b096-f355-4c78-a77f-d5f368fc61e0
## INFO  [16:32:33.225] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:33.234] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:33.237] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:33.291] [mlr3] Finished benchmark
## INFO  [16:32:33.301] [bbotk] Result of batch 22:
## INFO  [16:32:33.302] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:33.302] [bbotk]     8       200   0.9011882        0      0            0.051
## INFO  [16:32:33.302] [bbotk]                                 uhash
## INFO  [16:32:33.302] [bbotk]  a0eeec39-83a1-426d-a27f-24500cdc0073
## INFO  [16:32:33.302] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:33.312] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:33.314] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:33.473] [mlr3] Finished benchmark
## INFO  [16:32:33.484] [bbotk] Result of batch 23:
## INFO  [16:32:33.484] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:33.484] [bbotk]     6       700   0.8968105        0      0            0.155
## INFO  [16:32:33.484] [bbotk]                                 uhash
## INFO  [16:32:33.484] [bbotk]  f9b4d9bf-3f8e-4705-894d-f89a0aaf1183
## INFO  [16:32:33.485] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:33.494] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:33.497] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:33.648] [mlr3] Finished benchmark
## INFO  [16:32:33.659] [bbotk] Result of batch 24:
## INFO  [16:32:33.659] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:33.659] [bbotk]     5       700   0.8968105        0      0            0.148
## INFO  [16:32:33.659] [bbotk]                                 uhash
## INFO  [16:32:33.659] [bbotk]  2f009dda-ce5d-4d6b-855e-e0440d10011a
## INFO  [16:32:33.660] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:33.670] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:33.672] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:33.895] [mlr3] Finished benchmark
## INFO  [16:32:33.906] [bbotk] Result of batch 25:
## INFO  [16:32:33.907] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:33.907] [bbotk]     6      1000   0.8968105        0      0             0.22
## INFO  [16:32:33.907] [bbotk]                                 uhash
## INFO  [16:32:33.907] [bbotk]  353659d2-125f-42a7-97e9-0b361763a1e1
## INFO  [16:32:33.907] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:33.917] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:33.919] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:34.115] [mlr3] Finished benchmark
## INFO  [16:32:34.125] [bbotk] Result of batch 26:
## INFO  [16:32:34.126] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:34.126] [bbotk]     3      1000   0.8861789        0      0            0.192
## INFO  [16:32:34.126] [bbotk]                                 uhash
## INFO  [16:32:34.126] [bbotk]  7e939f21-3aeb-4a06-980e-c4593892eed3
## INFO  [16:32:34.127] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:34.136] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:34.139] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:34.191] [mlr3] Finished benchmark
## INFO  [16:32:34.202] [bbotk] Result of batch 27:
## INFO  [16:32:34.202] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:34.202] [bbotk]     7       200    0.891182        0      0            0.049
## INFO  [16:32:34.202] [bbotk]                                 uhash
## INFO  [16:32:34.202] [bbotk]  7623b173-ebed-4819-91d4-d18e771a9d21
## INFO  [16:32:34.203] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:34.213] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:34.215] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:34.278] [mlr3] Finished benchmark
## INFO  [16:32:34.288] [bbotk] Result of batch 28:
## INFO  [16:32:34.289] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:34.289] [bbotk]     2       300   0.8849281        0      0            0.059
## INFO  [16:32:34.289] [bbotk]                                 uhash
## INFO  [16:32:34.289] [bbotk]  65d893cb-39d9-4bf0-bcd9-3bd80b03f393
## INFO  [16:32:34.289] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:34.308] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:34.311] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:34.362] [mlr3] Finished benchmark
## INFO  [16:32:34.372] [bbotk] Result of batch 29:
## INFO  [16:32:34.373] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:34.373] [bbotk]     6       200   0.8924328        0      0            0.047
## INFO  [16:32:34.373] [bbotk]                                 uhash
## INFO  [16:32:34.373] [bbotk]  82de2f72-5633-41d9-b895-fe942d376add
## INFO  [16:32:34.373] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:34.383] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:34.385] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:34.545] [mlr3] Finished benchmark
## INFO  [16:32:34.555] [bbotk] Result of batch 30:
## INFO  [16:32:34.556] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:34.556] [bbotk]     3       800   0.8961851        0      0            0.157
## INFO  [16:32:34.556] [bbotk]                                 uhash
## INFO  [16:32:34.556] [bbotk]  958deeb7-a8eb-4aff-80e7-76076b1d0711
## INFO  [16:32:34.557] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:34.566] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:34.568] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:34.594] [mlr3] Finished benchmark
## INFO  [16:32:34.604] [bbotk] Result of batch 31:
## INFO  [16:32:34.605] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:34.605] [bbotk]     3       100   0.8843027        0      0            0.022
## INFO  [16:32:34.605] [bbotk]                                 uhash
## INFO  [16:32:34.605] [bbotk]  3ae782aa-6a82-4112-a37e-7ef8b5a18282
## INFO  [16:32:34.605] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:34.615] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:34.618] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:34.791] [mlr3] Finished benchmark
## INFO  [16:32:34.802] [bbotk] Result of batch 32:
## INFO  [16:32:34.802] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:34.802] [bbotk]     5       800   0.9005629        0      0            0.169
## INFO  [16:32:34.802] [bbotk]                                 uhash
## INFO  [16:32:34.802] [bbotk]  c49fd6b9-423e-4548-9e51-50b9d723f140
## INFO  [16:32:34.803] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:34.813] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:34.815] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:35.015] [mlr3] Finished benchmark
## INFO  [16:32:35.025] [bbotk] Result of batch 33:
## INFO  [16:32:35.026] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:35.026] [bbotk]     6       900   0.8974359        0      0            0.197
## INFO  [16:32:35.026] [bbotk]                                 uhash
## INFO  [16:32:35.026] [bbotk]  e3431424-7062-49fb-86f1-c48e23209582
## INFO  [16:32:35.026] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:35.036] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:35.038] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:35.136] [mlr3] Finished benchmark
## INFO  [16:32:35.147] [bbotk] Result of batch 34:
## INFO  [16:32:35.148] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:35.148] [bbotk]     7       400    0.891182        0      0            0.095
## INFO  [16:32:35.148] [bbotk]                                 uhash
## INFO  [16:32:35.148] [bbotk]  ca6a994e-7f0a-4a0d-9fbc-10e55670cf1f
## INFO  [16:32:35.149] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:35.158] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:35.161] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:35.280] [mlr3] Finished benchmark
## INFO  [16:32:35.290] [bbotk] Result of batch 35:
## INFO  [16:32:35.291] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:35.291] [bbotk]     7       500   0.8955597        0      0            0.115
## INFO  [16:32:35.291] [bbotk]                                 uhash
## INFO  [16:32:35.291] [bbotk]  a5233e9f-2791-4708-9a23-c23e45d1de59
## INFO  [16:32:35.292] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:35.301] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:35.303] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:35.498] [mlr3] Finished benchmark
## INFO  [16:32:35.508] [bbotk] Result of batch 36:
## INFO  [16:32:35.509] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:35.509] [bbotk]     5       900   0.8961851        0      0            0.191
## INFO  [16:32:35.509] [bbotk]                                 uhash
## INFO  [16:32:35.509] [bbotk]  c3190b15-f148-4609-8b1a-0288d1e13868
## INFO  [16:32:35.510] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:35.528] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:35.531] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:35.631] [mlr3] Finished benchmark
## INFO  [16:32:35.641] [bbotk] Result of batch 37:
## INFO  [16:32:35.642] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:35.642] [bbotk]     8       400    0.891182        0      0            0.096
## INFO  [16:32:35.642] [bbotk]                                 uhash
## INFO  [16:32:35.642] [bbotk]  5fb62093-9992-4bca-9290-afa9c8db59c3
## INFO  [16:32:35.642] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:35.651] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:35.654] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:35.821] [mlr3] Finished benchmark
## INFO  [16:32:35.832] [bbotk] Result of batch 38:
## INFO  [16:32:35.832] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:35.832] [bbotk]     4       800   0.8949343        0      0            0.163
## INFO  [16:32:35.832] [bbotk]                                 uhash
## INFO  [16:32:35.832] [bbotk]  500ab241-2408-42a0-8174-f918e3930ba9
## INFO  [16:32:35.833] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:35.842] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:35.845] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:35.914] [mlr3] Finished benchmark
## INFO  [16:32:35.924] [bbotk] Result of batch 39:
## INFO  [16:32:35.925] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:35.925] [bbotk]     5       300   0.8961851        0      0            0.065
## INFO  [16:32:35.925] [bbotk]                                 uhash
## INFO  [16:32:35.925] [bbotk]  4a20362c-0a0f-4a6d-a5db-7c187999ba65
## INFO  [16:32:35.925] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:35.935] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:35.937] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:36.145] [mlr3] Finished benchmark
## INFO  [16:32:36.156] [bbotk] Result of batch 40:
## INFO  [16:32:36.156] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:36.156] [bbotk]     4      1000   0.8980613        0      0            0.204
## INFO  [16:32:36.156] [bbotk]                                 uhash
## INFO  [16:32:36.156] [bbotk]  523aa2d0-ce44-42c5-be5b-620acb41fbce
## INFO  [16:32:36.157] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:36.167] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:36.169] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:36.312] [mlr3] Finished benchmark
## INFO  [16:32:36.323] [bbotk] Result of batch 41:
## INFO  [16:32:36.324] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:36.324] [bbotk]     3       700   0.8943089        0      0            0.139
## INFO  [16:32:36.324] [bbotk]                                 uhash
## INFO  [16:32:36.324] [bbotk]  dc3f80c3-7462-4bee-b4bc-bc62fa501f83
## INFO  [16:32:36.324] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:36.334] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:36.336] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:36.511] [mlr3] Finished benchmark
## INFO  [16:32:36.522] [bbotk] Result of batch 42:
## INFO  [16:32:36.523] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:36.523] [bbotk]     1       900   0.8855535        0      0            0.172
## INFO  [16:32:36.523] [bbotk]                                 uhash
## INFO  [16:32:36.523] [bbotk]  a12e90df-31d0-489d-b965-022c9380ed65
## INFO  [16:32:36.523] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:36.533] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:36.535] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:36.562] [mlr3] Finished benchmark
## INFO  [16:32:36.573] [bbotk] Result of batch 43:
## INFO  [16:32:36.574] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:36.574] [bbotk]     2       100   0.8861789        0      0            0.024
## INFO  [16:32:36.574] [bbotk]                                 uhash
## INFO  [16:32:36.574] [bbotk]  30ea3da8-ea88-4686-9cd6-3508896eee26
## INFO  [16:32:36.574] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:36.584] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:36.586] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:36.804] [mlr3] Finished benchmark
## INFO  [16:32:36.815] [bbotk] Result of batch 44:
## INFO  [16:32:36.816] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:36.816] [bbotk]     8       900   0.8949343        0      0            0.216
## INFO  [16:32:36.816] [bbotk]                                 uhash
## INFO  [16:32:36.816] [bbotk]  594b8844-cfe0-4ff8-af12-d023facb4884
## INFO  [16:32:36.816] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:36.836] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:36.838] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:36.869] [mlr3] Finished benchmark
## INFO  [16:32:36.879] [bbotk] Result of batch 45:
## INFO  [16:32:36.880] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:36.880] [bbotk]     7       100   0.8974359        0      0            0.026
## INFO  [16:32:36.880] [bbotk]                                 uhash
## INFO  [16:32:36.880] [bbotk]  af9ff47a-b21d-4b81-8097-df8db810e8da
## INFO  [16:32:36.881] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:36.890] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:36.893] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:36.979] [mlr3] Finished benchmark
## INFO  [16:32:36.990] [bbotk] Result of batch 46:
## INFO  [16:32:36.991] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:36.991] [bbotk]     4       400   0.8961851        0      0            0.083
## INFO  [16:32:36.991] [bbotk]                                 uhash
## INFO  [16:32:36.991] [bbotk]  a92db2f4-5178-4faa-a1c3-23e211044854
## INFO  [16:32:36.992] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:37.002] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:37.004] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:37.178] [mlr3] Finished benchmark
## INFO  [16:32:37.189] [bbotk] Result of batch 47:
## INFO  [16:32:37.189] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:37.189] [bbotk]     8       700   0.8974359        0      0            0.169
## INFO  [16:32:37.189] [bbotk]                                 uhash
## INFO  [16:32:37.189] [bbotk]  5e56b62d-d6c8-4293-9e61-52ccd562c197
## INFO  [16:32:37.190] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:37.200] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:37.202] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:37.250] [mlr3] Finished benchmark
## INFO  [16:32:37.261] [bbotk] Result of batch 48:
## INFO  [16:32:37.262] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:37.262] [bbotk]     5       200   0.9030644        0      0            0.046
## INFO  [16:32:37.262] [bbotk]                                 uhash
## INFO  [16:32:37.262] [bbotk]  9ddabc53-a343-44a7-9bd9-c2f08c69ed43
## INFO  [16:32:37.263] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:37.273] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:37.276] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:37.301] [mlr3] Finished benchmark
## INFO  [16:32:37.312] [bbotk] Result of batch 49:
## INFO  [16:32:37.313] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:37.313] [bbotk]     1       100   0.8943089        0      0            0.022
## INFO  [16:32:37.313] [bbotk]                                 uhash
## INFO  [16:32:37.313] [bbotk]  82a6c04a-5522-45e3-99b4-1dc624251a57
## INFO  [16:32:37.313] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:37.323] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:37.325] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:37.509] [mlr3] Finished benchmark
## INFO  [16:32:37.520] [bbotk] Result of batch 50:
## INFO  [16:32:37.520] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:37.520] [bbotk]     6       800   0.8924328        0      0            0.179
## INFO  [16:32:37.520] [bbotk]                                 uhash
## INFO  [16:32:37.520] [bbotk]  62dc5cb8-0224-4842-8951-d0db7a0e3eb8
## INFO  [16:32:37.522] [bbotk] Finished optimizing after 50 evaluation(s)
## INFO  [16:32:37.523] [bbotk] Result:
## INFO  [16:32:37.523] [bbotk]  mtry num.trees learner_param_vals  x_domain classif.auc
## INFO  [16:32:37.523] [bbotk]     7       300          <list[4]> <list[2]>   0.9049406
## INFO  [16:32:37.633] [mlr3] Applying learner 'classif.ranger.tuned' on task 'pe' (iter 3/3)
## INFO  [16:32:37.657] [bbotk] Starting to optimize 2 parameter(s) with '<TunerGridSearch>' and '<TerminatorEvals> [n_evals=50, k=0]'
## INFO  [16:32:37.658] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:37.676] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:37.679] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:37.886] [mlr3] Finished benchmark
## INFO  [16:32:37.895] [bbotk] Result of batch 1:
## INFO  [16:32:37.896] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:37.896] [bbotk]     3      1000   0.9255785        0      0            0.203
## INFO  [16:32:37.896] [bbotk]                                 uhash
## INFO  [16:32:37.896] [bbotk]  a6a9f95e-af03-47a0-870d-7c4e8b730cf4
## INFO  [16:32:37.897] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:37.906] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:37.909] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:38.032] [mlr3] Finished benchmark
## INFO  [16:32:38.042] [bbotk] Result of batch 2:
## INFO  [16:32:38.043] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:38.043] [bbotk]     7       500   0.9186992        0      0            0.119
## INFO  [16:32:38.043] [bbotk]                                 uhash
## INFO  [16:32:38.043] [bbotk]  61bfc77b-cb33-4875-9de1-5ce2d10ca5b4
## INFO  [16:32:38.043] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:38.053] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:38.056] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:38.120] [mlr3] Finished benchmark
## INFO  [16:32:38.131] [bbotk] Result of batch 3:
## INFO  [16:32:38.132] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:38.132] [bbotk]     2       300   0.9280801        0      0            0.061
## INFO  [16:32:38.132] [bbotk]                                 uhash
## INFO  [16:32:38.132] [bbotk]  467cb880-68e4-45e3-97e9-3ce8d6f401eb
## INFO  [16:32:38.133] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:38.142] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:38.145] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:38.247] [mlr3] Finished benchmark
## INFO  [16:32:38.258] [bbotk] Result of batch 4:
## INFO  [16:32:38.258] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:38.258] [bbotk]     1       500   0.9249531        0      0            0.099
## INFO  [16:32:38.258] [bbotk]                                 uhash
## INFO  [16:32:38.258] [bbotk]  8396e922-4c15-42ab-8041-281a5555c32a
## INFO  [16:32:38.259] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:38.269] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:38.272] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:38.317] [mlr3] Finished benchmark
## INFO  [16:32:38.328] [bbotk] Result of batch 5:
## INFO  [16:32:38.329] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:38.329] [bbotk]     2       200   0.9299562        0      0            0.042
## INFO  [16:32:38.329] [bbotk]                                 uhash
## INFO  [16:32:38.329] [bbotk]  fb1194f2-8456-414c-ad84-2ca3e704180d
## INFO  [16:32:38.329] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:38.339] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:38.341] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:38.541] [mlr3] Finished benchmark
## INFO  [16:32:38.552] [bbotk] Result of batch 6:
## INFO  [16:32:38.553] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:38.553] [bbotk]     8       800   0.9237023        0      0            0.195
## INFO  [16:32:38.553] [bbotk]                                 uhash
## INFO  [16:32:38.553] [bbotk]  6fb3c178-bcbc-42ee-baf6-aa9b6541ed7a
## INFO  [16:32:38.553] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:38.563] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:38.566] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:38.790] [mlr3] Finished benchmark
## INFO  [16:32:38.801] [bbotk] Result of batch 7:
## INFO  [16:32:38.802] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:38.802] [bbotk]     8       900   0.9205754        0      0            0.221
## INFO  [16:32:38.802] [bbotk]                                 uhash
## INFO  [16:32:38.802] [bbotk]  cabad87b-6ef4-4dfc-ae67-cbdea2e77213
## INFO  [16:32:38.803] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:38.812] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:38.814] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:39.007] [mlr3] Finished benchmark
## INFO  [16:32:39.018] [bbotk] Result of batch 8:
## INFO  [16:32:39.018] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:39.018] [bbotk]     7       800   0.9218261        0      0            0.188
## INFO  [16:32:39.018] [bbotk]                                 uhash
## INFO  [16:32:39.018] [bbotk]  4fb8f4c9-6863-4e66-ad20-ec80b1552234
## INFO  [16:32:39.019] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:39.039] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:39.042] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:39.220] [mlr3] Finished benchmark
## INFO  [16:32:39.230] [bbotk] Result of batch 9:
## INFO  [16:32:39.231] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:39.231] [bbotk]     8       700   0.9262039        0      0            0.175
## INFO  [16:32:39.231] [bbotk]                                 uhash
## INFO  [16:32:39.231] [bbotk]  839f51e7-5b49-428a-a0f7-1b841379074e
## INFO  [16:32:39.232] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:39.241] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:39.243] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:39.342] [mlr3] Finished benchmark
## INFO  [16:32:39.352] [bbotk] Result of batch 10:
## INFO  [16:32:39.353] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:39.353] [bbotk]     7       400   0.9237023        0      0            0.094
## INFO  [16:32:39.353] [bbotk]                                 uhash
## INFO  [16:32:39.353] [bbotk]  6efc8dc2-a8a2-4d44-8c2a-9a7d0cfc3f82
## INFO  [16:32:39.354] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:39.364] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:39.367] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:39.445] [mlr3] Finished benchmark
## INFO  [16:32:39.456] [bbotk] Result of batch 11:
## INFO  [16:32:39.457] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:39.457] [bbotk]     7       300   0.9186992        0      0            0.075
## INFO  [16:32:39.457] [bbotk]                                 uhash
## INFO  [16:32:39.457] [bbotk]  61a00878-a93f-4103-83e2-b9ad8a1ec9cd
## INFO  [16:32:39.457] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:39.467] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:39.469] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:39.621] [mlr3] Finished benchmark
## INFO  [16:32:39.633] [bbotk] Result of batch 12:
## INFO  [16:32:39.633] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:39.633] [bbotk]     8       600   0.9224515        0      0            0.149
## INFO  [16:32:39.633] [bbotk]                                 uhash
## INFO  [16:32:39.633] [bbotk]  8758d4e8-1f9d-48f0-a987-6e4f3fd802dd
## INFO  [16:32:39.634] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:39.644] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:39.647] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:39.696] [mlr3] Finished benchmark
## INFO  [16:32:39.706] [bbotk] Result of batch 13:
## INFO  [16:32:39.707] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:39.707] [bbotk]     5       200   0.9262039        0      0            0.045
## INFO  [16:32:39.707] [bbotk]                                 uhash
## INFO  [16:32:39.707] [bbotk]  7122aa4c-d1f2-495c-96f0-7ab5a14e7d56
## INFO  [16:32:39.708] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:39.718] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:39.721] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:39.968] [mlr3] Finished benchmark
## INFO  [16:32:39.979] [bbotk] Result of batch 14:
## INFO  [16:32:39.980] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:39.980] [bbotk]     8      1000   0.9230769        0      0            0.244
## INFO  [16:32:39.980] [bbotk]                                 uhash
## INFO  [16:32:39.980] [bbotk]  3137bafb-255b-4073-a43c-23b9d923e9ab
## INFO  [16:32:39.980] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:39.990] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:39.993] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:40.216] [mlr3] Finished benchmark
## INFO  [16:32:40.228] [bbotk] Result of batch 15:
## INFO  [16:32:40.228] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:40.228] [bbotk]     7       900   0.9249531        0      0            0.219
## INFO  [16:32:40.228] [bbotk]                                 uhash
## INFO  [16:32:40.228] [bbotk]  138819e6-66ea-4066-a4fb-fe0b4dfec875
## INFO  [16:32:40.229] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:40.239] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:40.241] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:40.363] [mlr3] Finished benchmark
## INFO  [16:32:40.374] [bbotk] Result of batch 16:
## INFO  [16:32:40.384] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:40.384] [bbotk]     2       600   0.9249531        0      0            0.118
## INFO  [16:32:40.384] [bbotk]                                 uhash
## INFO  [16:32:40.384] [bbotk]  790224c2-ca46-449d-a499-cd77d371e77d
## INFO  [16:32:40.385] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:40.394] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:40.397] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:40.553] [mlr3] Finished benchmark
## INFO  [16:32:40.564] [bbotk] Result of batch 17:
## INFO  [16:32:40.564] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:40.564] [bbotk]     1       800   0.9262039        0      0            0.154
## INFO  [16:32:40.564] [bbotk]                                 uhash
## INFO  [16:32:40.564] [bbotk]  700da8e9-e402-49b6-9695-a3e88d269b94
## INFO  [16:32:40.565] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:40.574] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:40.577] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:40.704] [mlr3] Finished benchmark
## INFO  [16:32:40.715] [bbotk] Result of batch 18:
## INFO  [16:32:40.716] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:40.716] [bbotk]     8       500   0.9212008        0      0            0.124
## INFO  [16:32:40.716] [bbotk]                                 uhash
## INFO  [16:32:40.716] [bbotk]  53e1fd4e-480d-43b5-ba03-784192f51638
## INFO  [16:32:40.716] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:40.726] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:40.728] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:40.754] [mlr3] Finished benchmark
## INFO  [16:32:40.764] [bbotk] Result of batch 19:
## INFO  [16:32:40.765] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:40.765] [bbotk]     2       100   0.9274547        0      0            0.023
## INFO  [16:32:40.765] [bbotk]                                 uhash
## INFO  [16:32:40.765] [bbotk]  93cae207-0fd2-409b-97a2-d8346198c47c
## INFO  [16:32:40.765] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:40.775] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:40.778] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:40.822] [mlr3] Finished benchmark
## INFO  [16:32:40.833] [bbotk] Result of batch 20:
## INFO  [16:32:40.834] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:40.834] [bbotk]     1       200   0.9243277        0      0             0.04
## INFO  [16:32:40.834] [bbotk]                                 uhash
## INFO  [16:32:40.834] [bbotk]  1c2b108c-a95a-4088-9bd4-6cd2896052df
## INFO  [16:32:40.834] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:40.844] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:40.846] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:40.932] [mlr3] Finished benchmark
## INFO  [16:32:40.942] [bbotk] Result of batch 21:
## INFO  [16:32:40.943] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:40.943] [bbotk]     3       400   0.9212008        0      0            0.082
## INFO  [16:32:40.943] [bbotk]                                 uhash
## INFO  [16:32:40.943] [bbotk]  a21b3787-a859-47a9-9a1f-d8a4dd79a9b2
## INFO  [16:32:40.944] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:40.953] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:40.956] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:41.081] [mlr3] Finished benchmark
## INFO  [16:32:41.092] [bbotk] Result of batch 22:
## INFO  [16:32:41.092] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:41.092] [bbotk]     3       600   0.9280801        0      0            0.122
## INFO  [16:32:41.092] [bbotk]                                 uhash
## INFO  [16:32:41.092] [bbotk]  229dc333-1921-400e-8178-6bc83e51a313
## INFO  [16:32:41.093] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:41.102] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:41.105] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:41.227] [mlr3] Finished benchmark
## INFO  [16:32:41.238] [bbotk] Result of batch 23:
## INFO  [16:32:41.239] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:41.239] [bbotk]     1       600   0.9255785        0      0            0.119
## INFO  [16:32:41.239] [bbotk]                                 uhash
## INFO  [16:32:41.239] [bbotk]  41df9369-e212-4987-adf1-bc4152c251b2
## INFO  [16:32:41.239] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:41.249] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:41.251] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:41.449] [mlr3] Finished benchmark
## INFO  [16:32:41.470] [bbotk] Result of batch 24:
## INFO  [16:32:41.471] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:41.471] [bbotk]     5       900   0.9268293        0      0            0.196
## INFO  [16:32:41.471] [bbotk]                                 uhash
## INFO  [16:32:41.471] [bbotk]  f4f8d738-9057-4de3-aa15-41feaf5efc6f
## INFO  [16:32:41.471] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:41.481] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:41.484] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:41.629] [mlr3] Finished benchmark
## INFO  [16:32:41.639] [bbotk] Result of batch 25:
## INFO  [16:32:41.640] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:41.640] [bbotk]     7       600   0.9212008        0      0            0.141
## INFO  [16:32:41.640] [bbotk]                                 uhash
## INFO  [16:32:41.640] [bbotk]  a1912e03-294f-4df6-97d9-bb02822649ee
## INFO  [16:32:41.641] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:41.650] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:41.653] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:41.809] [mlr3] Finished benchmark
## INFO  [16:32:41.820] [bbotk] Result of batch 26:
## INFO  [16:32:41.820] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:41.820] [bbotk]     5       700   0.9268293        0      0            0.152
## INFO  [16:32:41.820] [bbotk]                                 uhash
## INFO  [16:32:41.820] [bbotk]  848e5379-dccd-4e02-b3d8-4bb16fcbbd5d
## INFO  [16:32:41.821] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:41.830] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:41.833] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:42.051] [mlr3] Finished benchmark
## INFO  [16:32:42.062] [bbotk] Result of batch 27:
## INFO  [16:32:42.063] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:42.063] [bbotk]     5      1000   0.9249531        0      0            0.216
## INFO  [16:32:42.063] [bbotk]                                 uhash
## INFO  [16:32:42.063] [bbotk]  0a4bde51-b854-4da5-b695-ed440a26367e
## INFO  [16:32:42.063] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:42.073] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:42.076] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:42.146] [mlr3] Finished benchmark
## INFO  [16:32:42.157] [bbotk] Result of batch 28:
## INFO  [16:32:42.157] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:42.157] [bbotk]     4       300   0.9205754        0      0            0.066
## INFO  [16:32:42.157] [bbotk]                                 uhash
## INFO  [16:32:42.157] [bbotk]  ce25e42d-f948-4274-ae1c-9936c34b87b9
## INFO  [16:32:42.158] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:42.168] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:42.170] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:42.356] [mlr3] Finished benchmark
## INFO  [16:32:42.366] [bbotk] Result of batch 29:
## INFO  [16:32:42.367] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:42.367] [bbotk]     6       800   0.9243277        0      0            0.183
## INFO  [16:32:42.367] [bbotk]                                 uhash
## INFO  [16:32:42.367] [bbotk]  da0e53c8-ae57-4119-b4fc-40499f720092
## INFO  [16:32:42.368] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:42.377] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:42.380] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:42.579] [mlr3] Finished benchmark
## INFO  [16:32:42.589] [bbotk] Result of batch 30:
## INFO  [16:32:42.590] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:42.590] [bbotk]     1      1000   0.9274547        0      0            0.195
## INFO  [16:32:42.590] [bbotk]                                 uhash
## INFO  [16:32:42.590] [bbotk]  d17fcc41-afba-4f6f-a64b-e61b15ddd757
## INFO  [16:32:42.590] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:42.600] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:42.602] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:42.774] [mlr3] Finished benchmark
## INFO  [16:32:42.785] [bbotk] Result of batch 31:
## INFO  [16:32:42.786] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:42.786] [bbotk]     4       800   0.9237023        0      0            0.168
## INFO  [16:32:42.786] [bbotk]                                 uhash
## INFO  [16:32:42.786] [bbotk]  059540a8-f0d0-47a8-ba45-b4025e455bf5
## INFO  [16:32:42.786] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:42.806] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:42.809] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:42.901] [mlr3] Finished benchmark
## INFO  [16:32:42.911] [bbotk] Result of batch 32:
## INFO  [16:32:42.912] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:42.912] [bbotk]     5       400   0.9280801        0      0            0.088
## INFO  [16:32:42.912] [bbotk]                                 uhash
## INFO  [16:32:42.912] [bbotk]  8688f12f-e963-4a2a-ae6c-c41f0db169d4
## INFO  [16:32:42.913] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:42.922] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:42.924] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:43.070] [mlr3] Finished benchmark
## INFO  [16:32:43.081] [bbotk] Result of batch 33:
## INFO  [16:32:43.082] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:43.082] [bbotk]     3       700   0.9237023        0      0            0.142
## INFO  [16:32:43.082] [bbotk]                                 uhash
## INFO  [16:32:43.082] [bbotk]  9e183df7-b0ab-447d-9ac7-91674b8515a2
## INFO  [16:32:43.082] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:43.092] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:43.094] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:43.306] [mlr3] Finished benchmark
## INFO  [16:32:43.317] [bbotk] Result of batch 34:
## INFO  [16:32:43.318] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:43.318] [bbotk]     4      1000   0.9243277        0      0            0.208
## INFO  [16:32:43.318] [bbotk]                                 uhash
## INFO  [16:32:43.318] [bbotk]  053dc155-f342-4ccd-bd8a-f1620b865e68
## INFO  [16:32:43.318] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:43.328] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:43.330] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:43.489] [mlr3] Finished benchmark
## INFO  [16:32:43.500] [bbotk] Result of batch 35:
## INFO  [16:32:43.501] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:43.501] [bbotk]     2       800   0.9255785        0      0            0.156
## INFO  [16:32:43.501] [bbotk]                                 uhash
## INFO  [16:32:43.501] [bbotk]  292ef509-5f25-47e6-b367-cbfda18fdc1e
## INFO  [16:32:43.501] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:43.511] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:43.514] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:43.565] [mlr3] Finished benchmark
## INFO  [16:32:43.576] [bbotk] Result of batch 36:
## INFO  [16:32:43.577] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:43.577] [bbotk]     6       200   0.9249531        0      0            0.049
## INFO  [16:32:43.577] [bbotk]                                 uhash
## INFO  [16:32:43.577] [bbotk]  7b97c951-ee19-4e7e-8c20-60bc15fd1f3d
## INFO  [16:32:43.577] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:43.586] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:43.589] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:43.728] [mlr3] Finished benchmark
## INFO  [16:32:43.738] [bbotk] Result of batch 37:
## INFO  [16:32:43.739] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:43.739] [bbotk]     1       700   0.9262039        0      0            0.136
## INFO  [16:32:43.739] [bbotk]                                 uhash
## INFO  [16:32:43.739] [bbotk]  af20d71b-c45e-4702-97cb-1e6768aadf27
## INFO  [16:32:43.739] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:43.749] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:43.751] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:43.781] [mlr3] Finished benchmark
## INFO  [16:32:43.792] [bbotk] Result of batch 38:
## INFO  [16:32:43.792] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:43.792] [bbotk]     8       100   0.9205754        0      0            0.027
## INFO  [16:32:43.792] [bbotk]                                 uhash
## INFO  [16:32:43.792] [bbotk]  827b2bd6-cbe2-4fa9-9697-6f20cd8e5afa
## INFO  [16:32:43.793] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:43.802] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:43.805] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:44.039] [mlr3] Finished benchmark
## INFO  [16:32:44.051] [bbotk] Result of batch 39:
## INFO  [16:32:44.051] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:44.051] [bbotk]     7      1000   0.9230769        0      0             0.23
## INFO  [16:32:44.051] [bbotk]                                 uhash
## INFO  [16:32:44.051] [bbotk]  6fa42dcf-8ece-446d-bf3a-f8d9c526d085
## INFO  [16:32:44.063] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:44.073] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:44.076] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:44.254] [mlr3] Finished benchmark
## INFO  [16:32:44.265] [bbotk] Result of batch 40:
## INFO  [16:32:44.265] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:44.265] [bbotk]     1       900   0.9255785        0      0            0.175
## INFO  [16:32:44.265] [bbotk]                                 uhash
## INFO  [16:32:44.265] [bbotk]  cf2f5b51-3a40-4b3d-9a74-8430013767e4
## INFO  [16:32:44.266] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:44.275] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:44.278] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:44.303] [mlr3] Finished benchmark
## INFO  [16:32:44.314] [bbotk] Result of batch 41:
## INFO  [16:32:44.315] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:44.315] [bbotk]     1       100   0.9249531        0      0            0.022
## INFO  [16:32:44.315] [bbotk]                                 uhash
## INFO  [16:32:44.315] [bbotk]  1a888cec-393e-4564-8b40-7d393f04ad76
## INFO  [16:32:44.315] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:44.324] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:44.327] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:44.529] [mlr3] Finished benchmark
## INFO  [16:32:44.539] [bbotk] Result of batch 42:
## INFO  [16:32:44.540] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:44.540] [bbotk]     2      1000   0.9274547        0      0            0.198
## INFO  [16:32:44.540] [bbotk]                                 uhash
## INFO  [16:32:44.540] [bbotk]  fa688006-cf20-4c4d-bf30-a5a508cd96ee
## INFO  [16:32:44.541] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:44.550] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:44.553] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:44.719] [mlr3] Finished benchmark
## INFO  [16:32:44.730] [bbotk] Result of batch 43:
## INFO  [16:32:44.731] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:44.731] [bbotk]     7       700   0.9249531        0      0            0.163
## INFO  [16:32:44.731] [bbotk]                                 uhash
## INFO  [16:32:44.731] [bbotk]  324b374a-aa59-4294-a120-5caf31d9dc72
## INFO  [16:32:44.731] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:44.741] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:44.743] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:44.859] [mlr3] Finished benchmark
## INFO  [16:32:44.870] [bbotk] Result of batch 44:
## INFO  [16:32:44.871] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:44.871] [bbotk]     6       500   0.9230769        0      0            0.113
## INFO  [16:32:44.871] [bbotk]                                 uhash
## INFO  [16:32:44.871] [bbotk]  c98e2c07-3d53-401c-88b3-eb23d0596ca3
## INFO  [16:32:44.871] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:44.881] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:44.883] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:45.111] [mlr3] Finished benchmark
## INFO  [16:32:45.121] [bbotk] Result of batch 45:
## INFO  [16:32:45.122] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:45.122] [bbotk]     6      1000   0.9262039        0      0            0.224
## INFO  [16:32:45.122] [bbotk]                                 uhash
## INFO  [16:32:45.122] [bbotk]  3690f200-b8da-485a-b46a-1ae08ac7f346
## INFO  [16:32:45.123] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:45.132] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:45.134] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:45.184] [mlr3] Finished benchmark
## INFO  [16:32:45.194] [bbotk] Result of batch 46:
## INFO  [16:32:45.195] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:45.195] [bbotk]     3       200   0.9274547        0      0            0.043
## INFO  [16:32:45.195] [bbotk]                                 uhash
## INFO  [16:32:45.195] [bbotk]  920ae013-bced-4242-a9a1-d27d23b0272c
## INFO  [16:32:45.196] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:45.205] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:45.207] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:45.270] [mlr3] Finished benchmark
## INFO  [16:32:45.281] [bbotk] Result of batch 47:
## INFO  [16:32:45.282] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:45.282] [bbotk]     7       200   0.9262039        0      0            0.049
## INFO  [16:32:45.282] [bbotk]                                 uhash
## INFO  [16:32:45.282] [bbotk]  946a899d-d577-43c0-b9e0-652426919509
## INFO  [16:32:45.282] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:45.291] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:45.294] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:45.403] [mlr3] Finished benchmark
## INFO  [16:32:45.414] [bbotk] Result of batch 48:
## INFO  [16:32:45.414] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:45.414] [bbotk]     4       500   0.9262039        0      0            0.105
## INFO  [16:32:45.414] [bbotk]                                 uhash
## INFO  [16:32:45.414] [bbotk]  b0f54edc-bf52-49d6-a69a-fc751fdc93e4
## INFO  [16:32:45.415] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:45.424] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:45.427] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:45.569] [mlr3] Finished benchmark
## INFO  [16:32:45.580] [bbotk] Result of batch 49:
## INFO  [16:32:45.580] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:45.580] [bbotk]     6       600   0.9237023        0      0            0.138
## INFO  [16:32:45.580] [bbotk]                                 uhash
## INFO  [16:32:45.580] [bbotk]  87332923-8ff3-4b3d-8397-76b5ad04b4da
## INFO  [16:32:45.581] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:45.590] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:45.593] [mlr3] Applying learner 'classif.ranger' on task 'pe' (iter 1/1)
## INFO  [16:32:45.640] [mlr3] Finished benchmark
## INFO  [16:32:45.651] [bbotk] Result of batch 50:
## INFO  [16:32:45.652] [bbotk]  mtry num.trees classif.auc warnings errors runtime_learners
## INFO  [16:32:45.652] [bbotk]     4       200   0.9218261        0      0            0.045
## INFO  [16:32:45.652] [bbotk]                                 uhash
## INFO  [16:32:45.652] [bbotk]  78139e29-2bfe-4b29-8bcb-9b7d10bc690d
## INFO  [16:32:45.654] [bbotk] Finished optimizing after 50 evaluation(s)
## INFO  [16:32:45.654] [bbotk] Result:
## INFO  [16:32:45.655] [bbotk]  mtry num.trees learner_param_vals  x_domain classif.auc
## INFO  [16:32:45.655] [bbotk]     2       200          <list[4]> <list[2]>   0.9299562
## Check the performance measure for each of the three model runs
rr_rf$score(measure)
##                 task task_id         learner           learner_id
## 1: <TaskClassif[50]>      pe <AutoTuner[46]> classif.ranger.tuned
## 2: <TaskClassif[50]>      pe <AutoTuner[46]> classif.ranger.tuned
## 3: <TaskClassif[50]>      pe <AutoTuner[46]> classif.ranger.tuned
##            resampling resampling_id iteration              prediction
## 1: <ResamplingCV[20]>            cv         1 <PredictionClassif[20]>
## 2: <ResamplingCV[20]>            cv         2 <PredictionClassif[20]>
## 3: <ResamplingCV[20]>            cv         3 <PredictionClassif[20]>
##    classif.auc
## 1:   0.9098558
## 2:   0.8949869
## 3:   0.8997777
## Check the aggregate performance measure
rr_rf$aggregate(measures = measure)
## classif.auc 
##   0.9015401

Interpretation Note: Our predictions definitely have improved! AUC is 0.9015401

## Check the hyperparameter values used during the run
sapply(rr_rf$learners,
       function(x)
         x$param_set$values)
## [[1]]
## named list()
## 
## [[2]]
## named list()
## 
## [[3]]
## named list()
##Question on this!!! Where are the values??***

Variable Importance Plots

Next we’ll plot the permutation-based variable importance for this model. As a reminder, variable importance is a measure of how much worse a model becomes when we scramble the values of one of the features. The model is used to predict the outcome for some test data (here the out-of-bag samples) twice: once with the original values of the feature and once with randomly shuffled values. If there is a large difference in the skill of the model, this feature is important in controlling the outcome. We’ll use the vip() function from the vip to show and then plot the variable importance scores. As there are three possible models from the resampling, we’ll just plot the first. The model object is buried quite deep in the resampling output in rr_rf\(learners[[1]]\)model\(learner\)model:

## Check the variable importance for the first model
vip(object = rr_rf$learners[[1]]$model$learner$model,
    geom = "point")

Partial Dependency Plots

Note: We can look at the form of the relationship between the occurrence of the pine and this feature (and any other one) using a partial dependency plot. This shows changes in the outcome across the range of some feature (with all other features held constant). Here, we’ll use the partial() function from the the pdp package to produce the plot. As arguments, this requires the model, the feature that you want the dependency on, the set of data used to produce the model. For a classification model, we can also specify which class to plot for. In this data, the presences (1) are the second class.

## Plot for the bio17 (precip in the dryest quarter) feature (variable)
partial(object = rr_rf$learners[[1]]$model$learner$model,
        pred.var = "bio17",
        prob = TRUE,
        train = pe.df,
        plot = TRUE,
        plot.engine = "ggplot2",
        which.class = 2) ##remember the presence of pine is the second (2) class for the model

Note: Key peak at 50 (unit?) of rain in the driest month?

Boosted Regression Trees

Note: We will now build a boosted regression tree model for the Pinus data. In contrast to random forests that build a set of individual weak trees, boosted regression trees (BRTs) start with a single weak tree and iteratively improve on this. This is done by targeting the residuals from the previous set of models and trying to model that in the next tree. While this can make these methods very powerful, it is easy for them to overfit the data, and hyperparameter tuning becomes very important here.

We’ll follow the same steps as with the random forest. mlr3 uses the xgboost package, so we define our learner as classif.xgboost. The only hyperparameter that we will set here is subsample. This runs a stochastic boosting where each individual tree is built with a random subset of 50% of the training data.

## This step requires the xgboost package to define the learner as classif.xgboost
# install.packages("xgboost")

## Make active
library(xgboost)
## 
## Attaching package: 'xgboost'
## The following object is masked from 'package:dplyr':
## 
##     slice
## Rebuild the learner with each tree using 50% (0.5) of the training data
lrn_brt = lrn("classif.xgboost",
              predict_type = "prob",
              subsample = 0.5)

##Rerun the model
rr = resample(task = task_pe,
              learner = lrn_brt,
              resampling = resamp_hout,
              store_models = TRUE)
## INFO  [16:32:46.979] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## Check the performance measures
rr$score(measure)
##                 task task_id                     learner      learner_id
## 1: <TaskClassif[50]>      pe <LearnerClassifXgboost[37]> classif.xgboost
##                 resampling resampling_id iteration              prediction
## 1: <ResamplingHoldout[20]>       holdout         1 <PredictionClassif[20]>
##    classif.auc
## 1:   0.8244755
## Check the aggregrate score (should match because there is only one model)
rr$aggregate(measure)
## classif.auc 
##   0.8244755

Interpretation: This performs worse than our random forest. Tune the model to improve performance

## Check the list of available hyperparameters to tune
lrn_brt$param_set
## <ParamSet>
##                              id    class lower upper nlevels         default
##  1:                       alpha ParamDbl     0   Inf     Inf               0
##  2:               approxcontrib ParamLgl    NA    NA       2           FALSE
##  3:                  base_score ParamDbl  -Inf   Inf     Inf             0.5
##  4:                     booster ParamFct    NA    NA       3          gbtree
##  5:                   callbacks ParamUty    NA    NA     Inf       <list[0]>
##  6:           colsample_bylevel ParamDbl     0     1     Inf               1
##  7:            colsample_bynode ParamDbl     0     1     Inf               1
##  8:            colsample_bytree ParamDbl     0     1     Inf               1
##  9: disable_default_eval_metric ParamLgl    NA    NA       2           FALSE
## 10:       early_stopping_rounds ParamInt     1   Inf     Inf                
## 11:          early_stopping_set ParamFct    NA    NA       3            none
## 12:                         eta ParamDbl     0     1     Inf             0.3
## 13:                 eval_metric ParamUty    NA    NA     Inf  <NoDefault[3]>
## 14:            feature_selector ParamFct    NA    NA       5          cyclic
## 15:                       feval ParamUty    NA    NA     Inf                
## 16:                       gamma ParamDbl     0   Inf     Inf               0
## 17:                 grow_policy ParamFct    NA    NA       2       depthwise
## 18:     interaction_constraints ParamUty    NA    NA     Inf  <NoDefault[3]>
## 19:              iterationrange ParamUty    NA    NA     Inf  <NoDefault[3]>
## 20:                      lambda ParamDbl     0   Inf     Inf               1
## 21:                 lambda_bias ParamDbl     0   Inf     Inf               0
## 22:                     max_bin ParamInt     2   Inf     Inf             256
## 23:              max_delta_step ParamDbl     0   Inf     Inf               0
## 24:                   max_depth ParamInt     0   Inf     Inf               6
## 25:                  max_leaves ParamInt     0   Inf     Inf               0
## 26:                    maximize ParamLgl    NA    NA       2                
## 27:            min_child_weight ParamDbl     0   Inf     Inf               1
## 28:                     missing ParamDbl  -Inf   Inf     Inf              NA
## 29:        monotone_constraints ParamUty    NA    NA     Inf               0
## 30:              normalize_type ParamFct    NA    NA       2            tree
## 31:                     nrounds ParamInt     1   Inf     Inf  <NoDefault[3]>
## 32:                     nthread ParamInt     1   Inf     Inf               1
## 33:                  ntreelimit ParamInt     1   Inf     Inf                
## 34:           num_parallel_tree ParamInt     1   Inf     Inf               1
## 35:                   objective ParamUty    NA    NA     Inf binary:logistic
## 36:                    one_drop ParamLgl    NA    NA       2           FALSE
## 37:                outputmargin ParamLgl    NA    NA       2           FALSE
## 38:                 predcontrib ParamLgl    NA    NA       2           FALSE
## 39:                   predictor ParamFct    NA    NA       2   cpu_predictor
## 40:             predinteraction ParamLgl    NA    NA       2           FALSE
## 41:                    predleaf ParamLgl    NA    NA       2           FALSE
## 42:               print_every_n ParamInt     1   Inf     Inf               1
## 43:                process_type ParamFct    NA    NA       2         default
## 44:                   rate_drop ParamDbl     0     1     Inf               0
## 45:                refresh_leaf ParamLgl    NA    NA       2            TRUE
## 46:                     reshape ParamLgl    NA    NA       2           FALSE
## 47:                 sample_type ParamFct    NA    NA       2         uniform
## 48:             sampling_method ParamFct    NA    NA       2         uniform
## 49:                   save_name ParamUty    NA    NA     Inf                
## 50:                 save_period ParamInt     0   Inf     Inf                
## 51:            scale_pos_weight ParamDbl  -Inf   Inf     Inf               1
## 52:          seed_per_iteration ParamLgl    NA    NA       2           FALSE
## 53:                   skip_drop ParamDbl     0     1     Inf               0
## 54:                strict_shape ParamLgl    NA    NA       2           FALSE
## 55:                   subsample ParamDbl     0     1     Inf               1
## 56:                       top_k ParamInt     0   Inf     Inf               0
## 57:                    training ParamLgl    NA    NA       2           FALSE
## 58:                 tree_method ParamFct    NA    NA       5            auto
## 59:      tweedie_variance_power ParamDbl     1     2     Inf             1.5
## 60:                     updater ParamUty    NA    NA     Inf  <NoDefault[3]>
## 61:                     verbose ParamInt     0     2       3               1
## 62:                   watchlist ParamUty    NA    NA     Inf                
## 63:                   xgb_model ParamUty    NA    NA     Inf                
##                              id    class lower upper nlevels         default
##                      parents value
##  1:                               
##  2:                               
##  3:                               
##  4:                               
##  5:                               
##  6:                               
##  7:                               
##  8:                               
##  9:                               
## 10:                               
## 11:                           none
## 12:                               
## 13:                               
## 14:                  booster      
## 15:                               
## 16:                               
## 17:              tree_method      
## 18:                               
## 19:                               
## 20:                               
## 21:                  booster      
## 22:              tree_method      
## 23:                               
## 24:                               
## 25:              grow_policy      
## 26:                               
## 27:                               
## 28:                               
## 29:                               
## 30:                  booster      
## 31:                              1
## 32:                              1
## 33:                               
## 34:                               
## 35:                               
## 36:                  booster      
## 37:                               
## 38:                               
## 39:                               
## 40:                               
## 41:                               
## 42:                  verbose      
## 43:                               
## 44:                  booster      
## 45:                               
## 46:                               
## 47:                  booster      
## 48:                  booster      
## 49:                               
## 50:                               
## 51:                               
## 52:                               
## 53:                  booster      
## 54:                               
## 55:                            0.5
## 56: booster,feature_selector      
## 57:                               
## 58:                  booster      
## 59:                objective      
## 60:                               
## 61:                              0
## 62:                               
## 63:                               
##                      parents value

Note: There is a long list of potential parameters to tune here. We’ll focus on three: eta (the learning rate), max.depth (the number of splits in a tree) and nrounds (the number of boosting iterations). Next we define a parameter set for these:

## Tune the parameters (eta, max.depth, nrounds)
tune_ps = ParamSet$new(list(
  ParamDbl$new("eta", lower = 0.001, upper = 0.1),
  ParamInt$new("max_depth", lower = 1, upper = 6),
  ParamInt$new("nrounds", lower = 100, upper = 1000)
))
## Set up the AutoTuner
at_brt = AutoTuner$new(learner = lrn_brt, 
                       resampling = resampling_inner,
                       measure = measure, 
                       search_space = tune_ps,
                       terminator = evals,
                       tuner = tuner)
## Rerun the model to tune

rr_brt = resample(task = task_pe,
                  learner = at_brt, 
                  resampling = resampling_outer,
                  store_models = TRUE)
## INFO  [16:32:47.069] [mlr3] Applying learner 'classif.xgboost.tuned' on task 'pe' (iter 1/3)
## INFO  [16:32:47.108] [bbotk] Starting to optimize 3 parameter(s) with '<TunerGridSearch>' and '<TerminatorEvals> [n_evals=50, k=0]'
## INFO  [16:32:47.109] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:47.127] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:47.130] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:47.239] [mlr3] Finished benchmark
## INFO  [16:32:47.248] [bbotk] Result of batch 1:
## INFO  [16:32:47.249] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:47.249] [bbotk]  0.034         2     500   0.9440421        0      0            0.106
## INFO  [16:32:47.249] [bbotk]                                 uhash
## INFO  [16:32:47.249] [bbotk]  a4cfc28f-46a3-43a1-85aa-90566844a49e
## INFO  [16:32:47.249] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:47.266] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:47.268] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:47.452] [mlr3] Finished benchmark
## INFO  [16:32:47.462] [bbotk] Result of batch 2:
## INFO  [16:32:47.463] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:47.463] [bbotk]  0.067         2     900   0.9381172        0      0             0.18
## INFO  [16:32:47.463] [bbotk]                                 uhash
## INFO  [16:32:47.463] [bbotk]  c32f8a6c-3e58-4313-841e-512a8dc3fa40
## INFO  [16:32:47.464] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:47.480] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:47.483] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:47.608] [mlr3] Finished benchmark
## INFO  [16:32:47.618] [bbotk] Result of batch 3:
## INFO  [16:32:47.619] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:47.619] [bbotk]  0.034         3     400   0.9453588        0      0            0.121
## INFO  [16:32:47.619] [bbotk]                                 uhash
## INFO  [16:32:47.619] [bbotk]  db74165c-211a-4625-af10-16165debb12c
## INFO  [16:32:47.619] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:47.636] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:47.638] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:47.807] [mlr3] Finished benchmark
## INFO  [16:32:47.818] [bbotk] Result of batch 4:
## INFO  [16:32:47.819] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:47.819] [bbotk]  0.089         6     500   0.9447005        0      0            0.166
## INFO  [16:32:47.819] [bbotk]                                 uhash
## INFO  [16:32:47.819] [bbotk]  9573ef81-4e5d-42f1-833d-90e238a19779
## INFO  [16:32:47.819] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:47.836] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:47.839] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:47.930] [mlr3] Finished benchmark
## INFO  [16:32:47.941] [bbotk] Result of batch 5:
## INFO  [16:32:47.942] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:47.942] [bbotk]  0.001         5     200   0.9150757        0      0            0.087
## INFO  [16:32:47.942] [bbotk]                                 uhash
## INFO  [16:32:47.942] [bbotk]  d402ca87-e06e-480c-a0ee-208c8d2a3bfa
## INFO  [16:32:47.942] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:47.959] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:47.962] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:47.997] [mlr3] Finished benchmark
## INFO  [16:32:48.007] [bbotk] Result of batch 6:
## INFO  [16:32:48.008] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:48.008] [bbotk]  0.034         3     100   0.9302172        0      0            0.031
## INFO  [16:32:48.008] [bbotk]                                 uhash
## INFO  [16:32:48.008] [bbotk]  e932a767-6e69-4888-a54d-acb750d17029
## INFO  [16:32:48.009] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:48.025] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:48.028] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:48.076] [mlr3] Finished benchmark
## INFO  [16:32:48.086] [bbotk] Result of batch 7:
## INFO  [16:32:48.087] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:48.087] [bbotk]  0.045         5     100   0.9427255        0      0            0.044
## INFO  [16:32:48.087] [bbotk]                                 uhash
## INFO  [16:32:48.087] [bbotk]  19db1f8c-4dfd-49fa-ac82-98b03390b0dd
## INFO  [16:32:48.088] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:48.112] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:48.115] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:48.520] [mlr3] Finished benchmark
## INFO  [16:32:48.531] [bbotk] Result of batch 8:
## INFO  [16:32:48.531] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:48.531] [bbotk]  0.012         5    1000   0.9440421        0      0            0.401
## INFO  [16:32:48.531] [bbotk]                                 uhash
## INFO  [16:32:48.531] [bbotk]  b110350a-d7c5-48c2-b24a-4290fd6b5bb8
## INFO  [16:32:48.532] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:48.548] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:48.551] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:48.808] [mlr3] Finished benchmark
## INFO  [16:32:48.820] [bbotk] Result of batch 9:
## INFO  [16:32:48.820] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:48.820] [bbotk]  0.045         4     800   0.9479921        0      0            0.254
## INFO  [16:32:48.820] [bbotk]                                 uhash
## INFO  [16:32:48.820] [bbotk]  f3480554-11c8-4237-86ca-05e6c0ca97ab
## INFO  [16:32:48.821] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:48.837] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:48.840] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:49.016] [mlr3] Finished benchmark
## INFO  [16:32:49.034] [bbotk] Result of batch 10:
## INFO  [16:32:49.035] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:49.035] [bbotk]  0.001         2     800    0.883476        0      0            0.172
## INFO  [16:32:49.035] [bbotk]                                 uhash
## INFO  [16:32:49.035] [bbotk]  4e0d7837-3d50-4435-9d49-1fdcbab027c8
## INFO  [16:32:49.036] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:49.055] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:49.059] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:49.297] [mlr3] Finished benchmark
## INFO  [16:32:49.307] [bbotk] Result of batch 11:
## INFO  [16:32:49.308] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:49.308] [bbotk]  0.089         4     800   0.9447005        0      0            0.234
## INFO  [16:32:49.308] [bbotk]                                 uhash
## INFO  [16:32:49.308] [bbotk]  9ce35c5b-840b-4a7d-90dc-3212d4959c7b
## INFO  [16:32:49.309] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:49.325] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:49.328] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:49.361] [mlr3] Finished benchmark
## INFO  [16:32:49.372] [bbotk] Result of batch 12:
## INFO  [16:32:49.373] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:49.373] [bbotk]  0.056         1     200   0.9124424        0      0             0.03
## INFO  [16:32:49.373] [bbotk]                                 uhash
## INFO  [16:32:49.373] [bbotk]  fab7d21b-1d9e-40f9-80d8-831464d4c0b3
## INFO  [16:32:49.373] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:49.390] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:49.393] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:49.551] [mlr3] Finished benchmark
## INFO  [16:32:49.562] [bbotk] Result of batch 13:
## INFO  [16:32:49.563] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:49.563] [bbotk]  0.056         6     400   0.9453588        0      0            0.154
## INFO  [16:32:49.563] [bbotk]                                 uhash
## INFO  [16:32:49.563] [bbotk]  1e0dfa1f-0eea-4b4f-8437-6e09f3890c3a
## INFO  [16:32:49.563] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:49.580] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:49.582] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:49.728] [mlr3] Finished benchmark
## INFO  [16:32:49.739] [bbotk] Result of batch 14:
## INFO  [16:32:49.740] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:49.740] [bbotk]  0.012         6     300   0.9341672        0      0            0.141
## INFO  [16:32:49.740] [bbotk]                                 uhash
## INFO  [16:32:49.740] [bbotk]  cbdfdcce-2a8e-44ac-a1ca-09760fb9804f
## INFO  [16:32:49.740] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:49.757] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:49.760] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:49.890] [mlr3] Finished benchmark
## INFO  [16:32:49.901] [bbotk] Result of batch 15:
## INFO  [16:32:49.902] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:49.902] [bbotk]  0.045         1     900   0.9117841        0      0            0.127
## INFO  [16:32:49.902] [bbotk]                                 uhash
## INFO  [16:32:49.902] [bbotk]  284ebb93-b562-4dbb-8d22-a4e9d57a8ff3
## INFO  [16:32:49.902] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:49.919] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:49.922] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:50.124] [mlr3] Finished benchmark
## INFO  [16:32:50.135] [bbotk] Result of batch 16:
## INFO  [16:32:50.136] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:50.136] [bbotk]  0.023         3     700   0.9440421        0      0            0.199
## INFO  [16:32:50.136] [bbotk]                                 uhash
## INFO  [16:32:50.136] [bbotk]  6500a8aa-d4b1-4dd2-8baa-6673642951db
## INFO  [16:32:50.136] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:50.154] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:50.156] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:50.361] [mlr3] Finished benchmark
## INFO  [16:32:50.371] [bbotk] Result of batch 17:
## INFO  [16:32:50.372] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:50.372] [bbotk]  0.056         2    1000   0.9394338        0      0              0.2
## INFO  [16:32:50.372] [bbotk]                                 uhash
## INFO  [16:32:50.372] [bbotk]  bd60d2ea-1aa9-4175-9f83-126eed1618bb
## INFO  [16:32:50.373] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:50.389] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:50.392] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:50.506] [mlr3] Finished benchmark
## INFO  [16:32:50.517] [bbotk] Result of batch 18:
## INFO  [16:32:50.518] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:50.518] [bbotk]  0.078         5     300   0.9420671        0      0            0.111
## INFO  [16:32:50.518] [bbotk]                                 uhash
## INFO  [16:32:50.518] [bbotk]  c23153da-4f10-4c82-b6a2-bbfd6718c837
## INFO  [16:32:50.519] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:50.535] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:50.545] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:50.634] [mlr3] Finished benchmark
## INFO  [16:32:50.645] [bbotk] Result of batch 19:
## INFO  [16:32:50.646] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:50.646] [bbotk]  0.067         6     200   0.9440421        0      0            0.085
## INFO  [16:32:50.646] [bbotk]                                 uhash
## INFO  [16:32:50.646] [bbotk]  9dc78561-1aaf-487f-b17e-0f69fa24dda0
## INFO  [16:32:50.646] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:50.663] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:50.665] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:50.873] [mlr3] Finished benchmark
## INFO  [16:32:50.884] [bbotk] Result of batch 20:
## INFO  [16:32:50.885] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:50.885] [bbotk]  0.023         2    1000   0.9440421        0      0            0.205
## INFO  [16:32:50.885] [bbotk]                                 uhash
## INFO  [16:32:50.885] [bbotk]  79888a68-b162-4c39-86ee-70ec5053092e
## INFO  [16:32:50.885] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:50.903] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:50.905] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:50.948] [mlr3] Finished benchmark
## INFO  [16:32:50.959] [bbotk] Result of batch 21:
## INFO  [16:32:50.959] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:50.959] [bbotk]  0.012         4     100   0.9262673        0      0             0.04
## INFO  [16:32:50.959] [bbotk]                                 uhash
## INFO  [16:32:50.959] [bbotk]  ccb433f9-7215-4a35-b702-c91b60ea12b1
## INFO  [16:32:50.960] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:50.977] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:50.979] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:51.166] [mlr3] Finished benchmark
## INFO  [16:32:51.177] [bbotk] Result of batch 22:
## INFO  [16:32:51.178] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:51.178] [bbotk]  0.034         2     900   0.9394338        0      0            0.183
## INFO  [16:32:51.178] [bbotk]                                 uhash
## INFO  [16:32:51.178] [bbotk]  c46bfc88-2416-4de6-8a95-0cf4856a5e58
## INFO  [16:32:51.178] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:51.202] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:51.205] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:51.448] [mlr3] Finished benchmark
## INFO  [16:32:51.459] [bbotk] Result of batch 23:
## INFO  [16:32:51.460] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:51.460] [bbotk]  0.023         4     700   0.9420671        0      0             0.24
## INFO  [16:32:51.460] [bbotk]                                 uhash
## INFO  [16:32:51.460] [bbotk]  11d99f77-b13f-45cc-b799-c5649eb364ee
## INFO  [16:32:51.460] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:51.477] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:51.480] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:51.805] [mlr3] Finished benchmark
## INFO  [16:32:51.816] [bbotk] Result of batch 24:
## INFO  [16:32:51.817] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:51.817] [bbotk]  0.001         6     700   0.9328506        0      0            0.321
## INFO  [16:32:51.817] [bbotk]                                 uhash
## INFO  [16:32:51.817] [bbotk]  2ea88f95-49c6-4afa-9f46-fef55807aa93
## INFO  [16:32:51.817] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:51.834] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:51.837] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:52.063] [mlr3] Finished benchmark
## INFO  [16:32:52.073] [bbotk] Result of batch 25:
## INFO  [16:32:52.074] [bbotk]  eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:52.074] [bbotk]  0.1         3     900   0.9420671        0      0            0.222
## INFO  [16:32:52.074] [bbotk]                                 uhash
## INFO  [16:32:52.074] [bbotk]  27660f7a-0475-4239-a071-b41f97d90419
## INFO  [16:32:52.075] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:52.092] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:52.094] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:52.335] [mlr3] Finished benchmark
## INFO  [16:32:52.345] [bbotk] Result of batch 26:
## INFO  [16:32:52.346] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:52.346] [bbotk]  0.089         3     900   0.9433838        0      0            0.237
## INFO  [16:32:52.346] [bbotk]                                 uhash
## INFO  [16:32:52.346] [bbotk]  01fbf5f7-9a95-4700-8672-ba38c8b695d0
## INFO  [16:32:52.347] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:52.363] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:52.366] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:52.399] [mlr3] Finished benchmark
## INFO  [16:32:52.409] [bbotk] Result of batch 27:
## INFO  [16:32:52.410] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:52.410] [bbotk]  0.078         1     200   0.9203423        0      0             0.03
## INFO  [16:32:52.410] [bbotk]                                 uhash
## INFO  [16:32:52.410] [bbotk]  fda96aab-f19f-4d3f-bd85-2de78c84d218
## INFO  [16:32:52.410] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:52.427] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:52.430] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:52.544] [mlr3] Finished benchmark
## INFO  [16:32:52.555] [bbotk] Result of batch 28:
## INFO  [16:32:52.556] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:52.556] [bbotk]  0.078         3     400   0.9512837        0      0            0.111
## INFO  [16:32:52.556] [bbotk]                                 uhash
## INFO  [16:32:52.556] [bbotk]  6eba0fb2-248f-478e-8440-313c710ed018
## INFO  [16:32:52.556] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:52.573] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:52.575] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:52.776] [mlr3] Finished benchmark
## INFO  [16:32:52.787] [bbotk] Result of batch 29:
## INFO  [16:32:52.788] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:52.788] [bbotk]  0.067         5     600   0.9414088        0      0            0.196
## INFO  [16:32:52.788] [bbotk]                                 uhash
## INFO  [16:32:52.788] [bbotk]  2ff5754d-b5d9-4286-8b57-19320e0f350b
## INFO  [16:32:52.788] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:52.805] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:52.807] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:53.110] [mlr3] Finished benchmark
## INFO  [16:32:53.121] [bbotk] Result of batch 30:
## INFO  [16:32:53.122] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:53.122] [bbotk]  0.078         4     800   0.9400922        0      0            0.298
## INFO  [16:32:53.122] [bbotk]                                 uhash
## INFO  [16:32:53.122] [bbotk]  ff930b48-000d-4162-8244-d210a6911fb6
## INFO  [16:32:53.122] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:53.139] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:53.142] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:53.375] [mlr3] Finished benchmark
## INFO  [16:32:53.386] [bbotk] Result of batch 31:
## INFO  [16:32:53.387] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:53.387] [bbotk]  0.078         3     900   0.9420671        0      0             0.23
## INFO  [16:32:53.387] [bbotk]                                 uhash
## INFO  [16:32:53.387] [bbotk]  f55d0e9a-2a7f-44c3-9142-ab724d4a1f15
## INFO  [16:32:53.387] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:53.404] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:53.407] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:53.517] [mlr3] Finished benchmark
## INFO  [16:32:53.528] [bbotk] Result of batch 32:
## INFO  [16:32:53.528] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:53.528] [bbotk]  0.012         1     800   0.9065174        0      0            0.106
## INFO  [16:32:53.528] [bbotk]                                 uhash
## INFO  [16:32:53.528] [bbotk]  5229b13a-cc30-4140-9060-a872d4f1f725
## INFO  [16:32:53.529] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:53.545] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:53.548] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:53.826] [mlr3] Finished benchmark
## INFO  [16:32:53.837] [bbotk] Result of batch 33:
## INFO  [16:32:53.838] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:53.838] [bbotk]  0.045         6     800   0.9460171        0      0            0.274
## INFO  [16:32:53.838] [bbotk]                                 uhash
## INFO  [16:32:53.838] [bbotk]  1973db56-8ba2-4b9c-836d-0048a97ae9ce
## INFO  [16:32:53.838] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:53.867] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:53.871] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:53.901] [mlr3] Finished benchmark
## INFO  [16:32:53.912] [bbotk] Result of batch 34:
## INFO  [16:32:53.913] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:53.913] [bbotk]  0.045         2     100   0.9348255        0      0            0.025
## INFO  [16:32:53.913] [bbotk]                                 uhash
## INFO  [16:32:53.913] [bbotk]  dd5882f3-a87f-422b-94ff-1c7245c11e60
## INFO  [16:32:53.913] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:53.929] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:53.932] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:54.177] [mlr3] Finished benchmark
## INFO  [16:32:54.187] [bbotk] Result of batch 35:
## INFO  [16:32:54.188] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:54.188] [bbotk]  0.045         5     700   0.9420671        0      0            0.242
## INFO  [16:32:54.188] [bbotk]                                 uhash
## INFO  [16:32:54.188] [bbotk]  dba2174e-47bc-45d9-ad4f-6ac6e5250f1c
## INFO  [16:32:54.189] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:54.206] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:54.208] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:54.285] [mlr3] Finished benchmark
## INFO  [16:32:54.296] [bbotk] Result of batch 36:
## INFO  [16:32:54.297] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:54.297] [bbotk]  0.034         4     200   0.9512837        0      0            0.073
## INFO  [16:32:54.297] [bbotk]                                 uhash
## INFO  [16:32:54.297] [bbotk]  f2cac189-a995-495c-898c-fe6830787a44
## INFO  [16:32:54.297] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:54.314] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:54.317] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:54.741] [mlr3] Finished benchmark
## INFO  [16:32:54.752] [bbotk] Result of batch 37:
## INFO  [16:32:54.752] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:54.752] [bbotk]  0.001         5    1000   0.9295589        0      0            0.421
## INFO  [16:32:54.752] [bbotk]                                 uhash
## INFO  [16:32:54.752] [bbotk]  5bd174cb-9376-4135-9357-351621c75fe9
## INFO  [16:32:54.753] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:54.769] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:54.772] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:54.927] [mlr3] Finished benchmark
## INFO  [16:32:54.938] [bbotk] Result of batch 38:
## INFO  [16:32:54.939] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:54.939] [bbotk]  0.078         3     500   0.9394338        0      0            0.152
## INFO  [16:32:54.939] [bbotk]                                 uhash
## INFO  [16:32:54.939] [bbotk]  b04671e7-b115-483f-83ee-8407da6c71af
## INFO  [16:32:54.940] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:54.956] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:54.959] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:55.230] [mlr3] Finished benchmark
## INFO  [16:32:55.241] [bbotk] Result of batch 39:
## INFO  [16:32:55.242] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:55.242] [bbotk]  0.056         4     900   0.9400922        0      0            0.267
## INFO  [16:32:55.242] [bbotk]                                 uhash
## INFO  [16:32:55.242] [bbotk]  c9db5e64-74f4-411c-a613-a7a870dabd45
## INFO  [16:32:55.243] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:55.260] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:55.262] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:55.622] [mlr3] Finished benchmark
## INFO  [16:32:55.632] [bbotk] Result of batch 40:
## INFO  [16:32:55.633] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:55.633] [bbotk]  0.012         5     900   0.9473338        0      0            0.356
## INFO  [16:32:55.633] [bbotk]                                 uhash
## INFO  [16:32:55.633] [bbotk]  d65d8ec3-054d-4990-8a62-79dca1b3dec6
## INFO  [16:32:55.634] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:55.651] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:55.653] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:55.901] [mlr3] Finished benchmark
## INFO  [16:32:55.912] [bbotk] Result of batch 41:
## INFO  [16:32:55.913] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:55.913] [bbotk]  0.056         4     800   0.9506254        0      0            0.244
## INFO  [16:32:55.913] [bbotk]                                 uhash
## INFO  [16:32:55.913] [bbotk]  52b1a251-0be5-4272-a599-4c1fffea89fc
## INFO  [16:32:55.913] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:55.946] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:55.949] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:56.214] [mlr3] Finished benchmark
## INFO  [16:32:56.225] [bbotk] Result of batch 42:
## INFO  [16:32:56.225] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:56.225] [bbotk]  0.078         5     900   0.9328506        0      0            0.261
## INFO  [16:32:56.225] [bbotk]                                 uhash
## INFO  [16:32:56.225] [bbotk]  6c422c13-f4ce-419d-bbf5-c7807d0078d6
## INFO  [16:32:56.226] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:56.242] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:56.245] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:56.313] [mlr3] Finished benchmark
## INFO  [16:32:56.324] [bbotk] Result of batch 43:
## INFO  [16:32:56.324] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:56.324] [bbotk]  0.012         2     300   0.9242923        0      0            0.064
## INFO  [16:32:56.324] [bbotk]                                 uhash
## INFO  [16:32:56.324] [bbotk]  b1986714-512d-470c-9fbd-84be50cbff2b
## INFO  [16:32:56.325] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:56.342] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:56.345] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:56.509] [mlr3] Finished benchmark
## INFO  [16:32:56.520] [bbotk] Result of batch 44:
## INFO  [16:32:56.520] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:56.520] [bbotk]  0.078         3     600   0.9407505        0      0             0.16
## INFO  [16:32:56.520] [bbotk]                                 uhash
## INFO  [16:32:56.520] [bbotk]  93bb14a6-600e-4b52-bd4e-c5a17fef93ec
## INFO  [16:32:56.521] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:56.538] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:56.540] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:56.715] [mlr3] Finished benchmark
## INFO  [16:32:56.725] [bbotk] Result of batch 45:
## INFO  [16:32:56.726] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:56.726] [bbotk]  0.034         4     500   0.9427255        0      0            0.171
## INFO  [16:32:56.726] [bbotk]                                 uhash
## INFO  [16:32:56.726] [bbotk]  6327b7af-8082-4bb2-aae8-f549a1799ec8
## INFO  [16:32:56.727] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:56.759] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:56.762] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:56.944] [mlr3] Finished benchmark
## INFO  [16:32:56.955] [bbotk] Result of batch 46:
## INFO  [16:32:56.956] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:56.956] [bbotk]  0.078         2     900   0.9387755        0      0            0.179
## INFO  [16:32:56.956] [bbotk]                                 uhash
## INFO  [16:32:56.956] [bbotk]  d3e9310b-d45e-41d0-819e-b5d1b92880ca
## INFO  [16:32:56.956] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:56.973] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:56.976] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:57.026] [mlr3] Finished benchmark
## INFO  [16:32:57.037] [bbotk] Result of batch 47:
## INFO  [16:32:57.037] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:57.037] [bbotk]  0.067         6     100   0.9374589        0      0            0.046
## INFO  [16:32:57.037] [bbotk]                                 uhash
## INFO  [16:32:57.037] [bbotk]  3d1afea5-51a9-401a-9bc8-57e5562714a6
## INFO  [16:32:57.038] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:57.055] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:57.058] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:57.273] [mlr3] Finished benchmark
## INFO  [16:32:57.283] [bbotk] Result of batch 48:
## INFO  [16:32:57.284] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:57.284] [bbotk]  0.056         6     600   0.9466754        0      0            0.211
## INFO  [16:32:57.284] [bbotk]                                 uhash
## INFO  [16:32:57.284] [bbotk]  f8bb8ae7-f07b-4a95-89dc-6a63eafd0d87
## INFO  [16:32:57.285] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:57.301] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:57.304] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:57.420] [mlr3] Finished benchmark
## INFO  [16:32:57.432] [bbotk] Result of batch 49:
## INFO  [16:32:57.432] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:57.432] [bbotk]  0.012         4     300   0.9407505        0      0            0.113
## INFO  [16:32:57.432] [bbotk]                                 uhash
## INFO  [16:32:57.432] [bbotk]  53015c61-04e2-4a07-b15b-f14b8be0f73b
## INFO  [16:32:57.433] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:57.449] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:57.460] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:57.728] [mlr3] Finished benchmark
## INFO  [16:32:57.739] [bbotk] Result of batch 50:
## INFO  [16:32:57.740] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:57.740] [bbotk]  0.078         4     900   0.9433838        0      0            0.265
## INFO  [16:32:57.740] [bbotk]                                 uhash
## INFO  [16:32:57.740] [bbotk]  4ca8607b-cc9d-486f-88a0-d2a034338349
## INFO  [16:32:57.742] [bbotk] Finished optimizing after 50 evaluation(s)
## INFO  [16:32:57.742] [bbotk] Result:
## INFO  [16:32:57.743] [bbotk]    eta max_depth nrounds learner_param_vals  x_domain classif.auc
## INFO  [16:32:57.743] [bbotk]  0.078         3     400          <list[7]> <list[3]>   0.9512837
## INFO  [16:32:57.897] [mlr3] Applying learner 'classif.xgboost.tuned' on task 'pe' (iter 2/3)
## INFO  [16:32:57.937] [bbotk] Starting to optimize 3 parameter(s) with '<TunerGridSearch>' and '<TerminatorEvals> [n_evals=50, k=0]'
## INFO  [16:32:57.938] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:57.955] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:57.958] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:58.185] [mlr3] Finished benchmark
## INFO  [16:32:58.194] [bbotk] Result of batch 1:
## INFO  [16:32:58.195] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:58.195] [bbotk]  0.089         4     800   0.8956631        0      0            0.223
## INFO  [16:32:58.195] [bbotk]                                 uhash
## INFO  [16:32:58.195] [bbotk]  34e4365e-bef1-4d3f-937e-179e29113e47
## INFO  [16:32:58.195] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:58.212] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:58.215] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:58.393] [mlr3] Finished benchmark
## INFO  [16:32:58.404] [bbotk] Result of batch 2:
## INFO  [16:32:58.404] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:58.404] [bbotk]  0.089         3     600   0.8950346        0      0            0.175
## INFO  [16:32:58.404] [bbotk]                                 uhash
## INFO  [16:32:58.404] [bbotk]  1b749404-50e1-4ba4-9bd6-960bc2fa1d39
## INFO  [16:32:58.405] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:58.422] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:58.424] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:58.694] [mlr3] Finished benchmark
## INFO  [16:32:58.705] [bbotk] Result of batch 3:
## INFO  [16:32:58.706] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:58.706] [bbotk]  0.023         5     700   0.9006914        0      0            0.267
## INFO  [16:32:58.706] [bbotk]                                 uhash
## INFO  [16:32:58.706] [bbotk]  447813d0-903a-4b03-9356-8ad2fe26b5fc
## INFO  [16:32:58.706] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:58.723] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:58.726] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:58.861] [mlr3] Finished benchmark
## INFO  [16:32:58.872] [bbotk] Result of batch 4:
## INFO  [16:32:58.872] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:58.872] [bbotk]  0.056         1    1000   0.8862351        0      0            0.131
## INFO  [16:32:58.872] [bbotk]                                 uhash
## INFO  [16:32:58.872] [bbotk]  e5150400-4f45-47c6-967e-179fa97bcf55
## INFO  [16:32:58.873] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:58.890] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:58.892] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:59.013] [mlr3] Finished benchmark
## INFO  [16:32:59.024] [bbotk] Result of batch 5:
## INFO  [16:32:59.024] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:59.024] [bbotk]  0.012         3     400    0.894406        0      0            0.117
## INFO  [16:32:59.024] [bbotk]                                 uhash
## INFO  [16:32:59.024] [bbotk]  e8529120-4d41-4927-8f97-1ef20eb2d28a
## INFO  [16:32:59.025] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:59.057] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:59.060] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:59.265] [mlr3] Finished benchmark
## INFO  [16:32:59.276] [bbotk] Result of batch 6:
## INFO  [16:32:59.276] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:59.276] [bbotk]  0.034         4     600   0.8893777        0      0            0.201
## INFO  [16:32:59.276] [bbotk]                                 uhash
## INFO  [16:32:59.276] [bbotk]  02ca8031-2fc6-40d8-8fae-e824c082651a
## INFO  [16:32:59.277] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:59.294] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:59.296] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:59.373] [mlr3] Finished benchmark
## INFO  [16:32:59.383] [bbotk] Result of batch 7:
## INFO  [16:32:59.384] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:59.384] [bbotk]  0.034         4     200   0.9019485        0      0            0.074
## INFO  [16:32:59.384] [bbotk]                                 uhash
## INFO  [16:32:59.384] [bbotk]  554c68cb-6ec7-4091-aea6-0335a42ec283
## INFO  [16:32:59.385] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:59.402] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:59.404] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:59.518] [mlr3] Finished benchmark
## INFO  [16:32:59.529] [bbotk] Result of batch 8:
## INFO  [16:32:59.530] [bbotk]  eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:59.530] [bbotk]  0.1         3     400   0.8812068        0      0             0.11
## INFO  [16:32:59.530] [bbotk]                                 uhash
## INFO  [16:32:59.530] [bbotk]  52e9e022-1aee-4e50-bb4b-db9267c402d1
## INFO  [16:32:59.530] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:59.547] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:59.549] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:32:59.781] [mlr3] Finished benchmark
## INFO  [16:32:59.791] [bbotk] Result of batch 9:
## INFO  [16:32:59.792] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:32:59.792] [bbotk]  0.012         3     800   0.8962916        0      0            0.227
## INFO  [16:32:59.792] [bbotk]                                 uhash
## INFO  [16:32:59.792] [bbotk]  bd7f2876-f2bb-4571-a4d3-8d4b3c173d80
## INFO  [16:32:59.793] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:32:59.822] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:32:59.826] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:00.104] [mlr3] Finished benchmark
## INFO  [16:33:00.115] [bbotk] Result of batch 10:
## INFO  [16:33:00.115] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:00.115] [bbotk]  0.045         6     800   0.8843495        0      0            0.274
## INFO  [16:33:00.115] [bbotk]                                 uhash
## INFO  [16:33:00.115] [bbotk]  e86fe17f-147a-4ec5-b6f0-d005d1bf3031
## INFO  [16:33:00.116] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:00.133] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:00.136] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:00.263] [mlr3] Finished benchmark
## INFO  [16:33:00.274] [bbotk] Result of batch 11:
## INFO  [16:33:00.275] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:00.275] [bbotk]  0.078         2     600   0.8969202        0      0            0.123
## INFO  [16:33:00.275] [bbotk]                                 uhash
## INFO  [16:33:00.275] [bbotk]  ca4956a9-de18-4b41-84eb-719340f4c942
## INFO  [16:33:00.275] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:00.292] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:00.295] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:00.337] [mlr3] Finished benchmark
## INFO  [16:33:00.348] [bbotk] Result of batch 12:
## INFO  [16:33:00.349] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:00.349] [bbotk]  0.045         4     100   0.8950346        0      0            0.039
## INFO  [16:33:00.349] [bbotk]                                 uhash
## INFO  [16:33:00.349] [bbotk]  8bba2a18-b1bc-4806-83ab-bc7a6b945550
## INFO  [16:33:00.349] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:00.366] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:00.369] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:00.510] [mlr3] Finished benchmark
## INFO  [16:33:00.520] [bbotk] Result of batch 13:
## INFO  [16:33:00.521] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:00.521] [bbotk]  0.078         5     400   0.8956631        0      0            0.138
## INFO  [16:33:00.521] [bbotk]                                 uhash
## INFO  [16:33:00.521] [bbotk]  38a0a038-3e0b-4775-8019-699cda041012
## INFO  [16:33:00.522] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:00.538] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:00.549] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:00.793] [mlr3] Finished benchmark
## INFO  [16:33:00.803] [bbotk] Result of batch 14:
## INFO  [16:33:00.804] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:00.804] [bbotk]  0.067         3     900   0.8918919        0      0            0.239
## INFO  [16:33:00.804] [bbotk]                                 uhash
## INFO  [16:33:00.804] [bbotk]  ff487a03-5f3d-4e93-b616-b0fab5f011fd
## INFO  [16:33:00.805] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:00.821] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:00.824] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:00.904] [mlr3] Finished benchmark
## INFO  [16:33:00.915] [bbotk] Result of batch 15:
## INFO  [16:33:00.915] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:00.915] [bbotk]  0.089         5     200    0.884978        0      0            0.077
## INFO  [16:33:00.915] [bbotk]                                 uhash
## INFO  [16:33:00.915] [bbotk]  5756c39c-0ea0-4d29-9319-6b55d1fb688b
## INFO  [16:33:00.916] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:00.933] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:00.936] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:01.280] [mlr3] Finished benchmark
## INFO  [16:33:01.290] [bbotk] Result of batch 16:
## INFO  [16:33:01.291] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:01.291] [bbotk]  0.001         5     800   0.8843495        0      0             0.34
## INFO  [16:33:01.291] [bbotk]                                 uhash
## INFO  [16:33:01.291] [bbotk]  4b9e6008-6d27-4ba2-8e31-d0e541f16332
## INFO  [16:33:01.291] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:01.309] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:01.311] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:01.460] [mlr3] Finished benchmark
## INFO  [16:33:01.470] [bbotk] Result of batch 17:
## INFO  [16:33:01.471] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:01.471] [bbotk]  0.067         6     400   0.8906348        0      0            0.145
## INFO  [16:33:01.471] [bbotk]                                 uhash
## INFO  [16:33:01.471] [bbotk]  52477df0-a525-4c7c-b431-30528871c84c
## INFO  [16:33:01.471] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:01.500] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:01.504] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:01.574] [mlr3] Finished benchmark
## INFO  [16:33:01.584] [bbotk] Result of batch 18:
## INFO  [16:33:01.585] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:01.585] [bbotk]  0.023         2     300   0.8856065        0      0            0.065
## INFO  [16:33:01.585] [bbotk]                                 uhash
## INFO  [16:33:01.585] [bbotk]  42760353-2665-412a-b31d-58574ffd1e63
## INFO  [16:33:01.586] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:01.602] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:01.605] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:01.765] [mlr3] Finished benchmark
## INFO  [16:33:01.775] [bbotk] Result of batch 19:
## INFO  [16:33:01.776] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:01.776] [bbotk]  0.045         6     400   0.8856065        0      0            0.156
## INFO  [16:33:01.776] [bbotk]                                 uhash
## INFO  [16:33:01.776] [bbotk]  c4ffa763-e634-4901-82b6-aa85905b8b59
## INFO  [16:33:01.777] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:01.794] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:01.797] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:02.055] [mlr3] Finished benchmark
## INFO  [16:33:02.067] [bbotk] Result of batch 20:
## INFO  [16:33:02.068] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:02.068] [bbotk]  0.089         5     900   0.8874921        0      0            0.255
## INFO  [16:33:02.068] [bbotk]                                 uhash
## INFO  [16:33:02.068] [bbotk]  fa92f515-856f-4886-87c4-11020ec0f080
## INFO  [16:33:02.069] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:02.086] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:02.089] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:02.205] [mlr3] Finished benchmark
## INFO  [16:33:02.215] [bbotk] Result of batch 21:
## INFO  [16:33:02.216] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:02.216] [bbotk]  0.067         5     300   0.8856065        0      0            0.112
## INFO  [16:33:02.216] [bbotk]                                 uhash
## INFO  [16:33:02.216] [bbotk]  cc27fb14-2047-4217-9b16-47f5d5e2ebcd
## INFO  [16:33:02.217] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:02.242] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:02.246] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:02.375] [mlr3] Finished benchmark
## INFO  [16:33:02.386] [bbotk] Result of batch 22:
## INFO  [16:33:02.386] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:02.386] [bbotk]  0.067         1     900    0.893149        0      0            0.124
## INFO  [16:33:02.386] [bbotk]                                 uhash
## INFO  [16:33:02.386] [bbotk]  0b03f49e-ba40-4e8c-a68e-811420a24375
## INFO  [16:33:02.387] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:02.404] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:02.407] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:02.720] [mlr3] Finished benchmark
## INFO  [16:33:02.733] [bbotk] Result of batch 23:
## INFO  [16:33:02.734] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:02.734] [bbotk]  0.034         5     900   0.8874921        0      0             0.31
## INFO  [16:33:02.734] [bbotk]                                 uhash
## INFO  [16:33:02.734] [bbotk]  4f16bd71-f869-4483-8733-15b1a611dafe
## INFO  [16:33:02.734] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:02.751] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:02.754] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:02.903] [mlr3] Finished benchmark
## INFO  [16:33:02.914] [bbotk] Result of batch 24:
## INFO  [16:33:02.914] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:02.914] [bbotk]  0.067         5     400   0.8881207        0      0            0.145
## INFO  [16:33:02.914] [bbotk]                                 uhash
## INFO  [16:33:02.914] [bbotk]  9f327817-ee86-4bbf-bbd8-49c71f561fb5
## INFO  [16:33:02.915] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:02.932] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:02.935] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:02.987] [mlr3] Finished benchmark
## INFO  [16:33:02.997] [bbotk] Result of batch 25:
## INFO  [16:33:02.998] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:02.998] [bbotk]  0.012         6     100   0.8799497        0      0            0.049
## INFO  [16:33:02.998] [bbotk]                                 uhash
## INFO  [16:33:02.998] [bbotk]  dc3deefd-56ce-407c-9312-8609ea1940cd
## INFO  [16:33:02.999] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:03.032] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:03.034] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:03.293] [mlr3] Finished benchmark
## INFO  [16:33:03.304] [bbotk] Result of batch 26:
## INFO  [16:33:03.305] [bbotk]  eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:03.305] [bbotk]  0.1         4    1000   0.8988058        0      0            0.256
## INFO  [16:33:03.305] [bbotk]                                 uhash
## INFO  [16:33:03.305] [bbotk]  cca2e973-3221-4296-a285-9b6fe8894495
## INFO  [16:33:03.305] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:03.322] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:03.325] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:03.352] [mlr3] Finished benchmark
## INFO  [16:33:03.363] [bbotk] Result of batch 27:
## INFO  [16:33:03.364] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:03.364] [bbotk]  0.034         2     100   0.8705217        0      0            0.024
## INFO  [16:33:03.364] [bbotk]                                 uhash
## INFO  [16:33:03.364] [bbotk]  669c3310-5a58-4b08-b28b-734f63d15676
## INFO  [16:33:03.364] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:03.382] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:03.384] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:03.549] [mlr3] Finished benchmark
## INFO  [16:33:03.561] [bbotk] Result of batch 28:
## INFO  [16:33:03.561] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:03.561] [bbotk]  0.067         2     800   0.8969202        0      0            0.162
## INFO  [16:33:03.561] [bbotk]                                 uhash
## INFO  [16:33:03.561] [bbotk]  b811fe43-558e-4221-bba6-a914fa83b0d4
## INFO  [16:33:03.562] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:03.579] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:03.581] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:03.799] [mlr3] Finished benchmark
## INFO  [16:33:03.824] [bbotk] Result of batch 29:
## INFO  [16:33:03.825] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:03.825] [bbotk]  0.056         3     800   0.8900063        0      0            0.215
## INFO  [16:33:03.825] [bbotk]                                 uhash
## INFO  [16:33:03.825] [bbotk]  7078a2b9-e242-4d6a-8a13-054a9a7e223d
## INFO  [16:33:03.826] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:03.845] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:03.847] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:03.893] [mlr3] Finished benchmark
## INFO  [16:33:03.903] [bbotk] Result of batch 30:
## INFO  [16:33:03.904] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:03.904] [bbotk]  0.023         1     300   0.8447517        0      0            0.042
## INFO  [16:33:03.904] [bbotk]                                 uhash
## INFO  [16:33:03.904] [bbotk]  a48108ea-c690-45d7-a342-f461b46e6869
## INFO  [16:33:03.905] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:03.922] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:03.924] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:04.074] [mlr3] Finished benchmark
## INFO  [16:33:04.085] [bbotk] Result of batch 31:
## INFO  [16:33:04.086] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:04.086] [bbotk]  0.034         2     700   0.9038341        0      0            0.146
## INFO  [16:33:04.086] [bbotk]                                 uhash
## INFO  [16:33:04.086] [bbotk]  c16c445d-5902-4513-84a8-a875055eb127
## INFO  [16:33:04.086] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:04.103] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:04.106] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:04.303] [mlr3] Finished benchmark
## INFO  [16:33:04.314] [bbotk] Result of batch 32:
## INFO  [16:33:04.315] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:04.315] [bbotk]  0.001         2     900   0.8724073        0      0            0.192
## INFO  [16:33:04.315] [bbotk]                                 uhash
## INFO  [16:33:04.315] [bbotk]  1acf9d62-e066-4f1f-81b3-7ec85d02636b
## INFO  [16:33:04.315] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:04.332] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:04.335] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:04.625] [mlr3] Finished benchmark
## INFO  [16:33:04.636] [bbotk] Result of batch 33:
## INFO  [16:33:04.637] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:04.637] [bbotk]  0.001         6     600   0.8862351        0      0            0.287
## INFO  [16:33:04.637] [bbotk]                                 uhash
## INFO  [16:33:04.637] [bbotk]  165cbf82-4701-4602-a683-79dd3d294f10
## INFO  [16:33:04.638] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:04.654] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:04.657] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:04.879] [mlr3] Finished benchmark
## INFO  [16:33:04.890] [bbotk] Result of batch 34:
## INFO  [16:33:04.891] [bbotk]  eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:04.891] [bbotk]  0.1         4     800   0.8799497        0      0            0.218
## INFO  [16:33:04.891] [bbotk]                                 uhash
## INFO  [16:33:04.891] [bbotk]  61c0aaed-8e81-4c6e-91f1-c4b0bc403375
## INFO  [16:33:04.891] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:04.909] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:04.912] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:04.960] [mlr3] Finished benchmark
## INFO  [16:33:04.971] [bbotk] Result of batch 35:
## INFO  [16:33:04.972] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:04.972] [bbotk]  0.001         2     200   0.8661219        0      0            0.044
## INFO  [16:33:04.972] [bbotk]                                 uhash
## INFO  [16:33:04.972] [bbotk]  7beac3a1-6824-4024-b41f-d22a2d52a1e4
## INFO  [16:33:04.972] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:04.990] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:04.992] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:05.027] [mlr3] Finished benchmark
## INFO  [16:33:05.038] [bbotk] Result of batch 36:
## INFO  [16:33:05.038] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:05.038] [bbotk]  0.067         3     100   0.8881207        0      0            0.031
## INFO  [16:33:05.038] [bbotk]                                 uhash
## INFO  [16:33:05.038] [bbotk]  47d9abee-29c7-4030-aab4-529ef05f2530
## INFO  [16:33:05.039] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:05.056] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:05.058] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:05.256] [mlr3] Finished benchmark
## INFO  [16:33:05.266] [bbotk] Result of batch 37:
## INFO  [16:33:05.267] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:05.267] [bbotk]  0.089         2     900   0.8843495        0      0            0.194
## INFO  [16:33:05.267] [bbotk]                                 uhash
## INFO  [16:33:05.267] [bbotk]  d9a13c5b-1034-4f41-9d70-a29b7f3abcbb
## INFO  [16:33:05.268] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:05.284] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:05.287] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:05.580] [mlr3] Finished benchmark
## INFO  [16:33:05.591] [bbotk] Result of batch 38:
## INFO  [16:33:05.592] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:05.592] [bbotk]  0.034         6     800   0.8906348        0      0            0.289
## INFO  [16:33:05.592] [bbotk]                                 uhash
## INFO  [16:33:05.592] [bbotk]  a6af2491-3290-4664-b606-c92ff77c1ef3
## INFO  [16:33:05.592] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:05.609] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:05.612] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:05.736] [mlr3] Finished benchmark
## INFO  [16:33:05.748] [bbotk] Result of batch 39:
## INFO  [16:33:05.748] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:05.748] [bbotk]  0.001         1     900   0.8258957        0      0            0.121
## INFO  [16:33:05.748] [bbotk]                                 uhash
## INFO  [16:33:05.748] [bbotk]  e5e51014-2772-40fc-bab7-9da01d21993b
## INFO  [16:33:05.749] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:05.767] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:05.770] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:06.004] [mlr3] Finished benchmark
## INFO  [16:33:06.029] [bbotk] Result of batch 40:
## INFO  [16:33:06.030] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:06.030] [bbotk]  0.078         3     900     0.87555        0      0             0.23
## INFO  [16:33:06.030] [bbotk]                                 uhash
## INFO  [16:33:06.030] [bbotk]  bbe16013-4f5f-4e8f-ac89-4c57ae83ac55
## INFO  [16:33:06.031] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:06.049] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:06.052] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:06.188] [mlr3] Finished benchmark
## INFO  [16:33:06.199] [bbotk] Result of batch 41:
## INFO  [16:33:06.199] [bbotk]  eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:06.199] [bbotk]  0.1         3     500   0.8887492        0      0            0.132
## INFO  [16:33:06.199] [bbotk]                                 uhash
## INFO  [16:33:06.199] [bbotk]  4e4d08de-9d87-475f-a74c-7a11d0d314bc
## INFO  [16:33:06.200] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:06.217] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:06.220] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:06.468] [mlr3] Finished benchmark
## INFO  [16:33:06.479] [bbotk] Result of batch 42:
## INFO  [16:33:06.480] [bbotk]  eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:06.480] [bbotk]  0.1         6     900   0.8818353        0      0            0.244
## INFO  [16:33:06.480] [bbotk]                                 uhash
## INFO  [16:33:06.480] [bbotk]  0ccd4663-dc61-4c53-acb1-383580451530
## INFO  [16:33:06.480] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:06.497] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:06.500] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:06.629] [mlr3] Finished benchmark
## INFO  [16:33:06.640] [bbotk] Result of batch 43:
## INFO  [16:33:06.641] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:06.641] [bbotk]  0.034         2     600   0.8956631        0      0            0.124
## INFO  [16:33:06.641] [bbotk]                                 uhash
## INFO  [16:33:06.641] [bbotk]  82cbd691-7e59-4a51-a0d5-a6fdd656c8fc
## INFO  [16:33:06.641] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:06.659] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:06.661] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:06.910] [mlr3] Finished benchmark
## INFO  [16:33:06.921] [bbotk] Result of batch 44:
## INFO  [16:33:06.921] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:06.921] [bbotk]  0.089         5     800   0.8950346        0      0            0.245
## INFO  [16:33:06.921] [bbotk]                                 uhash
## INFO  [16:33:06.921] [bbotk]  3439f0cd-b86c-431b-9e1a-f2eb7212125c
## INFO  [16:33:06.922] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:06.940] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:06.943] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:06.990] [mlr3] Finished benchmark
## INFO  [16:33:07.001] [bbotk] Result of batch 45:
## INFO  [16:33:07.002] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:07.002] [bbotk]  0.056         2     200   0.9032055        0      0            0.045
## INFO  [16:33:07.002] [bbotk]                                 uhash
## INFO  [16:33:07.002] [bbotk]  2d75f13d-3755-4877-9727-615d86e680af
## INFO  [16:33:07.003] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:07.020] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:07.023] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:07.190] [mlr3] Finished benchmark
## INFO  [16:33:07.201] [bbotk] Result of batch 46:
## INFO  [16:33:07.201] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:07.201] [bbotk]  0.056         3     600   0.8918919        0      0            0.163
## INFO  [16:33:07.201] [bbotk]                                 uhash
## INFO  [16:33:07.201] [bbotk]  2a8dc0be-d982-4130-8996-a3824f38a0ea
## INFO  [16:33:07.202] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:07.219] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:07.222] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:07.268] [mlr3] Finished benchmark
## INFO  [16:33:07.279] [bbotk] Result of batch 47:
## INFO  [16:33:07.279] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:07.279] [bbotk]  0.089         5     100   0.8812068        0      0            0.042
## INFO  [16:33:07.279] [bbotk]                                 uhash
## INFO  [16:33:07.279] [bbotk]  1c5e573e-944a-486e-b0e6-7b4680d96f84
## INFO  [16:33:07.280] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:07.296] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:07.299] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:07.452] [mlr3] Finished benchmark
## INFO  [16:33:07.463] [bbotk] Result of batch 48:
## INFO  [16:33:07.464] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:07.464] [bbotk]  0.056         4     400    0.894406        0      0            0.149
## INFO  [16:33:07.464] [bbotk]                                 uhash
## INFO  [16:33:07.464] [bbotk]  5e21dda6-a462-4ab5-bff0-834e45a3ca4e
## INFO  [16:33:07.464] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:07.481] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:07.483] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:07.542] [mlr3] Finished benchmark
## INFO  [16:33:07.552] [bbotk] Result of batch 49:
## INFO  [16:33:07.553] [bbotk]  eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:07.553] [bbotk]  0.1         1     400   0.8705217        0      0            0.056
## INFO  [16:33:07.553] [bbotk]                                 uhash
## INFO  [16:33:07.553] [bbotk]  860b0bda-cad0-471d-be8a-ab3f9ba35304
## INFO  [16:33:07.553] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:07.570] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:07.573] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:07.666] [mlr3] Finished benchmark
## INFO  [16:33:07.677] [bbotk] Result of batch 50:
## INFO  [16:33:07.678] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:07.678] [bbotk]  0.012         5     200    0.884978        0      0            0.089
## INFO  [16:33:07.678] [bbotk]                                 uhash
## INFO  [16:33:07.678] [bbotk]  5954df99-7554-49ca-a1a5-17717081ce77
## INFO  [16:33:07.680] [bbotk] Finished optimizing after 50 evaluation(s)
## INFO  [16:33:07.680] [bbotk] Result:
## INFO  [16:33:07.681] [bbotk]    eta max_depth nrounds learner_param_vals  x_domain classif.auc
## INFO  [16:33:07.681] [bbotk]  0.034         2     700          <list[7]> <list[3]>   0.9038341
## INFO  [16:33:07.872] [mlr3] Applying learner 'classif.xgboost.tuned' on task 'pe' (iter 3/3)
## INFO  [16:33:07.925] [bbotk] Starting to optimize 3 parameter(s) with '<TunerGridSearch>' and '<TerminatorEvals> [n_evals=50, k=0]'
## INFO  [16:33:07.927] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:07.944] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:07.946] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:08.101] [mlr3] Finished benchmark
## INFO  [16:33:08.110] [bbotk] Result of batch 1:
## INFO  [16:33:08.111] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:08.111] [bbotk]  0.078         4     500   0.8680425        0      0            0.151
## INFO  [16:33:08.111] [bbotk]                                 uhash
## INFO  [16:33:08.111] [bbotk]  be47e8db-25b8-4b06-9d01-323a18f3369c
## INFO  [16:33:08.112] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:08.129] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:08.132] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:08.202] [mlr3] Finished benchmark
## INFO  [16:33:08.214] [bbotk] Result of batch 2:
## INFO  [16:33:08.214] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:08.214] [bbotk]  0.001         2     300   0.8649156        0      0            0.067
## INFO  [16:33:08.214] [bbotk]                                 uhash
## INFO  [16:33:08.214] [bbotk]  cab48acd-290f-4545-a2c0-31e0e9fe6132
## INFO  [16:33:08.215] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:08.232] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:08.235] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:08.401] [mlr3] Finished benchmark
## INFO  [16:33:08.412] [bbotk] Result of batch 3:
## INFO  [16:33:08.413] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:08.413] [bbotk]  0.034         2     800    0.879925        0      0            0.163
## INFO  [16:33:08.413] [bbotk]                                 uhash
## INFO  [16:33:08.413] [bbotk]  9c9d163b-5d92-4ff5-b7e2-8e1e0b02c4ac
## INFO  [16:33:08.413] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:08.430] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:08.433] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:08.681] [mlr3] Finished benchmark
## INFO  [16:33:08.693] [bbotk] Result of batch 4:
## INFO  [16:33:08.694] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:08.694] [bbotk]  0.012         3     800   0.8986867        0      0            0.245
## INFO  [16:33:08.694] [bbotk]                                 uhash
## INFO  [16:33:08.694] [bbotk]  1686969f-8ba0-487e-87af-c81ff431573d
## INFO  [16:33:08.695] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:08.712] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:08.715] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:08.923] [mlr3] Finished benchmark
## INFO  [16:33:08.934] [bbotk] Result of batch 5:
## INFO  [16:33:08.934] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:08.934] [bbotk]  0.078         5     700   0.8805503        0      0            0.203
## INFO  [16:33:08.934] [bbotk]                                 uhash
## INFO  [16:33:08.934] [bbotk]  dc35c7bc-f489-4e4c-a50f-45be1c100bd8
## INFO  [16:33:08.935] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:08.953] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:08.955] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:09.231] [mlr3] Finished benchmark
## INFO  [16:33:09.242] [bbotk] Result of batch 6:
## INFO  [16:33:09.243] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:09.243] [bbotk]  0.034         5     800   0.8924328        0      0            0.271
## INFO  [16:33:09.243] [bbotk]                                 uhash
## INFO  [16:33:09.243] [bbotk]  8b3c3757-ac2d-4434-ae0f-2957bc1570a4
## INFO  [16:33:09.243] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:09.261] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:09.263] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:09.311] [mlr3] Finished benchmark
## INFO  [16:33:09.322] [bbotk] Result of batch 7:
## INFO  [16:33:09.323] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:09.323] [bbotk]  0.067         2     200   0.8886804        0      0            0.044
## INFO  [16:33:09.323] [bbotk]                                 uhash
## INFO  [16:33:09.323] [bbotk]  6ffee344-cf84-427f-888f-d1ad6da8f6fb
## INFO  [16:33:09.323] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:09.400] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:09.405] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:09.460] [mlr3] Finished benchmark
## INFO  [16:33:09.471] [bbotk] Result of batch 8:
## INFO  [16:33:09.472] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:09.472] [bbotk]  0.034         5     100   0.9074422        0      0             0.05
## INFO  [16:33:09.472] [bbotk]                                 uhash
## INFO  [16:33:09.472] [bbotk]  2c5fbf4b-5f80-4517-b82c-c662111df9dd
## INFO  [16:33:09.473] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:09.491] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:09.493] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:09.639] [mlr3] Finished benchmark
## INFO  [16:33:09.649] [bbotk] Result of batch 9:
## INFO  [16:33:09.650] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:09.650] [bbotk]  0.034         3     500   0.8924328        0      0            0.141
## INFO  [16:33:09.650] [bbotk]                                 uhash
## INFO  [16:33:09.650] [bbotk]  29013322-04bb-4a0a-b88b-8745a7ad51b9
## INFO  [16:33:09.651] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:09.669] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:09.671] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:09.900] [mlr3] Finished benchmark
## INFO  [16:33:09.911] [bbotk] Result of batch 10:
## INFO  [16:33:09.912] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:09.912] [bbotk]  0.078         3     900   0.8811757        0      0            0.226
## INFO  [16:33:09.912] [bbotk]                                 uhash
## INFO  [16:33:09.912] [bbotk]  d05f74ba-4241-4fca-afe2-cf005eaf5023
## INFO  [16:33:09.912] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:09.930] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:09.932] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:10.018] [mlr3] Finished benchmark
## INFO  [16:33:10.029] [bbotk] Result of batch 11:
## INFO  [16:33:10.030] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:10.030] [bbotk]  0.034         1     600   0.8861789        0      0            0.081
## INFO  [16:33:10.030] [bbotk]                                 uhash
## INFO  [16:33:10.030] [bbotk]  20aefe14-fef2-499f-a1c7-c256fd920af0
## INFO  [16:33:10.030] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:10.068] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:10.073] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:10.267] [mlr3] Finished benchmark
## INFO  [16:33:10.277] [bbotk] Result of batch 12:
## INFO  [16:33:10.278] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:10.278] [bbotk]  0.078         3     700   0.8886804        0      0            0.189
## INFO  [16:33:10.278] [bbotk]                                 uhash
## INFO  [16:33:10.278] [bbotk]  9dc5eee6-bb5e-4d68-b2f5-ac67501f6f01
## INFO  [16:33:10.279] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:10.295] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:10.298] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:10.395] [mlr3] Finished benchmark
## INFO  [16:33:10.406] [bbotk] Result of batch 13:
## INFO  [16:33:10.407] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:10.407] [bbotk]  0.067         1     700   0.8749218        0      0            0.094
## INFO  [16:33:10.407] [bbotk]                                 uhash
## INFO  [16:33:10.407] [bbotk]  00af46e3-9076-4483-b3f6-ac99a9a9bdcc
## INFO  [16:33:10.407] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:10.425] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:10.427] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:10.511] [mlr3] Finished benchmark
## INFO  [16:33:10.522] [bbotk] Result of batch 14:
## INFO  [16:33:10.522] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:10.522] [bbotk]  0.045         1     600    0.873671        0      0             0.08
## INFO  [16:33:10.522] [bbotk]                                 uhash
## INFO  [16:33:10.522] [bbotk]  b68a3c87-efbf-4954-8474-827322e5fae4
## INFO  [16:33:10.523] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:10.541] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:10.543] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:10.577] [mlr3] Finished benchmark
## INFO  [16:33:10.588] [bbotk] Result of batch 15:
## INFO  [16:33:10.589] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:10.589] [bbotk]  0.056         3     100    0.902439        0      0            0.032
## INFO  [16:33:10.589] [bbotk]                                 uhash
## INFO  [16:33:10.589] [bbotk]  8ee86615-dc0f-4c50-9884-13e0c4f0d45e
## INFO  [16:33:10.589] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:10.623] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:10.627] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:10.810] [mlr3] Finished benchmark
## INFO  [16:33:10.821] [bbotk] Result of batch 16:
## INFO  [16:33:10.821] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:10.821] [bbotk]  0.034         3     600   0.8830519        0      0            0.179
## INFO  [16:33:10.821] [bbotk]                                 uhash
## INFO  [16:33:10.821] [bbotk]  aa5eb522-80c1-404c-a2e2-8934c07771d2
## INFO  [16:33:10.822] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:10.839] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:10.841] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:10.903] [mlr3] Finished benchmark
## INFO  [16:33:10.914] [bbotk] Result of batch 17:
## INFO  [16:33:10.915] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:10.915] [bbotk]  0.067         3     200   0.8936836        0      0            0.058
## INFO  [16:33:10.915] [bbotk]                                 uhash
## INFO  [16:33:10.915] [bbotk]  39d550ed-9647-41f6-a059-80290a045949
## INFO  [16:33:10.915] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:10.932] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:10.935] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:11.084] [mlr3] Finished benchmark
## INFO  [16:33:11.095] [bbotk] Result of batch 18:
## INFO  [16:33:11.096] [bbotk]  eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:11.096] [bbotk]  0.1         4     500   0.8893058        0      0            0.145
## INFO  [16:33:11.096] [bbotk]                                 uhash
## INFO  [16:33:11.096] [bbotk]  95590356-f7a4-4d6f-83b7-18531800a3e9
## INFO  [16:33:11.096] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:11.113] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:11.116] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:11.205] [mlr3] Finished benchmark
## INFO  [16:33:11.215] [bbotk] Result of batch 19:
## INFO  [16:33:11.216] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:11.216] [bbotk]  0.012         2     400   0.9005629        0      0            0.086
## INFO  [16:33:11.216] [bbotk]                                 uhash
## INFO  [16:33:11.216] [bbotk]  2d937b40-edb6-401d-a3b3-f8f10cfee295
## INFO  [16:33:11.217] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:11.234] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:11.236] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:11.550] [mlr3] Finished benchmark
## INFO  [16:33:11.564] [bbotk] Result of batch 20:
## INFO  [16:33:11.564] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:11.564] [bbotk]  0.034         6     800   0.8874296        0      0            0.308
## INFO  [16:33:11.564] [bbotk]                                 uhash
## INFO  [16:33:11.564] [bbotk]  2ce20585-dd35-4419-a878-cb4c130eca10
## INFO  [16:33:11.565] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:11.583] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:11.585] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:11.709] [mlr3] Finished benchmark
## INFO  [16:33:11.719] [bbotk] Result of batch 21:
## INFO  [16:33:11.720] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:11.720] [bbotk]  0.089         1     900   0.8517824        0      0            0.119
## INFO  [16:33:11.720] [bbotk]                                 uhash
## INFO  [16:33:11.720] [bbotk]  41570cdd-181c-47ac-8690-6bf0a13b1611
## INFO  [16:33:11.721] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:11.738] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:11.741] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:11.898] [mlr3] Finished benchmark
## INFO  [16:33:11.909] [bbotk] Result of batch 22:
## INFO  [16:33:11.910] [bbotk]  eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:11.910] [bbotk]  0.1         6     500   0.9030644        0      0            0.154
## INFO  [16:33:11.910] [bbotk]                                 uhash
## INFO  [16:33:11.910] [bbotk]  b01c47ae-c55e-4236-81bc-ce722bf1fa6e
## INFO  [16:33:11.910] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:11.927] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:11.930] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:12.231] [mlr3] Finished benchmark
## INFO  [16:33:12.242] [bbotk] Result of batch 23:
## INFO  [16:33:12.243] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:12.243] [bbotk]  0.034         5     900   0.8930582        0      0            0.297
## INFO  [16:33:12.243] [bbotk]                                 uhash
## INFO  [16:33:12.243] [bbotk]  55135d34-2fcd-4dcb-a90d-467a83aa6c9d
## INFO  [16:33:12.243] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:12.290] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:12.295] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:12.341] [mlr3] Finished benchmark
## INFO  [16:33:12.352] [bbotk] Result of batch 24:
## INFO  [16:33:12.353] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:12.353] [bbotk]  0.067         4     100   0.9124453        0      0            0.042
## INFO  [16:33:12.353] [bbotk]                                 uhash
## INFO  [16:33:12.353] [bbotk]  96f7bbdd-3598-410a-99c1-95325508fa07
## INFO  [16:33:12.353] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:12.370] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:12.373] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:12.421] [mlr3] Finished benchmark
## INFO  [16:33:12.432] [bbotk] Result of batch 25:
## INFO  [16:33:12.432] [bbotk]  eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:12.432] [bbotk]  0.1         6     100   0.8980613        0      0            0.044
## INFO  [16:33:12.432] [bbotk]                                 uhash
## INFO  [16:33:12.432] [bbotk]  f7bc828b-ba4d-4953-82e7-719024d4c55c
## INFO  [16:33:12.433] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:12.450] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:12.453] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:12.721] [mlr3] Finished benchmark
## INFO  [16:33:12.732] [bbotk] Result of batch 26:
## INFO  [16:33:12.732] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:12.732] [bbotk]  0.045         3    1000   0.8843027        0      0            0.264
## INFO  [16:33:12.732] [bbotk]                                 uhash
## INFO  [16:33:12.732] [bbotk]  56537f01-c098-490d-a33b-06f4b63ba49b
## INFO  [16:33:12.733] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:12.750] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:12.753] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:12.831] [mlr3] Finished benchmark
## INFO  [16:33:12.844] [bbotk] Result of batch 27:
## INFO  [16:33:12.844] [bbotk]  eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:12.844] [bbotk]  0.1         1     500   0.8699187        0      0            0.074
## INFO  [16:33:12.844] [bbotk]                                 uhash
## INFO  [16:33:12.844] [bbotk]  025f52a9-07a7-4822-a099-631b87cf16f9
## INFO  [16:33:12.845] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:12.880] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:12.885] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:12.986] [mlr3] Finished benchmark
## INFO  [16:33:13.000] [bbotk] Result of batch 28:
## INFO  [16:33:13.001] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:13.001] [bbotk]  0.034         3     300   0.8886804        0      0            0.095
## INFO  [16:33:13.001] [bbotk]                                 uhash
## INFO  [16:33:13.001] [bbotk]  797d7aa9-12f5-4323-8c49-d263043bc888
## INFO  [16:33:13.002] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:13.019] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:13.021] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:13.166] [mlr3] Finished benchmark
## INFO  [16:33:13.177] [bbotk] Result of batch 29:
## INFO  [16:33:13.177] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:13.177] [bbotk]  0.056         5     400    0.888055        0      0            0.141
## INFO  [16:33:13.177] [bbotk]                                 uhash
## INFO  [16:33:13.177] [bbotk]  8b5d83d1-c878-47cc-a501-8b4002c8da0e
## INFO  [16:33:13.178] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:13.195] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:13.198] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:13.240] [mlr3] Finished benchmark
## INFO  [16:33:13.251] [bbotk] Result of batch 30:
## INFO  [16:33:13.252] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:13.252] [bbotk]  0.023         4     100   0.9080675        0      0             0.04
## INFO  [16:33:13.252] [bbotk]                                 uhash
## INFO  [16:33:13.252] [bbotk]  3ec75887-5400-4eb3-a6b7-83df491b4c33
## INFO  [16:33:13.252] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:13.270] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:13.273] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:13.510] [mlr3] Finished benchmark
## INFO  [16:33:13.520] [bbotk] Result of batch 31:
## INFO  [16:33:13.521] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:13.521] [bbotk]  0.089         4     900   0.8680425        0      0            0.233
## INFO  [16:33:13.521] [bbotk]                                 uhash
## INFO  [16:33:13.521] [bbotk]  a0535ad5-00ae-44c7-a84c-0b9e50b54ce7
## INFO  [16:33:13.522] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:13.539] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:13.549] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:13.680] [mlr3] Finished benchmark
## INFO  [16:33:13.698] [bbotk] Result of batch 32:
## INFO  [16:33:13.699] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:13.699] [bbotk]  0.045         3     400   0.8961851        0      0            0.126
## INFO  [16:33:13.699] [bbotk]                                 uhash
## INFO  [16:33:13.699] [bbotk]  90647302-eeea-478a-a403-928b2611b74e
## INFO  [16:33:13.700] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:13.719] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:13.722] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:13.974] [mlr3] Finished benchmark
## INFO  [16:33:13.985] [bbotk] Result of batch 33:
## INFO  [16:33:13.986] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:13.986] [bbotk]  0.034         6     700   0.8961851        0      0            0.248
## INFO  [16:33:13.986] [bbotk]                                 uhash
## INFO  [16:33:13.986] [bbotk]  72e6a1d5-5046-413b-9759-320daf7ea3c9
## INFO  [16:33:13.986] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:14.003] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:14.006] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:14.089] [mlr3] Finished benchmark
## INFO  [16:33:14.100] [bbotk] Result of batch 34:
## INFO  [16:33:14.101] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:14.101] [bbotk]  0.056         5     200   0.9080675        0      0             0.08
## INFO  [16:33:14.101] [bbotk]                                 uhash
## INFO  [16:33:14.101] [bbotk]  55daf903-77d7-451e-9397-15b3a7143b1e
## INFO  [16:33:14.101] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:14.118] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:14.121] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:14.168] [mlr3] Finished benchmark
## INFO  [16:33:14.180] [bbotk] Result of batch 35:
## INFO  [16:33:14.180] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:14.180] [bbotk]  0.089         2     200   0.8824265        0      0            0.043
## INFO  [16:33:14.180] [bbotk]                                 uhash
## INFO  [16:33:14.180] [bbotk]  72796139-8d1c-49ad-aeaf-c15264cee8e8
## INFO  [16:33:14.181] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:14.199] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:14.202] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:14.453] [mlr3] Finished benchmark
## INFO  [16:33:14.472] [bbotk] Result of batch 36:
## INFO  [16:33:14.474] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:14.474] [bbotk]  0.078         6     800   0.8949343        0      0            0.247
## INFO  [16:33:14.474] [bbotk]                                 uhash
## INFO  [16:33:14.474] [bbotk]  e0a68f64-5bff-435e-89cc-9a6152dbc9ae
## INFO  [16:33:14.475] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:14.498] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:14.501] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:14.610] [mlr3] Finished benchmark
## INFO  [16:33:14.621] [bbotk] Result of batch 37:
## INFO  [16:33:14.622] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:14.622] [bbotk]  0.045         1     800    0.879925        0      0            0.105
## INFO  [16:33:14.622] [bbotk]                                 uhash
## INFO  [16:33:14.622] [bbotk]  a3471054-59e5-4756-a7a0-a42d246b81b1
## INFO  [16:33:14.622] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:14.639] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:14.642] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:14.909] [mlr3] Finished benchmark
## INFO  [16:33:14.920] [bbotk] Result of batch 38:
## INFO  [16:33:14.921] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:14.921] [bbotk]  0.001         3     900   0.9005629        0      0            0.264
## INFO  [16:33:14.921] [bbotk]                                 uhash
## INFO  [16:33:14.921] [bbotk]  8a2c7a7c-7fff-4750-b9ef-e6ffcbc5c866
## INFO  [16:33:14.921] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:14.938] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:14.941] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:15.137] [mlr3] Finished benchmark
## INFO  [16:33:15.148] [bbotk] Result of batch 39:
## INFO  [16:33:15.149] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:15.149] [bbotk]  0.045         4     600   0.8980613        0      0            0.194
## INFO  [16:33:15.149] [bbotk]                                 uhash
## INFO  [16:33:15.149] [bbotk]  40d0331f-7d87-4b32-910f-295ed882ff3b
## INFO  [16:33:15.150] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:15.189] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:15.194] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:15.281] [mlr3] Finished benchmark
## INFO  [16:33:15.295] [bbotk] Result of batch 40:
## INFO  [16:33:15.296] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:15.296] [bbotk]  0.045         4     200   0.8974359        0      0            0.082
## INFO  [16:33:15.296] [bbotk]                                 uhash
## INFO  [16:33:15.296] [bbotk]  9e41a52d-6213-45e5-9f6e-e008b8de060a
## INFO  [16:33:15.297] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:15.314] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:15.316] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:15.631] [mlr3] Finished benchmark
## INFO  [16:33:15.643] [bbotk] Result of batch 41:
## INFO  [16:33:15.644] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:15.644] [bbotk]  0.023         4     900    0.891182        0      0            0.309
## INFO  [16:33:15.644] [bbotk]                                 uhash
## INFO  [16:33:15.644] [bbotk]  0c916a28-6446-49da-8d83-669dcd3c3578
## INFO  [16:33:15.645] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:15.663] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:15.666] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:15.831] [mlr3] Finished benchmark
## INFO  [16:33:15.842] [bbotk] Result of batch 42:
## INFO  [16:33:15.843] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:15.843] [bbotk]  0.078         5     500   0.8874296        0      0            0.161
## INFO  [16:33:15.843] [bbotk]                                 uhash
## INFO  [16:33:15.843] [bbotk]  5b563a52-173d-4bd1-9b14-e58a437d760c
## INFO  [16:33:15.843] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:15.862] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:15.865] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:15.912] [mlr3] Finished benchmark
## INFO  [16:33:15.923] [bbotk] Result of batch 43:
## INFO  [16:33:15.924] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:15.924] [bbotk]  0.001         1     300   0.7595372        0      0            0.044
## INFO  [16:33:15.924] [bbotk]                                 uhash
## INFO  [16:33:15.924] [bbotk]  fa866f3c-a3f4-4ce5-909c-ce965dc480ea
## INFO  [16:33:15.925] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:15.959] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:15.963] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:16.240] [mlr3] Finished benchmark
## INFO  [16:33:16.251] [bbotk] Result of batch 44:
## INFO  [16:33:16.252] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:16.252] [bbotk]  0.089         6    1000   0.8899312        0      0            0.272
## INFO  [16:33:16.252] [bbotk]                                 uhash
## INFO  [16:33:16.252] [bbotk]  b66cf7a1-6400-4d3e-875a-aeae6b3a32d0
## INFO  [16:33:16.252] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:16.270] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:16.273] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:16.356] [mlr3] Finished benchmark
## INFO  [16:33:16.367] [bbotk] Result of batch 45:
## INFO  [16:33:16.368] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:16.368] [bbotk]  0.067         5     200   0.8955597        0      0             0.08
## INFO  [16:33:16.368] [bbotk]                                 uhash
## INFO  [16:33:16.368] [bbotk]  cd2b2b3d-0cf8-4316-92b1-0c237c149dc4
## INFO  [16:33:16.369] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:16.386] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:16.389] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:16.422] [mlr3] Finished benchmark
## INFO  [16:33:16.433] [bbotk] Result of batch 46:
## INFO  [16:33:16.433] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:16.433] [bbotk]  0.089         1     200    0.888055        0      0             0.03
## INFO  [16:33:16.433] [bbotk]                                 uhash
## INFO  [16:33:16.433] [bbotk]  d36706db-c307-46c3-915a-3680a09afb1b
## INFO  [16:33:16.434] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:16.452] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:16.455] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:16.636] [mlr3] Finished benchmark
## INFO  [16:33:16.647] [bbotk] Result of batch 47:
## INFO  [16:33:16.648] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:16.648] [bbotk]  0.089         2     900   0.8642902        0      0            0.177
## INFO  [16:33:16.648] [bbotk]                                 uhash
## INFO  [16:33:16.648] [bbotk]  0e0d748d-95cb-4220-93fd-83ad34df79cb
## INFO  [16:33:16.648] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:16.691] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:16.695] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:16.849] [mlr3] Finished benchmark
## INFO  [16:33:16.860] [bbotk] Result of batch 48:
## INFO  [16:33:16.861] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:16.861] [bbotk]  0.012         4     400   0.9161976        0      0            0.149
## INFO  [16:33:16.861] [bbotk]                                 uhash
## INFO  [16:33:16.861] [bbotk]  574652d5-b6d8-473b-a7a4-712856747fca
## INFO  [16:33:16.861] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:16.878] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:16.880] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:17.210] [mlr3] Finished benchmark
## INFO  [16:33:17.221] [bbotk] Result of batch 49:
## INFO  [16:33:17.222] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:17.222] [bbotk]  0.034         6    1000   0.8868043        0      0            0.326
## INFO  [16:33:17.222] [bbotk]                                 uhash
## INFO  [16:33:17.222] [bbotk]  ed07804c-ee3a-4112-ae3e-b78b6027e454
## INFO  [16:33:17.222] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:17.239] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:17.242] [mlr3] Applying learner 'classif.xgboost' on task 'pe' (iter 1/1)
## INFO  [16:33:17.609] [mlr3] Finished benchmark
## INFO  [16:33:17.619] [bbotk] Result of batch 50:
## INFO  [16:33:17.620] [bbotk]    eta max_depth nrounds classif.auc warnings errors runtime_learners
## INFO  [16:33:17.620] [bbotk]  0.001         4    1000   0.9118199        0      0            0.363
## INFO  [16:33:17.620] [bbotk]                                 uhash
## INFO  [16:33:17.620] [bbotk]  a3aefe1c-bc59-4a6d-9867-f437e87d4a97
## INFO  [16:33:17.622] [bbotk] Finished optimizing after 50 evaluation(s)
## INFO  [16:33:17.622] [bbotk] Result:
## INFO  [16:33:17.623] [bbotk]    eta max_depth nrounds learner_param_vals  x_domain classif.auc
## INFO  [16:33:17.623] [bbotk]  0.012         4     400          <list[7]> <list[3]>   0.9161976
## Tuning result
at_brt$tuning_instance
## NULL
## NOT WORKING ####
## Function to extract the parameter values
sapply(rr_brt$learners, function (x) x$tuning_result)
##                    [,1]      [,2]      [,3]     
## eta                0.078     0.034     0.012    
## max_depth          3         2         4        
## nrounds            400       700       400      
## learner_param_vals list,1    list,1    list,1   
## x_domain           list,1    list,1    list,1   
## classif.auc        0.9512837 0.9038341 0.9161976
## QUESTION ON THIS!
## Individual paramater scores
rr_brt$score(measure)
##                 task task_id         learner            learner_id
## 1: <TaskClassif[50]>      pe <AutoTuner[46]> classif.xgboost.tuned
## 2: <TaskClassif[50]>      pe <AutoTuner[46]> classif.xgboost.tuned
## 3: <TaskClassif[50]>      pe <AutoTuner[46]> classif.xgboost.tuned
##            resampling resampling_id iteration              prediction
## 1: <ResamplingCV[20]>            cv         1 <PredictionClassif[20]>
## 2: <ResamplingCV[20]>            cv         2 <PredictionClassif[20]>
## 3: <ResamplingCV[20]>            cv         3 <PredictionClassif[20]>
##    classif.auc
## 1:   0.9123598
## 2:   0.9050313
## 3:   0.8816454
## Aggregate score
rr_brt$aggregate(measure)
## classif.auc 
##   0.8996788

Variable Importance Plots

Note: As before, we can use a variable importance plot to look at the contribution of the individual features to the model

## Variable importance plot

vip(rr_brt$learners[[1]]$model$learner$model)

## Variable importance plot (model 2)

vip(rr_brt$learners[[2]]$model$learner$model)

Prediction

Notes: In this last section, we will produce predictive maps of suitability for the pine for the modern and future periods. The first step will be to make a final model based on the tuned hyperparameters and the full dataset. We’ll use the random forest here as an example. As a reminder, the results of the tuning were:

## Check with Simon on this!!

sapply(rr_rf$learners, function(x) x$tuning_result)
##                    [,1]     [,2]      [,3]     
## mtry               6        7         2        
## num.trees          800      300       200      
## learner_param_vals list,1   list,1    list,1   
## x_domain           list,1   list,1    list,1   
## classif.auc        0.915404 0.9049406 0.9299562
## Final Model Learner
## I based the values off of the best performing model in the prior step 

final_rf = lrn("classif.ranger", 
             predict_type = "prob", 
             importance = "permutation",
             mtry = 5,
             num.trees = 300)

## Train the final model
final_rf$train(task_pe)

Note: For prediction, we now need to extract the environmental data for every grid cell in our region into a dataframe. We also get a list of grid cell coordinates (this will help with plotting the results).

## Extract environmental data
current.env.df = as.data.frame(getValues(current.env))

## Extract grid coordinates
grid.crds = coordinates(current.env)

Next, we remove any grid cell with missing values (those over the oceans), and the associated coordinates. Finally here we make a list of the grid cell number or index. We’ll use this to make maps of the predictions.

## Remove grid cells with missing values
## Identify the NA cells
naID = which(is.na(current.env.df$bio1))

##Remove them from the dataframe
current.env.df = current.env.df[-naID, ]

## Remove grid cell coordinates with NA
grid.crds = grid.crds[-naID, ]

## Create an index
grid.idx = raster::cellFromXY(object = current.env,
                              xy = grid.crds)

We can now use this dataframe with the predict_newdata method to estimate the suitability.

## Estimate the suitability

pe.curr.pred = final_rf$predict_newdata(newdata = current.env.df)

Note: And finally, we use the grid cell indices to make a new raster layer showing the predictions. We do this by first making a template raster as a copy of one of the environmental layers, then using the grid cell index to set values to the probability of suitability. Finally, we plot this and overlay the original points:

  • A raster* object to be used as a template for resolution and extent
  • The set of values (here the probability of a ‘1’)
  • The grid cell indices
## Create prediction color pallette
pred.pal = brewer.pal(n = 9, "BuPu")

## Create a raster object for resolution and extent
## 1 is the first layer of the stack...in this case the first variable
pe.curr.prob.r = raster(current.env, layer = 1)

## Set of values overlaid onto the grid indices
## column 2 of the probabilities is the "presence" category
pe.curr.prob.r[grid.idx] = pe.curr.pred$prob[ , 2]

## Visualize
plot(pe.curr.prob.r, col = pred.pal)
plot(st_geometry(pe), pch = 21, cex = 0.5, bg = "darkorange1", add = TRUE)

##Create grid extent
pe.curr.class.r = raster(current.env,1)

##As numeric converts 0/1 to 1/2...subtracting 1 makes it 0/1 as a number
tmp.pred <- as.numeric(pe.curr.pred$response) - 1

##Overlay onto the the index
pe.curr.class.r[grid.idx] <- tmp.pred

##Visualize
plot(pe.curr.class.r)
plot(st_geometry(pe), pch = 21, cex = 0.5, bg = "darkorange1", add = TRUE)

Prediction with the future environment.

##Extract the values and coordinates

##Extract values
future.env.df = as.data.frame(getValues(future.env))

##Extract coordinates
grid.crds = coordinates(future.env)

##Change the variable names of the future env dataframe to match the current environment
names(future.env.df) <- names(current.env.df)
## Remove Missing Values
naID = which(is.na(future.env.df$bio1))
future.env.df = future.env.df[-naID,]

##Set  the grid index

grid.crds = grid.crds[-naID,]
grid.idx = cellFromXY(future.env, grid.crds)
##Predict the suitability
pe.rcp85.pred = final_rf$predict_newdata(newdata = future.env.df)
pe.rcp85.prob.r <- raster(future.env,1)
pe.rcp85.prob.r[grid.idx] <- pe.rcp85.pred$prob[,2]

##Visualize
plot(pe.rcp85.prob.r, col = pred.pal)
plot(st_geometry(pe), pch = 21, cex = 0.5, add = TRUE)

## Change to predicted classes 
pe.rcp85.class.r <- raster(future.env,1)
tmp.pred <- as.numeric(pe.rcp85.pred$response) - 1
pe.rcp85.class.r[grid.idx] <- tmp.pred

## Visualize
plot(pe.rcp85.class.r)
plot(st_geometry(pe), pch = 21, cex = 0.5, add = TRUE)

## color palette
my.pal = brewer.pal(n = 3, "PRGn")


#plot the change between the future and current
plot(pe.rcp85.class.r - pe.curr.class.r, col=my.pal)

Exercise

Instructions:

The file Sonar.csv contains values of 208 sonar signals. The data have 60 features, each representing “the energy within a particular frequency band, integrated over a certain period of time”, and an outcome variable Class, which is coded M or R. The goal of the experiment is to discriminate between the sonar signals bounced of a rock R or a metal object (a mine M). The exercise for this lab is to use one of the ensemble methods (random forest or boosted regression trees) to produce a new model of these data.

This is a classification task (Classify between rock and mine).

Task, Learner, Resampling Strategy, and Performance Measure

## Load the sonar data
sr = read.csv("../datafiles/sonar.csv")

## Set class as a factor
sr$Class = as.factor(sr$Class)

## Check
class(sr$Class)
## [1] "factor"

Task Setup

## Set the task
task_sr = TaskClassif$new(id = "sr",
                          backend = sr,
                          target = "Class")

## Check the task details
task_sr$col_roles
## $feature
##  [1] "V1"  "V10" "V11" "V12" "V13" "V14" "V15" "V16" "V17" "V18" "V19" "V2" 
## [13] "V20" "V21" "V22" "V23" "V24" "V25" "V26" "V27" "V28" "V29" "V3"  "V30"
## [25] "V31" "V32" "V33" "V34" "V35" "V36" "V37" "V38" "V39" "V4"  "V40" "V41"
## [37] "V42" "V43" "V44" "V45" "V46" "V47" "V48" "V49" "V5"  "V50" "V51" "V52"
## [49] "V53" "V54" "V55" "V56" "V57" "V58" "V59" "V6"  "V60" "V7"  "V8"  "V9" 
## 
## $target
## [1] "Class"
## 
## $name
## character(0)
## 
## $order
## character(0)
## 
## $stratum
## character(0)
## 
## $group
## character(0)
## 
## $weight
## character(0)

Learner Setup

##Set the learner
##Check learner names
lrns()
## <DictionaryLearner> with 27 stored values
## Keys: classif.cv_glmnet, classif.debug, classif.featureless,
##   classif.glmnet, classif.kknn, classif.lda, classif.log_reg,
##   classif.multinom, classif.naive_bayes, classif.nnet, classif.qda,
##   classif.ranger, classif.rpart, classif.svm, classif.xgboost,
##   regr.cv_glmnet, regr.debug, regr.featureless, regr.glmnet, regr.kknn,
##   regr.km, regr.lm, regr.nnet, regr.ranger, regr.rpart, regr.svm,
##   regr.xgboost
##Using Random Forest (classif.ranger)
lrn_sr = lrn("classif.ranger",
             predict_type = "prob",
             importance = "permutation")

Resampling Strategy

##Use a cross validation strategy (cv) with 5 folds
sr.resamp.hout = rsmp("holdout", ratio = 0.8)

#resamp.cv = rsmp("cv",
                 #folds = 5)

##Instantiate
sr.resamp.hout$instantiate(task_sr)

Performance Measure

##Use AUC (classif.auc) as the performance measure
sr.measure = msr("classif.auc")

Initial Model Run

##Run the initial model
sr.rf1 = mlr3::resample(task = task_sr, 
                  learner = lrn_sr,
                  resampling = sr.resamp.hout,
                  store_models = TRUE)
## INFO  [16:33:32.991] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
##Measure the performance by model
sr.rf1$score(sr.measure)
##                 task task_id                    learner     learner_id
## 1: <TaskClassif[50]>      sr <LearnerClassifRanger[38]> classif.ranger
##                 resampling resampling_id iteration              prediction
## 1: <ResamplingHoldout[20]>       holdout         1 <PredictionClassif[20]>
##    classif.auc
## 1:   0.9614512
##Measure the aggregate performance
sr.rf1$aggregate(sr.measure)
## classif.auc 
##   0.9614512

Interpretation Note: Our initial models do fairly well at predicting.

##Initial Tree Visualization
##Checking the 5th model as it performed the best
sr.rf1$learners[[1]]$model
## Ranger result
## 
## Call:
##  ranger::ranger(dependent.variable.name = task$target_names, data = task$data(),      probability = self$predict_type == "prob", case.weights = task$weights$weight,      num.threads = 1L, importance = "permutation") 
## 
## Type:                             Probability estimation 
## Number of trees:                  500 
## Sample size:                      166 
## Number of independent variables:  60 
## Mtry:                             7 
## Target node size:                 10 
## Variable importance mode:         permutation 
## Splitrule:                        gini 
## OOB prediction error (Brier s.):  0.1383159

Model Tuning (AutoTuner)

##Check the list of hyperparameters again
lrn_sr$param_set
## <ParamSet>
##                               id    class lower upper nlevels        default
##  1:                        alpha ParamDbl  -Inf   Inf     Inf            0.5
##  2:       always.split.variables ParamUty    NA    NA     Inf <NoDefault[3]>
##  3:                class.weights ParamUty    NA    NA     Inf               
##  4:                      holdout ParamLgl    NA    NA       2          FALSE
##  5:                   importance ParamFct    NA    NA       4 <NoDefault[3]>
##  6:                   keep.inbag ParamLgl    NA    NA       2          FALSE
##  7:                    max.depth ParamInt     0   Inf     Inf               
##  8:                min.node.size ParamInt     1   Inf     Inf               
##  9:                     min.prop ParamDbl  -Inf   Inf     Inf            0.1
## 10:                      minprop ParamDbl  -Inf   Inf     Inf            0.1
## 11:                         mtry ParamInt     1   Inf     Inf <NoDefault[3]>
## 12:                   mtry.ratio ParamDbl     0     1     Inf <NoDefault[3]>
## 13:            num.random.splits ParamInt     1   Inf     Inf              1
## 14:                  num.threads ParamInt     1   Inf     Inf              1
## 15:                    num.trees ParamInt     1   Inf     Inf            500
## 16:                    oob.error ParamLgl    NA    NA       2           TRUE
## 17:        regularization.factor ParamUty    NA    NA     Inf              1
## 18:      regularization.usedepth ParamLgl    NA    NA       2          FALSE
## 19:                      replace ParamLgl    NA    NA       2           TRUE
## 20:    respect.unordered.factors ParamFct    NA    NA       3         ignore
## 21:              sample.fraction ParamDbl     0     1     Inf <NoDefault[3]>
## 22:                  save.memory ParamLgl    NA    NA       2          FALSE
## 23: scale.permutation.importance ParamLgl    NA    NA       2          FALSE
## 24:                    se.method ParamFct    NA    NA       2        infjack
## 25:                         seed ParamInt  -Inf   Inf     Inf               
## 26:         split.select.weights ParamUty    NA    NA     Inf               
## 27:                    splitrule ParamFct    NA    NA       3           gini
## 28:                      verbose ParamLgl    NA    NA       2           TRUE
## 29:                 write.forest ParamLgl    NA    NA       2           TRUE
##                               id    class lower upper nlevels        default
##        parents       value
##  1:                       
##  2:                       
##  3:                       
##  4:                       
##  5:            permutation
##  6:                       
##  7:                       
##  8:                       
##  9:                       
## 10:                       
## 11:                       
## 12:                       
## 13:  splitrule            
## 14:                      1
## 15:                       
## 16:                       
## 17:                       
## 18:                       
## 19:                       
## 20:                       
## 21:                       
## 22:                       
## 23: importance            
## 24:                       
## 25:                       
## 26:                       
## 27:                       
## 28:                       
## 29:                       
##        parents       value
##Adjust the following parameters

##mtry - number of variables used per split
##num.trees - the number of built trees
##max.depth - the number of splits that each tree is allowed to make
tune.sr = ParamSet$new(list(
  ParamInt$new("mtry", lower = 1, upper = 10),
  ParamInt$new("num.trees", lower = 100, upper = 1000),
  ParamInt$new("max.depth", lower = 3, upper = 7)
))

##Create a stopping condition
term.sr = trm("evals",
              n_evals = 50)

##Define the tuner
tuner.sr = tnr("grid_search",
               resolution = 10)
## Run AutoTuner to iterate through our new hyperparameters
at.sr = AutoTuner$new(learner = lrn_sr,
                      resampling = sr.resamp.hout,
                      measure = sr.measure,
                      search_space = tune.sr,
                      terminator = term.sr,
                      tuner = tuner.sr)

## Train the the model
at.sr$train(task_sr)
## INFO  [16:33:33.163] [bbotk] Starting to optimize 3 parameter(s) with '<TunerGridSearch>' and '<TerminatorEvals> [n_evals=50, k=0]'
## INFO  [16:33:33.165] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:33.175] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:33.177] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
## INFO  [16:33:33.194] [mlr3] Finished benchmark
## INFO  [16:33:33.204] [bbotk] Result of batch 1:
## INFO  [16:33:33.205] [bbotk]  mtry num.trees max.depth classif.auc warnings errors runtime_learners
## INFO  [16:33:33.205] [bbotk]     1       200         3   0.8911565        0      0            0.013
## INFO  [16:33:33.205] [bbotk]                                 uhash
## INFO  [16:33:33.205] [bbotk]  5800cc35-e378-4914-8bf9-d2a6efce63e0
## INFO  [16:33:33.206] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:33.226] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:33.228] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
## INFO  [16:33:33.358] [mlr3] Finished benchmark
## INFO  [16:33:33.369] [bbotk] Result of batch 2:
## INFO  [16:33:33.369] [bbotk]  mtry num.trees max.depth classif.auc warnings errors runtime_learners
## INFO  [16:33:33.369] [bbotk]     7      1000         6   0.9569161        0      0            0.126
## INFO  [16:33:33.369] [bbotk]                                 uhash
## INFO  [16:33:33.369] [bbotk]  2af19260-26b2-4742-a932-2618735f1d82
## INFO  [16:33:33.370] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:33.379] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:33.382] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
## INFO  [16:33:33.470] [mlr3] Finished benchmark
## INFO  [16:33:33.481] [bbotk] Result of batch 3:
## INFO  [16:33:33.482] [bbotk]  mtry num.trees max.depth classif.auc warnings errors runtime_learners
## INFO  [16:33:33.482] [bbotk]     9       600         6   0.9433107        0      0            0.084
## INFO  [16:33:33.482] [bbotk]                                 uhash
## INFO  [16:33:33.482] [bbotk]  1277df9f-09cb-4f58-b1bf-2c57b0c83bf2
## INFO  [16:33:33.482] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:33.492] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:33.495] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
## INFO  [16:33:33.575] [mlr3] Finished benchmark
## INFO  [16:33:33.588] [bbotk] Result of batch 4:
## INFO  [16:33:33.589] [bbotk]  mtry num.trees max.depth classif.auc warnings errors runtime_learners
## INFO  [16:33:33.589] [bbotk]     6       400         7   0.9478458        0      0            0.073
## INFO  [16:33:33.589] [bbotk]                                 uhash
## INFO  [16:33:33.589] [bbotk]  637b2f03-cbef-43b8-80e7-1bb06b1e17fc
## INFO  [16:33:33.589] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:33.602] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:33.605] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
## INFO  [16:33:33.732] [mlr3] Finished benchmark
## INFO  [16:33:33.743] [bbotk] Result of batch 5:
## INFO  [16:33:33.744] [bbotk]  mtry num.trees max.depth classif.auc warnings errors runtime_learners
## INFO  [16:33:33.744] [bbotk]     6      1000         4   0.9478458        0      0            0.121
## INFO  [16:33:33.744] [bbotk]                                 uhash
## INFO  [16:33:33.744] [bbotk]  d432eb8d-b15a-4562-8097-94f1e740d6dc
## INFO  [16:33:33.745] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:33.755] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:33.757] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
## INFO  [16:33:33.798] [mlr3] Finished benchmark
## INFO  [16:33:33.809] [bbotk] Result of batch 6:
## INFO  [16:33:33.809] [bbotk]  mtry num.trees max.depth classif.auc warnings errors runtime_learners
## INFO  [16:33:33.809] [bbotk]     1       500         4   0.9115646        0      0            0.036
## INFO  [16:33:33.809] [bbotk]                                 uhash
## INFO  [16:33:33.809] [bbotk]  b02a1934-8940-4c97-81cc-d40fac2285c3
## INFO  [16:33:33.810] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:33.820] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:33.823] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
## INFO  [16:33:33.878] [mlr3] Finished benchmark
## INFO  [16:33:33.891] [bbotk] Result of batch 7:
## INFO  [16:33:33.892] [bbotk]  mtry num.trees max.depth classif.auc warnings errors runtime_learners
## INFO  [16:33:33.892] [bbotk]     3       500         5   0.9546485        0      0            0.051
## INFO  [16:33:33.892] [bbotk]                                 uhash
## INFO  [16:33:33.892] [bbotk]  d55ca4f6-3f5d-452f-9b76-4a77eef33c2d
## INFO  [16:33:33.892] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:33.903] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:33.906] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
## INFO  [16:33:33.979] [mlr3] Finished benchmark
## INFO  [16:33:33.993] [bbotk] Result of batch 8:
## INFO  [16:33:33.994] [bbotk]  mtry num.trees max.depth classif.auc warnings errors runtime_learners
## INFO  [16:33:33.994] [bbotk]     3       800         4    0.952381        0      0            0.069
## INFO  [16:33:33.994] [bbotk]                                 uhash
## INFO  [16:33:33.994] [bbotk]  02ad83fa-05be-4f36-8a4a-452e9ff544ae
## INFO  [16:33:33.995] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:34.005] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:34.008] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
## INFO  [16:33:34.063] [mlr3] Finished benchmark
## INFO  [16:33:34.073] [bbotk] Result of batch 9:
## INFO  [16:33:34.074] [bbotk]  mtry num.trees max.depth classif.auc warnings errors runtime_learners
## INFO  [16:33:34.074] [bbotk]     3       300         6   0.9614512        0      0            0.051
## INFO  [16:33:34.074] [bbotk]                                 uhash
## INFO  [16:33:34.074] [bbotk]  fb50e600-a118-4f6a-8d1b-9a51256e2154
## INFO  [16:33:34.075] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:34.085] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:34.088] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
## INFO  [16:33:34.148] [mlr3] Finished benchmark
## INFO  [16:33:34.159] [bbotk] Result of batch 10:
## INFO  [16:33:34.160] [bbotk]  mtry num.trees max.depth classif.auc warnings errors runtime_learners
## INFO  [16:33:34.160] [bbotk]     3       500         7    0.968254        0      0            0.058
## INFO  [16:33:34.160] [bbotk]                                 uhash
## INFO  [16:33:34.160] [bbotk]  2db3f255-b868-4287-a931-07d4adb365e5
## INFO  [16:33:34.160] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:34.170] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:34.172] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
## INFO  [16:33:34.205] [mlr3] Finished benchmark
## INFO  [16:33:34.216] [bbotk] Result of batch 11:
## INFO  [16:33:34.217] [bbotk]  mtry num.trees max.depth classif.auc warnings errors runtime_learners
## INFO  [16:33:34.217] [bbotk]     5       300         4   0.9501134        0      0            0.029
## INFO  [16:33:34.217] [bbotk]                                 uhash
## INFO  [16:33:34.217] [bbotk]  b215d5e7-e163-4361-8bdb-77586932e835
## INFO  [16:33:34.217] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:34.227] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:34.229] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
## INFO  [16:33:34.344] [mlr3] Finished benchmark
## INFO  [16:33:34.355] [bbotk] Result of batch 12:
## INFO  [16:33:34.356] [bbotk]  mtry num.trees max.depth classif.auc warnings errors runtime_learners
## INFO  [16:33:34.356] [bbotk]     3      1000         7   0.9478458        0      0            0.111
## INFO  [16:33:34.356] [bbotk]                                 uhash
## INFO  [16:33:34.356] [bbotk]  41c03591-11de-4bfb-89e6-d36e7472b805
## INFO  [16:33:34.357] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:34.366] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:34.369] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
## INFO  [16:33:34.448] [mlr3] Finished benchmark
## INFO  [16:33:34.458] [bbotk] Result of batch 13:
## INFO  [16:33:34.459] [bbotk]  mtry num.trees max.depth classif.auc warnings errors runtime_learners
## INFO  [16:33:34.459] [bbotk]     9       900         3   0.9387755        0      0            0.075
## INFO  [16:33:34.459] [bbotk]                                 uhash
## INFO  [16:33:34.459] [bbotk]  33d15134-880b-4782-b70d-580f39ac4d1e
## INFO  [16:33:34.460] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:34.469] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:34.472] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
## INFO  [16:33:34.506] [mlr3] Finished benchmark
## INFO  [16:33:34.516] [bbotk] Result of batch 14:
## INFO  [16:33:34.517] [bbotk]  mtry num.trees max.depth classif.auc warnings errors runtime_learners
## INFO  [16:33:34.517] [bbotk]     6       400         3   0.9319728        0      0            0.031
## INFO  [16:33:34.517] [bbotk]                                 uhash
## INFO  [16:33:34.517] [bbotk]  3431011d-dd84-4874-905a-b7fd9fd88c40
## INFO  [16:33:34.518] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:34.528] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:34.530] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
## INFO  [16:33:34.581] [mlr3] Finished benchmark
## INFO  [16:33:34.593] [bbotk] Result of batch 15:
## INFO  [16:33:34.593] [bbotk]  mtry num.trees max.depth classif.auc warnings errors runtime_learners
## INFO  [16:33:34.593] [bbotk]    10       400         3   0.9297052        0      0            0.046
## INFO  [16:33:34.593] [bbotk]                                 uhash
## INFO  [16:33:34.593] [bbotk]  8de8dc02-5be8-4fd1-a5e2-57d56333979a
## INFO  [16:33:34.594] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:34.604] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:34.606] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
## INFO  [16:33:34.632] [mlr3] Finished benchmark
## INFO  [16:33:34.646] [bbotk] Result of batch 16:
## INFO  [16:33:34.655] [bbotk]  mtry num.trees max.depth classif.auc warnings errors runtime_learners
## INFO  [16:33:34.655] [bbotk]    10       200         3   0.9183673        0      0            0.023
## INFO  [16:33:34.655] [bbotk]                                 uhash
## INFO  [16:33:34.655] [bbotk]  419c48a7-0a47-4efd-9361-31e97245865f
## INFO  [16:33:34.656] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:34.666] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:34.669] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
## INFO  [16:33:34.752] [mlr3] Finished benchmark
## INFO  [16:33:34.762] [bbotk] Result of batch 17:
## INFO  [16:33:34.763] [bbotk]  mtry num.trees max.depth classif.auc warnings errors runtime_learners
## INFO  [16:33:34.763] [bbotk]     2      1000         4   0.9365079        0      0            0.079
## INFO  [16:33:34.763] [bbotk]                                 uhash
## INFO  [16:33:34.763] [bbotk]  efbc9a4b-db0f-48ce-8f99-74a0116ca6fd
## INFO  [16:33:34.764] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:34.773] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:34.776] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
## INFO  [16:33:34.875] [mlr3] Finished benchmark
## INFO  [16:33:34.886] [bbotk] Result of batch 18:
## INFO  [16:33:34.887] [bbotk]  mtry num.trees max.depth classif.auc warnings errors runtime_learners
## INFO  [16:33:34.887] [bbotk]    10       700         3   0.9319728        0      0            0.095
## INFO  [16:33:34.887] [bbotk]                                 uhash
## INFO  [16:33:34.887] [bbotk]  c8df1895-496f-4829-8bcb-a0b7075e493f
## INFO  [16:33:34.887] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:34.898] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:34.900] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
## INFO  [16:33:34.939] [mlr3] Finished benchmark
## INFO  [16:33:34.949] [bbotk] Result of batch 19:
## INFO  [16:33:34.950] [bbotk]  mtry num.trees max.depth classif.auc warnings errors runtime_learners
## INFO  [16:33:34.950] [bbotk]     2       600         3   0.9206349        0      0            0.035
## INFO  [16:33:34.950] [bbotk]                                 uhash
## INFO  [16:33:34.950] [bbotk]  9f41d8cd-b10b-49b6-b4f6-98ca94d5f7ad
## INFO  [16:33:34.951] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:34.961] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:34.963] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
## INFO  [16:33:34.983] [mlr3] Finished benchmark
## INFO  [16:33:34.994] [bbotk] Result of batch 20:
## INFO  [16:33:34.995] [bbotk]  mtry num.trees max.depth classif.auc warnings errors runtime_learners
## INFO  [16:33:34.995] [bbotk]     6       100         7   0.9410431        0      0            0.015
## INFO  [16:33:34.995] [bbotk]                                 uhash
## INFO  [16:33:34.995] [bbotk]  ad27f8b4-198b-4f1b-9036-f0720e0e7b6b
## INFO  [16:33:34.995] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:35.005] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:35.008] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
## INFO  [16:33:35.061] [mlr3] Finished benchmark
## INFO  [16:33:35.072] [bbotk] Result of batch 21:
## INFO  [16:33:35.073] [bbotk]  mtry num.trees max.depth classif.auc warnings errors runtime_learners
## INFO  [16:33:35.073] [bbotk]     1       600         5   0.9342404        0      0            0.049
## INFO  [16:33:35.073] [bbotk]                                 uhash
## INFO  [16:33:35.073] [bbotk]  18882d8b-c178-4c36-873d-3828160e41ad
## INFO  [16:33:35.074] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:35.083] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:35.086] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
## INFO  [16:33:35.166] [mlr3] Finished benchmark
## INFO  [16:33:35.178] [bbotk] Result of batch 22:
## INFO  [16:33:35.178] [bbotk]  mtry num.trees max.depth classif.auc warnings errors runtime_learners
## INFO  [16:33:35.178] [bbotk]     2       800         6   0.9410431        0      0            0.077
## INFO  [16:33:35.178] [bbotk]                                 uhash
## INFO  [16:33:35.178] [bbotk]  281bd9e6-7168-4351-a22a-70582ddcac98
## INFO  [16:33:35.179] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:35.190] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:35.192] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
## INFO  [16:33:35.277] [mlr3] Finished benchmark
## INFO  [16:33:35.288] [bbotk] Result of batch 23:
## INFO  [16:33:35.289] [bbotk]  mtry num.trees max.depth classif.auc warnings errors runtime_learners
## INFO  [16:33:35.289] [bbotk]     7       800         4   0.9342404        0      0             0.08
## INFO  [16:33:35.289] [bbotk]                                 uhash
## INFO  [16:33:35.289] [bbotk]  02858d39-7220-4e70-8fd5-7f5dff53313c
## INFO  [16:33:35.290] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:35.308] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:35.311] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
## INFO  [16:33:35.342] [mlr3] Finished benchmark
## INFO  [16:33:35.353] [bbotk] Result of batch 24:
## INFO  [16:33:35.354] [bbotk]  mtry num.trees max.depth classif.auc warnings errors runtime_learners
## INFO  [16:33:35.354] [bbotk]     1       400         4   0.9297052        0      0            0.029
## INFO  [16:33:35.354] [bbotk]                                 uhash
## INFO  [16:33:35.354] [bbotk]  ba3dd6e3-a103-41f2-aaca-53b922ceb0a1
## INFO  [16:33:35.354] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:35.364] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:35.366] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
## INFO  [16:33:35.399] [mlr3] Finished benchmark
## INFO  [16:33:35.409] [bbotk] Result of batch 25:
## INFO  [16:33:35.410] [bbotk]  mtry num.trees max.depth classif.auc warnings errors runtime_learners
## INFO  [16:33:35.410] [bbotk]    10       200         5   0.9455782        0      0            0.029
## INFO  [16:33:35.410] [bbotk]                                 uhash
## INFO  [16:33:35.410] [bbotk]  53a8bb7a-b1aa-4a99-81b0-ac60889b6f3c
## INFO  [16:33:35.411] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:35.420] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:35.423] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
## INFO  [16:33:35.460] [mlr3] Finished benchmark
## INFO  [16:33:35.470] [bbotk] Result of batch 26:
## INFO  [16:33:35.471] [bbotk]  mtry num.trees max.depth classif.auc warnings errors runtime_learners
## INFO  [16:33:35.471] [bbotk]     1       400         5   0.9297052        0      0            0.034
## INFO  [16:33:35.471] [bbotk]                                 uhash
## INFO  [16:33:35.471] [bbotk]  f0d15d2e-c430-4f0f-bb62-ac7334e84022
## INFO  [16:33:35.471] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:35.480] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:35.483] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
## INFO  [16:33:35.588] [mlr3] Finished benchmark
## INFO  [16:33:35.599] [bbotk] Result of batch 27:
## INFO  [16:33:35.599] [bbotk]  mtry num.trees max.depth classif.auc warnings errors runtime_learners
## INFO  [16:33:35.599] [bbotk]     4      1000         5   0.9455782        0      0            0.101
## INFO  [16:33:35.599] [bbotk]                                 uhash
## INFO  [16:33:35.599] [bbotk]  6e468138-0a6b-447e-b8e1-7206f57d8aa0
## INFO  [16:33:35.600] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:35.609] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:35.612] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
## INFO  [16:33:35.705] [mlr3] Finished benchmark
## INFO  [16:33:35.716] [bbotk] Result of batch 28:
## INFO  [16:33:35.717] [bbotk]  mtry num.trees max.depth classif.auc warnings errors runtime_learners
## INFO  [16:33:35.717] [bbotk]     7       900         4   0.9433107        0      0             0.09
## INFO  [16:33:35.717] [bbotk]                                 uhash
## INFO  [16:33:35.717] [bbotk]  ce50d44b-d663-4e5e-b1b6-ee4116cbc7d5
## INFO  [16:33:35.718] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:35.727] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:35.730] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
## INFO  [16:33:35.776] [mlr3] Finished benchmark
## INFO  [16:33:35.787] [bbotk] Result of batch 29:
## INFO  [16:33:35.788] [bbotk]  mtry num.trees max.depth classif.auc warnings errors runtime_learners
## INFO  [16:33:35.788] [bbotk]     8       500         3   0.9342404        0      0            0.042
## INFO  [16:33:35.788] [bbotk]                                 uhash
## INFO  [16:33:35.788] [bbotk]  f752a8ac-6fbf-4c5c-9867-9176c1bdbcd8
## INFO  [16:33:35.788] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:35.798] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:35.800] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
## INFO  [16:33:35.872] [mlr3] Finished benchmark
## INFO  [16:33:35.883] [bbotk] Result of batch 30:
## INFO  [16:33:35.884] [bbotk]  mtry num.trees max.depth classif.auc warnings errors runtime_learners
## INFO  [16:33:35.884] [bbotk]     5       600         6   0.9614512        0      0            0.068
## INFO  [16:33:35.884] [bbotk]                                 uhash
## INFO  [16:33:35.884] [bbotk]  68d7b263-d9e6-4ba1-b903-e416441790b5
## INFO  [16:33:35.884] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:35.894] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:35.896] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
## INFO  [16:33:35.979] [mlr3] Finished benchmark
## INFO  [16:33:35.989] [bbotk] Result of batch 31:
## INFO  [16:33:35.990] [bbotk]  mtry num.trees max.depth classif.auc warnings errors runtime_learners
## INFO  [16:33:35.990] [bbotk]    10       500         6   0.9365079        0      0            0.079
## INFO  [16:33:35.990] [bbotk]                                 uhash
## INFO  [16:33:35.990] [bbotk]  16804680-0436-4f49-9f07-57d380381fcb
## INFO  [16:33:35.990] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:36.000] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:36.002] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
## INFO  [16:33:36.049] [mlr3] Finished benchmark
## INFO  [16:33:36.059] [bbotk] Result of batch 32:
## INFO  [16:33:36.060] [bbotk]  mtry num.trees max.depth classif.auc warnings errors runtime_learners
## INFO  [16:33:36.060] [bbotk]     6       600         3   0.9206349        0      0            0.044
## INFO  [16:33:36.060] [bbotk]                                 uhash
## INFO  [16:33:36.060] [bbotk]  e2dc9412-a62b-46ad-b594-05e0192b0c4a
## INFO  [16:33:36.061] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:36.070] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:36.072] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
## INFO  [16:33:36.153] [mlr3] Finished benchmark
## INFO  [16:33:36.163] [bbotk] Result of batch 33:
## INFO  [16:33:36.164] [bbotk]  mtry num.trees max.depth classif.auc warnings errors runtime_learners
## INFO  [16:33:36.164] [bbotk]     8       600         6   0.9614512        0      0            0.077
## INFO  [16:33:36.164] [bbotk]                                 uhash
## INFO  [16:33:36.164] [bbotk]  ae574cf5-d088-44c1-b3c6-db1d623c76c7
## INFO  [16:33:36.165] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:36.174] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:36.176] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
## INFO  [16:33:36.202] [mlr3] Finished benchmark
## INFO  [16:33:36.213] [bbotk] Result of batch 34:
## INFO  [16:33:36.214] [bbotk]  mtry num.trees max.depth classif.auc warnings errors runtime_learners
## INFO  [16:33:36.214] [bbotk]     3       200         5   0.9206349        0      0            0.021
## INFO  [16:33:36.214] [bbotk]                                 uhash
## INFO  [16:33:36.214] [bbotk]  8e069934-650f-42aa-bbfb-7874fd460929
## INFO  [16:33:36.214] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:36.224] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:36.226] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
## INFO  [16:33:36.264] [mlr3] Finished benchmark
## INFO  [16:33:36.275] [bbotk] Result of batch 35:
## INFO  [16:33:36.276] [bbotk]  mtry num.trees max.depth classif.auc warnings errors runtime_learners
## INFO  [16:33:36.276] [bbotk]     3       300         7   0.9659864        0      0            0.035
## INFO  [16:33:36.276] [bbotk]                                 uhash
## INFO  [16:33:36.276] [bbotk]  9f68daa3-7b7f-4071-9233-b65f69aff24b
## INFO  [16:33:36.276] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:36.286] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:36.288] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
## INFO  [16:33:36.351] [mlr3] Finished benchmark
## INFO  [16:33:36.369] [bbotk] Result of batch 36:
## INFO  [16:33:36.369] [bbotk]  mtry num.trees max.depth classif.auc warnings errors runtime_learners
## INFO  [16:33:36.369] [bbotk]     3       700         4   0.9319728        0      0            0.058
## INFO  [16:33:36.369] [bbotk]                                 uhash
## INFO  [16:33:36.369] [bbotk]  3c6c0f27-9f6c-42c6-a055-cf4b677bf403
## INFO  [16:33:36.370] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:36.381] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:36.383] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
## INFO  [16:33:36.414] [mlr3] Finished benchmark
## INFO  [16:33:36.426] [bbotk] Result of batch 37:
## INFO  [16:33:36.427] [bbotk]  mtry num.trees max.depth classif.auc warnings errors runtime_learners
## INFO  [16:33:36.427] [bbotk]     6       200         5   0.9410431        0      0            0.027
## INFO  [16:33:36.427] [bbotk]                                 uhash
## INFO  [16:33:36.427] [bbotk]  14af306d-53bb-4de7-8634-7e5c563a852e
## INFO  [16:33:36.428] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:36.439] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:36.442] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
## INFO  [16:33:36.464] [mlr3] Finished benchmark
## INFO  [16:33:36.491] [bbotk] Result of batch 38:
## INFO  [16:33:36.492] [bbotk]  mtry num.trees max.depth classif.auc warnings errors runtime_learners
## INFO  [16:33:36.492] [bbotk]     3       100         4   0.9342404        0      0            0.016
## INFO  [16:33:36.492] [bbotk]                                 uhash
## INFO  [16:33:36.492] [bbotk]  a7e20d50-a48f-40d9-a7a7-eb5860e4f95c
## INFO  [16:33:36.492] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:36.504] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:36.506] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
## INFO  [16:33:36.554] [mlr3] Finished benchmark
## INFO  [16:33:36.566] [bbotk] Result of batch 39:
## INFO  [16:33:36.567] [bbotk]  mtry num.trees max.depth classif.auc warnings errors runtime_learners
## INFO  [16:33:36.567] [bbotk]     4       600         3   0.9342404        0      0            0.043
## INFO  [16:33:36.567] [bbotk]                                 uhash
## INFO  [16:33:36.567] [bbotk]  9ab58d89-613c-431f-95d8-1409d0540f16
## INFO  [16:33:36.567] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:36.578] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:36.581] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
## INFO  [16:33:36.660] [mlr3] Finished benchmark
## INFO  [16:33:36.673] [bbotk] Result of batch 40:
## INFO  [16:33:36.673] [bbotk]  mtry num.trees max.depth classif.auc warnings errors runtime_learners
## INFO  [16:33:36.673] [bbotk]     9       500         6   0.9501134        0      0            0.075
## INFO  [16:33:36.673] [bbotk]                                 uhash
## INFO  [16:33:36.673] [bbotk]  170a15b0-6fd0-4c4d-9585-accfc4ad8bb8
## INFO  [16:33:36.674] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:36.684] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:36.687] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
## INFO  [16:33:36.749] [mlr3] Finished benchmark
## INFO  [16:33:36.762] [bbotk] Result of batch 41:
## INFO  [16:33:36.762] [bbotk]  mtry num.trees max.depth classif.auc warnings errors runtime_learners
## INFO  [16:33:36.762] [bbotk]     1       800         4   0.9251701        0      0            0.059
## INFO  [16:33:36.762] [bbotk]                                 uhash
## INFO  [16:33:36.762] [bbotk]  f4e235b8-8b7f-4f2e-8fb8-0443c0b49b8f
## INFO  [16:33:36.763] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:36.773] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:36.775] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
## INFO  [16:33:36.829] [mlr3] Finished benchmark
## INFO  [16:33:36.840] [bbotk] Result of batch 42:
## INFO  [16:33:36.841] [bbotk]  mtry num.trees max.depth classif.auc warnings errors runtime_learners
## INFO  [16:33:36.841] [bbotk]     1       700         4   0.9229025        0      0             0.05
## INFO  [16:33:36.841] [bbotk]                                 uhash
## INFO  [16:33:36.841] [bbotk]  726eb34c-9ccd-441f-99e4-3ab332b3dbeb
## INFO  [16:33:36.842] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:36.852] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:36.854] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
## INFO  [16:33:36.873] [mlr3] Finished benchmark
## INFO  [16:33:36.884] [bbotk] Result of batch 43:
## INFO  [16:33:36.885] [bbotk]  mtry num.trees max.depth classif.auc warnings errors runtime_learners
## INFO  [16:33:36.885] [bbotk]     9       100         4   0.9433107        0      0            0.016
## INFO  [16:33:36.885] [bbotk]                                 uhash
## INFO  [16:33:36.885] [bbotk]  34b381ec-def9-46b0-9c85-7e97649271ad
## INFO  [16:33:36.885] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:36.895] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:36.898] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
## INFO  [16:33:36.916] [mlr3] Finished benchmark
## INFO  [16:33:36.928] [bbotk] Result of batch 44:
## INFO  [16:33:36.929] [bbotk]  mtry num.trees max.depth classif.auc warnings errors runtime_learners
## INFO  [16:33:36.929] [bbotk]     4       100         7    0.952381        0      0            0.014
## INFO  [16:33:36.929] [bbotk]                                 uhash
## INFO  [16:33:36.929] [bbotk]  126ce3ca-f284-453a-9a3f-d5d43ce261eb
## INFO  [16:33:36.930] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:36.940] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:36.942] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
## INFO  [16:33:37.030] [mlr3] Finished benchmark
## INFO  [16:33:37.041] [bbotk] Result of batch 45:
## INFO  [16:33:37.042] [bbotk]  mtry num.trees max.depth classif.auc warnings errors runtime_learners
## INFO  [16:33:37.042] [bbotk]    10       900         3   0.9319728        0      0            0.083
## INFO  [16:33:37.042] [bbotk]                                 uhash
## INFO  [16:33:37.042] [bbotk]  470a6499-a946-4d0b-9962-9a5fbebc33dd
## INFO  [16:33:37.042] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:37.060] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:37.063] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
## INFO  [16:33:37.092] [mlr3] Finished benchmark
## INFO  [16:33:37.103] [bbotk] Result of batch 46:
## INFO  [16:33:37.103] [bbotk]  mtry num.trees max.depth classif.auc warnings errors runtime_learners
## INFO  [16:33:37.103] [bbotk]     9       200         4   0.9206349        0      0            0.025
## INFO  [16:33:37.103] [bbotk]                                 uhash
## INFO  [16:33:37.103] [bbotk]  3c976d62-c264-4b24-82d7-a86ce5a742a6
## INFO  [16:33:37.104] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:37.113] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:37.116] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
## INFO  [16:33:37.169] [mlr3] Finished benchmark
## INFO  [16:33:37.180] [bbotk] Result of batch 47:
## INFO  [16:33:37.181] [bbotk]  mtry num.trees max.depth classif.auc warnings errors runtime_learners
## INFO  [16:33:37.181] [bbotk]     5       700         3   0.9342404        0      0            0.049
## INFO  [16:33:37.181] [bbotk]                                 uhash
## INFO  [16:33:37.181] [bbotk]  72c028c3-a33a-4b45-ba3b-aca25fb88e4a
## INFO  [16:33:37.182] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:37.191] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:37.194] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
## INFO  [16:33:37.250] [mlr3] Finished benchmark
## INFO  [16:33:37.261] [bbotk] Result of batch 48:
## INFO  [16:33:37.262] [bbotk]  mtry num.trees max.depth classif.auc warnings errors runtime_learners
## INFO  [16:33:37.262] [bbotk]     8       400         5   0.9569161        0      0            0.052
## INFO  [16:33:37.262] [bbotk]                                 uhash
## INFO  [16:33:37.262] [bbotk]  9ad233b5-19f6-4ba4-aa80-0b9ea0b99138
## INFO  [16:33:37.262] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:37.272] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:37.275] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
## INFO  [16:33:37.318] [mlr3] Finished benchmark
## INFO  [16:33:37.329] [bbotk] Result of batch 49:
## INFO  [16:33:37.330] [bbotk]  mtry num.trees max.depth classif.auc warnings errors runtime_learners
## INFO  [16:33:37.330] [bbotk]     4       500         3   0.9183673        0      0            0.039
## INFO  [16:33:37.330] [bbotk]                                 uhash
## INFO  [16:33:37.330] [bbotk]  97dc98d1-2a84-4790-87c0-1123b6f08080
## INFO  [16:33:37.330] [bbotk] Evaluating 1 configuration(s)
## INFO  [16:33:37.342] [mlr3] Running benchmark with 1 resampling iterations
## INFO  [16:33:37.345] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/1)
## INFO  [16:33:37.414] [mlr3] Finished benchmark
## INFO  [16:33:37.425] [bbotk] Result of batch 50:
## INFO  [16:33:37.426] [bbotk]  mtry num.trees max.depth classif.auc warnings errors runtime_learners
## INFO  [16:33:37.426] [bbotk]     6       500         6   0.9478458        0      0            0.065
## INFO  [16:33:37.426] [bbotk]                                 uhash
## INFO  [16:33:37.426] [bbotk]  a031b540-d5e2-468b-bcff-85ab99b7b2ba
## INFO  [16:33:37.428] [bbotk] Finished optimizing after 50 evaluation(s)
## INFO  [16:33:37.428] [bbotk] Result:
## INFO  [16:33:37.429] [bbotk]  mtry num.trees max.depth learner_param_vals  x_domain classif.auc
## INFO  [16:33:37.429] [bbotk]     3       500         7          <list[5]> <list[3]>    0.968254
## Check the tuning results
at.sr$tuning_result
##    mtry num.trees max.depth learner_param_vals  x_domain classif.auc
## 1:    3       500         7          <list[5]> <list[3]>    0.968254
## Evaluate the final trained model by defining the outer and inner resampling strategies

##Outer resampling - five fold cross validation - used the divide the data into training and testing data where the test data is used to evaluate the predictive skill
resamp.sr.outer = rsmp("cv", folds = 5)

##Inner resampling - five fold cv - used to divide the TRAINING data to train for each combination of parameters and one to evaluate and select the best values of these parameters
resamp.sr.inner = rsmp("holdout", ratio = 0.8)
##Redefine the autotuner with the inner resampling strategy

at.sr = AutoTuner$new(learner = lrn_sr,
                      resampling = resamp.sr.inner,
                      measure = sr.measure,
                      search_space = tune.sr,
                      terminator = term.sr,
                      tuner = tuner.sr)
##Tune the model within the outer resampling strategy
sr.rf1 = mlr3::resample(task = task_sr, 
                  learner = lrn_sr,
                  resampling = resamp.sr.outer,
                  store_models = TRUE)
## INFO  [16:33:37.554] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 1/5)
## INFO  [16:33:37.628] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 2/5)
## INFO  [16:33:37.713] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 3/5)
## INFO  [16:33:37.788] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 4/5)
## INFO  [16:33:37.861] [mlr3] Applying learner 'classif.ranger' on task 'sr' (iter 5/5)

AUC Score

##Individual Model AUC Scores

sr.rf1$score(sr.measure)
##                 task task_id                    learner     learner_id
## 1: <TaskClassif[50]>      sr <LearnerClassifRanger[38]> classif.ranger
## 2: <TaskClassif[50]>      sr <LearnerClassifRanger[38]> classif.ranger
## 3: <TaskClassif[50]>      sr <LearnerClassifRanger[38]> classif.ranger
## 4: <TaskClassif[50]>      sr <LearnerClassifRanger[38]> classif.ranger
## 5: <TaskClassif[50]>      sr <LearnerClassifRanger[38]> classif.ranger
##            resampling resampling_id iteration              prediction
## 1: <ResamplingCV[20]>            cv         1 <PredictionClassif[20]>
## 2: <ResamplingCV[20]>            cv         2 <PredictionClassif[20]>
## 3: <ResamplingCV[20]>            cv         3 <PredictionClassif[20]>
## 4: <ResamplingCV[20]>            cv         4 <PredictionClassif[20]>
## 5: <ResamplingCV[20]>            cv         5 <PredictionClassif[20]>
##    classif.auc
## 1:   0.9016018
## 2:   0.9313501
## 3:   0.9670588
## 4:   0.9754902
## 5:   0.8937198
##Aggregate Score

sr.rf1$aggregate(sr.measure)
## classif.auc 
##   0.9338442

Interpretation Note: The tuned models performed slightly better than the initial model.

Variable Importance Plot

##Variable Importance Plots

vip(sr.rf1$learners[[1]]$model)

Appendix 1: Bioclimate Variables

  • BIO1 = Annual Mean Temperature
  • BIO2 = Mean Diurnal Range (Mean of monthly (max temp - min temp))
  • BIO3 = Isothermality (BIO2/BIO7) (* 100)
  • BIO4 = Temperature Seasonality (standard deviation *100)
  • BIO5 = Max Temperature of Warmest Month
  • BIO6 = Min Temperature of Coldest Month
  • BIO7 = Temperature Annual Range (BIO5-BIO6)
  • BIO8 = Mean Temperature of Wettest Quarter
  • BIO9 = Mean Temperature of Driest Quarter
  • BIO10 = Mean Temperature of Warmest Quarter
  • BIO11 = Mean Temperature of Coldest Quarter
  • BIO12 = Annual Precipitation
  • BIO13 = Precipitation of Wettest Month
  • BIO14 = Precipitation of Driest Month
  • BIO15 = Precipitation Seasonality (Coefficient of Variation)
  • BIO16 = Precipitation of Wettest Quarter
  • BIO17 = Precipitation of Driest Quarter
  • BIO18 = Precipitation of Warmest Quarter
  • BIO19 = Precipitation of Coldest Quarter