# Libraries
library(ggplot2)
library(scales) # For gradient scale
library(dplyr)
##
## Attaching package: 'dplyr'
## The following objects are masked from 'package:stats':
##
## filter, lag
## The following objects are masked from 'package:base':
##
## intersect, setdiff, setequal, union
library(tidyverse)
## ── Attaching core tidyverse packages ──────────────────────── tidyverse 2.0.0 ──
## ✔ forcats 1.0.0 ✔ stringr 1.5.1
## ✔ lubridate 1.9.3 ✔ tibble 3.2.1
## ✔ purrr 1.0.2 ✔ tidyr 1.3.1
## ✔ readr 2.1.5
## ── Conflicts ────────────────────────────────────────── tidyverse_conflicts() ──
## ✖ readr::col_factor() masks scales::col_factor()
## ✖ purrr::discard() masks scales::discard()
## ✖ dplyr::filter() masks stats::filter()
## ✖ dplyr::lag() masks stats::lag()
## ℹ Use the conflicted package (<http://conflicted.r-lib.org/>) to force all conflicts to become errors
library(gridExtra)
##
## Attaching package: 'gridExtra'
##
## The following object is masked from 'package:dplyr':
##
## combine
library(cowplot)
##
## Attaching package: 'cowplot'
##
## The following object is masked from 'package:lubridate':
##
## stamp
library(ggforce)
library(GGally)
## Registered S3 method overwritten by 'GGally':
## method from
## +.gg ggplot2
library(Rmisc)
## Loading required package: lattice
## Loading required package: plyr
## ------------------------------------------------------------------------------
## You have loaded plyr after dplyr - this is likely to cause problems.
## If you need functions from both plyr and dplyr, please load plyr first, then dplyr:
## library(plyr); library(dplyr)
## ------------------------------------------------------------------------------
##
## Attaching package: 'plyr'
##
## The following object is masked from 'package:purrr':
##
## compact
##
## The following objects are masked from 'package:dplyr':
##
## arrange, count, desc, failwith, id, mutate, rename, summarise,
## summarize
library(patchwork)
##
## Attaching package: 'patchwork'
##
## The following object is masked from 'package:cowplot':
##
## align_plots
library(tidyverse)
library(gganimate)
library(caret)
##
## Attaching package: 'caret'
##
## The following object is masked from 'package:purrr':
##
## lift
library(car)
## Loading required package: carData
##
## Attaching package: 'car'
##
## The following object is masked from 'package:purrr':
##
## some
##
## The following object is masked from 'package:dplyr':
##
## recode
library(nnet)
library(MLmetrics)
##
## Attaching package: 'MLmetrics'
##
## The following objects are masked from 'package:caret':
##
## MAE, RMSE
##
## The following object is masked from 'package:base':
##
## Recall
library(e1071)
library(randomForest)
## randomForest 4.7-1.1
## Type rfNews() to see new features/changes/bug fixes.
##
## Attaching package: 'randomForest'
##
## The following object is masked from 'package:gridExtra':
##
## combine
##
## The following object is masked from 'package:dplyr':
##
## combine
##
## The following object is masked from 'package:ggplot2':
##
## margin
library(xgboost)
##
## Attaching package: 'xgboost'
##
## The following object is masked from 'package:dplyr':
##
## slice
data <- read.csv("C:\\Users\\User\\Desktop\\University Of Warsaw - DS and BA\\Semester 3\\Advanced Visualization with R\\Adv R Project\\data.csv",
header = TRUE, sep = ';')
print(ncol(data))
## [1] 37
print(nrow(data))
## [1] 4424
colnames(data)
## [1] "Marital.status"
## [2] "Application.mode"
## [3] "Application.order"
## [4] "Course"
## [5] "Daytime.evening.attendance."
## [6] "Previous.qualification"
## [7] "Previous.qualification..grade."
## [8] "Nacionality"
## [9] "Mother.s.qualification"
## [10] "Father.s.qualification"
## [11] "Mother.s.occupation"
## [12] "Father.s.occupation"
## [13] "Admission.grade"
## [14] "Displaced"
## [15] "Educational.special.needs"
## [16] "Debtor"
## [17] "Tuition.fees.up.to.date"
## [18] "Gender"
## [19] "Scholarship.holder"
## [20] "Age.at.enrollment"
## [21] "International"
## [22] "Curricular.units.1st.sem..credited."
## [23] "Curricular.units.1st.sem..enrolled."
## [24] "Curricular.units.1st.sem..evaluations."
## [25] "Curricular.units.1st.sem..approved."
## [26] "Curricular.units.1st.sem..grade."
## [27] "Curricular.units.1st.sem..without.evaluations."
## [28] "Curricular.units.2nd.sem..credited."
## [29] "Curricular.units.2nd.sem..enrolled."
## [30] "Curricular.units.2nd.sem..evaluations."
## [31] "Curricular.units.2nd.sem..approved."
## [32] "Curricular.units.2nd.sem..grade."
## [33] "Curricular.units.2nd.sem..without.evaluations."
## [34] "Unemployment.rate"
## [35] "Inflation.rate"
## [36] "GDP"
## [37] "Target"
The dataset was created in a project that aims to contribute to the reduction of academic dropout and failure in higher education, by using machine learning techniques to identify students at risk at an early stage of their academic path, so that strategies to support them can be put into place. The dataset includes information known at the time of student enrollment – academic path, demographics, and social-economic factors. The problem is formulated as a three category classification task (dropout, enrolled, and graduate) at the end of the normal duration of thecourse.
sum(is.na(data)) # THERE ARE NO ANY MISSING VALUES
## [1] 0
# Convert selected variables to factors
categorical_vars <- c(
"Marital.status",
"Daytime.evening.attendance.",
"Displaced",
"Educational.special.needs",
"Debtor",
"Tuition.fees.up.to.date",
"Gender",
"Scholarship.holder",
"International",
"Target"
)
data[categorical_vars] <- lapply(data[categorical_vars], as.factor)
# Verify the changes
str(data)
## 'data.frame': 4424 obs. of 37 variables:
## $ Marital.status : Factor w/ 6 levels "1","2","3","4",..: 1 1 1 1 2 2 1 1 1 1 ...
## $ Application.mode : int 17 15 1 17 39 39 1 18 1 1 ...
## $ Application.order : int 5 1 5 2 1 1 1 4 3 1 ...
## $ Course : int 171 9254 9070 9773 8014 9991 9500 9254 9238 9238 ...
## $ Daytime.evening.attendance. : Factor w/ 2 levels "0","1": 2 2 2 2 1 1 2 2 2 2 ...
## $ Previous.qualification : int 1 1 1 1 1 19 1 1 1 1 ...
## $ Previous.qualification..grade. : num 122 160 122 122 100 ...
## $ Nacionality : int 1 1 1 1 1 1 1 1 62 1 ...
## $ Mother.s.qualification : int 19 1 37 38 37 37 19 37 1 1 ...
## $ Father.s.qualification : int 12 3 37 37 38 37 38 37 1 19 ...
## $ Mother.s.occupation : int 5 3 9 5 9 9 7 9 9 4 ...
## $ Father.s.occupation : int 9 3 9 3 9 7 10 9 9 7 ...
## $ Admission.grade : num 127 142 125 120 142 ...
## $ Displaced : Factor w/ 2 levels "0","1": 2 2 2 2 1 1 2 2 1 2 ...
## $ Educational.special.needs : Factor w/ 2 levels "0","1": 1 1 1 1 1 1 1 1 1 1 ...
## $ Debtor : Factor w/ 2 levels "0","1": 1 1 1 1 1 2 1 1 1 2 ...
## $ Tuition.fees.up.to.date : Factor w/ 2 levels "0","1": 2 1 1 2 2 2 2 1 2 1 ...
## $ Gender : Factor w/ 2 levels "0","1": 2 2 2 1 1 2 1 2 1 1 ...
## $ Scholarship.holder : Factor w/ 2 levels "0","1": 1 1 1 1 1 1 2 1 2 1 ...
## $ Age.at.enrollment : int 20 19 19 20 45 50 18 22 21 18 ...
## $ International : Factor w/ 2 levels "0","1": 1 1 1 1 1 1 1 1 2 1 ...
## $ Curricular.units.1st.sem..credited. : int 0 0 0 0 0 0 0 0 0 0 ...
## $ Curricular.units.1st.sem..enrolled. : int 0 6 6 6 6 5 7 5 6 6 ...
## $ Curricular.units.1st.sem..evaluations. : int 0 6 0 8 9 10 9 5 8 9 ...
## $ Curricular.units.1st.sem..approved. : int 0 6 0 6 5 5 7 0 6 5 ...
## $ Curricular.units.1st.sem..grade. : num 0 14 0 13.4 12.3 ...
## $ Curricular.units.1st.sem..without.evaluations.: int 0 0 0 0 0 0 0 0 0 0 ...
## $ Curricular.units.2nd.sem..credited. : int 0 0 0 0 0 0 0 0 0 0 ...
## $ Curricular.units.2nd.sem..enrolled. : int 0 6 6 6 6 5 8 5 6 6 ...
## $ Curricular.units.2nd.sem..evaluations. : int 0 6 0 10 6 17 8 5 7 14 ...
## $ Curricular.units.2nd.sem..approved. : int 0 6 0 5 6 5 8 0 6 2 ...
## $ Curricular.units.2nd.sem..grade. : num 0 13.7 0 12.4 13 ...
## $ Curricular.units.2nd.sem..without.evaluations.: int 0 0 0 0 0 5 0 0 0 0 ...
## $ Unemployment.rate : num 10.8 13.9 10.8 9.4 13.9 16.2 15.5 15.5 16.2 8.9 ...
## $ Inflation.rate : num 1.4 -0.3 1.4 -0.8 -0.3 0.3 2.8 2.8 0.3 1.4 ...
## $ GDP : num 1.74 0.79 1.74 -3.12 0.79 -0.92 -4.06 -4.06 -0.92 3.51 ...
## $ Target : Factor w/ 3 levels "Dropout","Enrolled",..: 1 3 1 3 3 3 3 1 3 1 ...
plot <- ggplot(data = data, aes(x = Target)) +
geom_bar(fill = 'darkgreen', color = 'black', width = 0.7) + # Dark green bars with black borders
geom_text(stat = 'count', aes(label = ..count..),
vjust = -0.3, color = 'black', size = 3.5,
position = position_stack(vjust = 0.5)) + # Black labels inside the bars
labs(
title = "Distribution of Target",
x = "Target",
y = "Count"
) +
theme_minimal() +
theme(
plot.background = element_rect(fill = "white", color = NA), # White plot background, no border
panel.background = element_rect(fill = "white", color = NA), # White panel background, no border
plot.title = element_text(color = "black"), # Black title text
axis.title = element_text(color = "black"), # Black axis titles
axis.text = element_text(color = "black"), # Black axis text
axis.ticks = element_line(color = "black"), # Black axis ticks
panel.grid.major = element_line(color = "gray80"), # Light gray major grid lines
panel.grid.minor = element_line(color = "gray90"), # Lighter minor grid lines
legend.position = "none" # No legend (as before)
)
print(plot)
## Warning: The dot-dot notation (`..count..`) was deprecated in ggplot2 3.4.0.
## ℹ Please use `after_stat(count)` instead.
## This warning is displayed once every 8 hours.
## Call `lifecycle::last_lifecycle_warnings()` to see where this warning was
## generated.
plot <- ggplot(data, aes(x = Age.at.enrollment, y = Admission.grade, color = factor(Target))) +
geom_point(alpha = 0.6, size = 3) + # Points with some transparency and size
labs(
title = "Relationship between Age at Enrollment and Admission Grade",
x = "Age at Enrollment",
y = "Admission Grade",
color = "Target"
) +
theme_minimal(base_size = 14) + # Base font size
theme(
plot.background = element_rect(fill = "white", color = NA), # White background
panel.background = element_rect(fill = "white", color = NA), # White panel background
plot.title = element_text(color = "black"), # Black title
text = element_text(color = "black"), # Black general text
axis.text = element_text(color = "black"), # Black axis text
axis.title = element_text(color = "black"), # Black axis titles
legend.background = element_rect(fill = "white", color = NA), # White legend background
legend.title = element_text(color = "black"), # Black legend title
legend.text = element_text(color = "black") # Black legend text
)
print(plot)
ggplot(data, aes(x = Mother.s.qualification, y = Father.s.qualification, fill = Target)) +
geom_tile(color = "white") +
scale_fill_manual(values = c(
"Dropout" = "#00FFFF", # Cyan
"Enrolled" = "#00FF00", # Bright Green
"Graduate" = "#FF00FF" # Magenta
)) +
labs(
title = "Target Distribution by Parental Education",
x = "Mother's Qualification",
y = "Father's Qualification",
fill = "Target"
) +
theme_minimal(base_size = 15) +
theme(
plot.background = element_rect(fill = "white", color = NA),
panel.background = element_rect(fill = "white", color = NA),
legend.background = element_rect(fill = "white", color = NA),
legend.text = element_text(color = "black"),
legend.title = element_text(color = "black"),
axis.text = element_text(color = "black"),
axis.title = element_text(color = "black"),
plot.title = element_text(size = 16, face = "bold", color = "black", hjust = 0.5),
panel.grid.major = element_line(color = "gray80"),
panel.grid.minor = element_blank()
)
plot <- ggplot(data = data, aes(x = Age.at.enrollment, y = Curricular.units.1st.sem..grade., color = Target)) +
geom_point(alpha = 0.7, size = 3) + # Points with some transparency and adjusted size
geom_smooth(method = "loess", se = TRUE, linetype = "solid", color = "black") + # Smooth line in black for contrast
labs(
title = "Enrollment Age vs First Semester Grade",
subtitle = "Relationship between Student Age and Academic Performance by Outcomes",
x = "Age at Enrollment",
y = "1st Semester Grade",
color = "Outcome",
caption = "Source: SATDAP Dataset"
) +
theme_minimal(base_family = "Arial") + # Minimal theme base
theme(
plot.background = element_rect(fill = "white", color = NA), # White plot background
panel.background = element_rect(fill = "white", color = NA), # White panel background
text = element_text(color = "black"), # Black text everywhere
axis.title = element_text(color = "black"), # Black axis titles
axis.text = element_text(color = "black"), # Black axis text
axis.line = element_line(color = "black"), # Black axis lines
legend.background = element_rect(fill = "white", color = NA), # White legend background
legend.text = element_text(color = "black"), # Black legend text
legend.title = element_text(color = "black"), # Black legend title
plot.title = element_text(color = "black", size = 16, face = "bold"), # Bold black title
plot.subtitle = element_text(color = "black", size = 14), # Black subtitle
plot.caption = element_text(color = "black") # Black caption
)
print(plot)
## `geom_smooth()` using formula = 'y ~ x'
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## not found in Windows font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## not found in Windows font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family not found in Windows font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family not found in Windows font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## not found in Windows font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## not found in Windows font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family not found in Windows font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family not found in Windows font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family not found in Windows font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family not found in Windows font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family not found in Windows font database
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## font family not found in Windows font database
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## font family not found in Windows font database
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## font family not found in Windows font database
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## font family not found in Windows font database
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## font family not found in Windows font database
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## font family not found in Windows font database
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## font family not found in Windows font database
plot <- ggplot(data = data, aes(x = Gender, y = Admission.grade, fill = Target)) +
geom_boxplot(alpha = 0.8, outlier.colour = "black", outlier.size = 1, outlier.shape = 16) + # Boxplot with transparency and black outliers
scale_fill_brewer(palette = "Set2") + # Same color palette (works well on white)
labs(
title = "Gender Differences in Admission",
x = "Gender (0 = Female, 1 = Male)",
y = "Admission Grade",
fill = "Outcome",
caption = "Source: SATDAP Dataset"
) +
theme_classic() + # Classic theme base
theme(
plot.background = element_rect(fill = "white", color = NA), # White plot background
panel.background = element_rect(fill = "white", color = NA), # White panel background
panel.border = element_blank(), # No panel border
text = element_text(color = "black"), # Black text
axis.title = element_text(color = "black"), # Black axis titles
axis.text = element_text(color = "black", size = 12, face = "bold"), # Bold, larger black axis text
axis.ticks = element_line(color = "black"), # Black axis ticks
legend.background = element_rect(fill = "white", color = NA), # White legend background
legend.text = element_text(color = "black"), # Black legend text
legend.title = element_text(color = "black"), # Black legend title
plot.title = element_text(color = "black", size = 16, face = "bold"), # Bold, larger black title
plot.caption = element_text(color = "black") # Black caption
)
print(plot)
plot <- ggplot(data, aes(
x = Curricular.units.1st.sem..approved.,
y = Curricular.units.2nd.sem..approved.,
color = Target
)) +
geom_point(alpha = 0.7, size = 3.5) + # Larger points with some transparency
scale_x_continuous(
name = "1st Semester Approved Units",
breaks = seq(0, 10, by = 2) # Custom x-axis breaks
) +
scale_y_continuous(
name = "2nd Semester Approved Units",
breaks = seq(0, 10, by = 2) # Custom y-axis breaks
) +
scale_color_brewer(palette = "Set1") + # Vibrant color palette retained
labs(
title = "Academic Performance Across Semesters",
x = "1st Semester Approved Units",
y = "2nd Semester Approved Units"
) +
theme_minimal() +
theme(
plot.background = element_rect(fill = "white", color = NA), # White plot background
panel.background = element_rect(fill = "white", color = NA), # White panel background
panel.grid.major = element_line(color = "gray80", linetype = "dotted"), # Light gray grid lines
panel.grid.minor = element_line(color = "gray90", linetype = "dotted"), # Even lighter minor grid lines
legend.title = element_blank(),
legend.background = element_rect(fill = "white", color = NA), # White legend background
legend.text = element_text(color = "black"), # Black legend text
plot.title = element_text(size = 16, face = "bold", hjust = 0.5, color = "black"), # Bold black title
axis.title = element_text(color = "black"), # Black axis titles
axis.text = element_text(color = "black"), # Black axis text
axis.ticks = element_line(color = "black") # Black axis ticks
)
print(plot)
plot <- ggplot(data = data, aes(x = Age.at.enrollment, fill = ..count..)) +
geom_bar(color = "black") + # Black borders on bars
scale_fill_gradient(low = "skyblue", high = "midnightblue") + # Gradient fill based on count (kept as is)
scale_x_continuous(breaks = seq(15, 50, by = 5)) + # Custom x-axis breaks
labs(
title = "Age Distribution of Students",
x = "Age at Enrollment",
y = "Count"
) +
theme_minimal() +
theme(
plot.background = element_rect(fill = "white", color = NA), # White plot background
panel.background = element_rect(fill = "white", color = NA), # White panel background
panel.border = element_blank(), # No panel border
panel.grid.major = element_line(color = "gray80", linetype = "dashed", size = 0.5), # Light gray dashed major grid lines
panel.grid.minor = element_blank(), # No minor grid lines
plot.title = element_text(size = 20, face = "bold", hjust = 0.5, color = "black", vjust = 1), # Bold black title
axis.title = element_text(color = "black", size = 14, face = "bold"), # Bold black axis titles
axis.text = element_text(color = "black", size = 12), # Black axis text
axis.ticks = element_line(color = "black"), # Black axis ticks
legend.position = "none", # No legend
text = element_text(color = "black") # All text black
)
## Warning: The `size` argument of `element_line()` is deprecated as of ggplot2 3.4.0.
## ℹ Please use the `linewidth` argument instead.
## This warning is displayed once every 8 hours.
## Call `lifecycle::last_lifecycle_warnings()` to see where this warning was
## generated.
print(plot)
plot <- ggplot(data = data, aes(
x = factor(Gender),
y = factor(Marital.status),
size = factor(International),
color = Target
)) +
geom_jitter(alpha = 0.7, width = 0.2, height = 0.2) + # Jitter for visibility
scale_color_manual(
values = c("Dropout" = "red", "Enrolled" = "blue", "Graduate" = "green"),
name = "Target Outcome"
) +
scale_size_manual(
values = c("0" = 3, "1" = 6),
name = "International Status"
) +
labs(
title = "4 Dimension by Target",
x = "Gender",
y = "Marital Status"
) +
theme_minimal() +
theme(
plot.background = element_rect(fill = "white", color = NA), # White plot background
panel.background = element_rect(fill = "white", color = NA), # White panel background
panel.grid.major = element_line(color = "gray80", linetype = "dotted"), # Light gray dotted grid
panel.grid.minor = element_blank(), # No minor grid lines
legend.position = "right",
legend.background = element_rect(fill = "white", color = NA), # White legend background
legend.text = element_text(color = "black"), # Black legend text
legend.title = element_text(color = "black"), # Black legend title
plot.title = element_text(size = 16, face = "bold", hjust = 0.5, color = "black"), # Bold black title
axis.title = element_text(color = "black"), # Black axis titles
axis.text = element_text(color = "black"), # Black axis text
axis.ticks = element_line(color = "black") # Black axis ticks
)
print(plot)
plot <- ggplot(data, aes(x = Gender, y = Curricular.units.1st.sem..grade., fill = Gender)) +
geom_violin(trim = FALSE, alpha = 0.5) + # Violin plot with transparency
geom_jitter(width = 0.2, alpha = 0.7, color = "darkred") + # Jitter with dark red for visibility on white
labs(
title = "Violin Plot of 1st Semester Grades by Gender",
x = "Gender",
y = "1st Semester Grade"
) +
scale_fill_manual(values = c("0" = "#FF6347", "1" = "#4682B4")) + # Manual colors for fill
theme_minimal() +
theme(
plot.background = element_rect(fill = "white", color = NA), # White plot background
panel.background = element_rect(fill = "white", color = NA), # White panel background
text = element_text(color = "black"), # Black general text
axis.title = element_text(color = "black"), # Black axis titles
axis.text = element_text(color = "black"), # Black axis text
axis.ticks = element_line(color = "black"), # Black axis ticks
legend.title = element_text(color = "black"), # Black legend title
legend.text = element_text(color = "black"), # Black legend text
legend.background = element_rect(fill = "white", color = NA), # White legend background
plot.title = element_text(size = 16, face = "bold", color = "black", hjust = 0.5) # Black, bold, centered title
)
print(plot)
set.seed(123)
# First split: 70% train, 30% temp (validation + test)
train_index <- createDataPartition(data$Target, p = 0.7, list = FALSE)
train_data <- data[train_index, ]
temp_data <- data[-train_index, ]
# Now split temp_data into validation (20%) and test (10%)
# Since temp_data is 30%, validation size is 20/30 = 2/3, test size is 1/3
val_index <- createDataPartition(temp_data$Target, p = 2/3, list = FALSE)
validation_data <- temp_data[val_index, ]
test_data <- temp_data[-val_index, ]
# Check dimensions
cat("Training Data Dimensions: ", dim(train_data), "\n")
## Training Data Dimensions: 3098 37
cat("Validation Data Dimensions: ", dim(validation_data), "\n")
## Validation Data Dimensions: 885 37
cat("Testing Data Dimensions: ", dim(test_data), "\n")
## Testing Data Dimensions: 441 37
sapply(train_data, function(x) length(unique(x)))
## Marital.status
## 6
## Application.mode
## 18
## Application.order
## 7
## Course
## 17
## Daytime.evening.attendance.
## 2
## Previous.qualification
## 17
## Previous.qualification..grade.
## 94
## Nacionality
## 17
## Mother.s.qualification
## 28
## Father.s.qualification
## 29
## Mother.s.occupation
## 32
## Father.s.occupation
## 41
## Admission.grade
## 572
## Displaced
## 2
## Educational.special.needs
## 2
## Debtor
## 2
## Tuition.fees.up.to.date
## 2
## Gender
## 2
## Scholarship.holder
## 2
## Age.at.enrollment
## 44
## International
## 2
## Curricular.units.1st.sem..credited.
## 21
## Curricular.units.1st.sem..enrolled.
## 23
## Curricular.units.1st.sem..evaluations.
## 33
## Curricular.units.1st.sem..approved.
## 23
## Curricular.units.1st.sem..grade.
## 624
## Curricular.units.1st.sem..without.evaluations.
## 11
## Curricular.units.2nd.sem..credited.
## 19
## Curricular.units.2nd.sem..enrolled.
## 22
## Curricular.units.2nd.sem..evaluations.
## 29
## Curricular.units.2nd.sem..approved.
## 20
## Curricular.units.2nd.sem..grade.
## 603
## Curricular.units.2nd.sem..without.evaluations.
## 10
## Unemployment.rate
## 10
## Inflation.rate
## 9
## GDP
## 10
## Target
## 3
categorical_cols <- c(
"Marital.status",
"Application.mode",
"Application.order",
"Course",
"Daytime.evening.attendance.",
"Previous.qualification",
"Nacionality", # Check spelling, if necessary rename first
"Mother.s.qualification",
"Father.s.qualification",
"Mother.s.occupation",
"Father.s.occupation",
"Displaced",
"Educational.special.needs",
"Debtor",
"Tuition.fees.up.to.date",
"Gender",
"Scholarship.holder",
"International",
"Target"
)
convert_to_factor <- function(df, cols) {
for (col in cols) {
if (col %in% names(df)) {
df[[col]] <- as.factor(df[[col]])
}
}
return(df)
}
train_data <- convert_to_factor(train_data, categorical_cols)
validation_data <- convert_to_factor(validation_data, categorical_cols)
test_data <- convert_to_factor(test_data, categorical_cols)
sapply(train_data[categorical_cols], class)
## Marital.status Application.mode
## "factor" "factor"
## Application.order Course
## "factor" "factor"
## Daytime.evening.attendance. Previous.qualification
## "factor" "factor"
## Nacionality Mother.s.qualification
## "factor" "factor"
## Father.s.qualification Mother.s.occupation
## "factor" "factor"
## Father.s.occupation Displaced
## "factor" "factor"
## Educational.special.needs Debtor
## "factor" "factor"
## Tuition.fees.up.to.date Gender
## "factor" "factor"
## Scholarship.holder International
## "factor" "factor"
## Target
## "factor"
# Select numeric columns only
numeric_cols <- sapply(train_data, is.numeric)
train_numeric <- train_data[, numeric_cols]
# Fit a linear model with all numeric predictors predicting Target as numeric (dummy)
# But Target is categorical, so exclude it or transform if needed.
# For VIF calculation, target can be any numeric or factor (ignored), we just need predictors
# Add a dummy response (e.g., numeric vector), because vif needs a fitted model
dummy_response <- rnorm(nrow(train_numeric))
lm_model <- lm(dummy_response ~ ., data = train_numeric)
# Calculate VIF
vif_scores <- vif(lm_model)
print(vif_scores)
## Previous.qualification..grade.
## 1.565227
## Admission.grade
## 1.595722
## Age.at.enrollment
## 1.170047
## Curricular.units.1st.sem..credited.
## 15.898277
## Curricular.units.1st.sem..enrolled.
## 23.037649
## Curricular.units.1st.sem..evaluations.
## 3.787089
## Curricular.units.1st.sem..approved.
## 12.244216
## Curricular.units.1st.sem..grade.
## 4.899580
## Curricular.units.1st.sem..without.evaluations.
## 1.763624
## Curricular.units.2nd.sem..credited.
## 12.337427
## Curricular.units.2nd.sem..enrolled.
## 16.140347
## Curricular.units.2nd.sem..evaluations.
## 3.100873
## Curricular.units.2nd.sem..approved.
## 9.703064
## Curricular.units.2nd.sem..grade.
## 5.348682
## Curricular.units.2nd.sem..without.evaluations.
## 1.649284
## Unemployment.rate
## 1.189550
## Inflation.rate
## 1.036869
## GDP
## 1.220623
# Remove 'Curricular.units.1st.sem..enrolled.' column
train_numeric_reduced <- train_numeric[, !(names(train_numeric) %in% "Curricular.units.1st.sem..enrolled.")]
# Fit model again with reduced features
dummy_response <- rnorm(nrow(train_numeric_reduced))
lm_model_reduced <- lm(dummy_response ~ ., data = train_numeric_reduced)
# Calculate VIF again
vif_scores_reduced <- vif(lm_model_reduced)
print(vif_scores_reduced)
## Previous.qualification..grade.
## 1.565220
## Admission.grade
## 1.594920
## Age.at.enrollment
## 1.168753
## Curricular.units.1st.sem..credited.
## 12.697432
## Curricular.units.1st.sem..evaluations.
## 3.291253
## Curricular.units.1st.sem..approved.
## 10.935767
## Curricular.units.1st.sem..grade.
## 4.820544
## Curricular.units.1st.sem..without.evaluations.
## 1.763124
## Curricular.units.2nd.sem..credited.
## 11.387264
## Curricular.units.2nd.sem..enrolled.
## 3.465379
## Curricular.units.2nd.sem..evaluations.
## 2.966615
## Curricular.units.2nd.sem..approved.
## 9.141113
## Curricular.units.2nd.sem..grade.
## 5.313343
## Curricular.units.2nd.sem..without.evaluations.
## 1.645898
## Unemployment.rate
## 1.173289
## Inflation.rate
## 1.032261
## GDP
## 1.219821
# Remove both columns
exclude_vars <- c("Curricular.units.1st.sem..enrolled.", "Curricular.units.1st.sem..credited.")
train_numeric_reduced2 <- train_numeric[, !(names(train_numeric) %in% exclude_vars)]
# Fit linear model again
dummy_response <- rnorm(nrow(train_numeric_reduced2))
lm_model_reduced2 <- lm(dummy_response ~ ., data = train_numeric_reduced2)
# Calculate VIF scores
vif_scores_reduced2 <- vif(lm_model_reduced2)
print(vif_scores_reduced2)
## Previous.qualification..grade.
## 1.564807
## Admission.grade
## 1.593882
## Age.at.enrollment
## 1.158010
## Curricular.units.1st.sem..evaluations.
## 3.122196
## Curricular.units.1st.sem..approved.
## 8.502038
## Curricular.units.1st.sem..grade.
## 4.553541
## Curricular.units.1st.sem..without.evaluations.
## 1.762912
## Curricular.units.2nd.sem..credited.
## 3.017645
## Curricular.units.2nd.sem..enrolled.
## 3.429138
## Curricular.units.2nd.sem..evaluations.
## 2.933832
## Curricular.units.2nd.sem..approved.
## 8.384907
## Curricular.units.2nd.sem..grade.
## 5.291938
## Curricular.units.2nd.sem..without.evaluations.
## 1.645874
## Unemployment.rate
## 1.172584
## Inflation.rate
## 1.032174
## GDP
## 1.219591
# Exclude the three variables
exclude_vars <- c(
"Curricular.units.1st.sem..enrolled.",
"Curricular.units.1st.sem..credited.",
"Curricular.units.1st.sem..approved."
)
train_numeric_reduced3 <- train_numeric[, !(names(train_numeric) %in% exclude_vars)]
# Fit linear model again with reduced set
dummy_response <- rnorm(nrow(train_numeric_reduced3))
lm_model_reduced3 <- lm(dummy_response ~ ., data = train_numeric_reduced3)
# Calculate VIF
vif_scores_reduced3 <- vif(lm_model_reduced3)
print(vif_scores_reduced3)
## Previous.qualification..grade.
## 1.563285
## Admission.grade
## 1.593857
## Age.at.enrollment
## 1.157789
## Curricular.units.1st.sem..evaluations.
## 3.112376
## Curricular.units.1st.sem..grade.
## 3.733919
## Curricular.units.1st.sem..without.evaluations.
## 1.761334
## Curricular.units.2nd.sem..credited.
## 2.550904
## Curricular.units.2nd.sem..enrolled.
## 3.374302
## Curricular.units.2nd.sem..evaluations.
## 2.923126
## Curricular.units.2nd.sem..approved.
## 5.677083
## Curricular.units.2nd.sem..grade.
## 5.253872
## Curricular.units.2nd.sem..without.evaluations.
## 1.640266
## Unemployment.rate
## 1.171351
## Inflation.rate
## 1.031863
## GDP
## 1.219379
# Exclude four variables now
exclude_vars <- c(
"Curricular.units.1st.sem..enrolled.",
"Curricular.units.1st.sem..credited.",
"Curricular.units.1st.sem..approved.",
"Curricular.units.2nd.sem..approved."
)
train_numeric_reduced4 <- train_numeric[, !(names(train_numeric) %in% exclude_vars)]
# Fit linear model again
dummy_response <- rnorm(nrow(train_numeric_reduced4))
lm_model_reduced4 <- lm(dummy_response ~ ., data = train_numeric_reduced4)
# Calculate VIF
vif_scores_reduced4 <- vif(lm_model_reduced4)
print(vif_scores_reduced4)
## Previous.qualification..grade.
## 1.563145
## Admission.grade
## 1.593235
## Age.at.enrollment
## 1.127873
## Curricular.units.1st.sem..evaluations.
## 3.081503
## Curricular.units.1st.sem..grade.
## 3.690190
## Curricular.units.1st.sem..without.evaluations.
## 1.761122
## Curricular.units.2nd.sem..credited.
## 2.099791
## Curricular.units.2nd.sem..enrolled.
## 2.594257
## Curricular.units.2nd.sem..evaluations.
## 2.839603
## Curricular.units.2nd.sem..grade.
## 3.410505
## Curricular.units.2nd.sem..without.evaluations.
## 1.636908
## Unemployment.rate
## 1.167426
## Inflation.rate
## 1.030640
## GDP
## 1.217992
# List of variables to exclude for the linear dataset
exclude_vars <- c(
"Curricular.units.1st.sem..enrolled.",
"Curricular.units.1st.sem..credited.",
"Curricular.units.1st.sem..approved.",
"Curricular.units.2nd.sem..approved."
)
# Create linear train dataset by excluding the vars
train_data_linear <- train_data[, !(names(train_data) %in% exclude_vars)]
# Similarly for validation dataset
val_data_linear <- validation_data[, !(names(validation_data) %in% exclude_vars)]
# Similarly for test dataset
test_data_linear <- test_data[, !(names(test_data) %in% exclude_vars)]
# Original sets remain unchanged:
# train_data, validation_data, test_data
# (Optional) Check dimensions to confirm
cat("Train data shape:", dim(train_data), "\n")
## Train data shape: 3098 37
cat("Train data linear shape:", dim(train_data_linear), "\n")
## Train data linear shape: 3098 33
cat("Validation data shape:", dim(validation_data), "\n")
## Validation data shape: 885 37
cat("Validation data linear shape:", dim(val_data_linear), "\n")
## Validation data linear shape: 885 33
cat("Test data shape:", dim(test_data), "\n")
## Test data shape: 441 37
cat("Test data linear shape:", dim(test_data_linear), "\n")
## Test data linear shape: 441 33
# Check the distribution of the target variable
target_distribution <- table(train_data$Target)
print(target_distribution)
##
## Dropout Enrolled Graduate
## 995 556 1547
# Plot the distribution of the target variable
ggplot(train_data, aes(x = Target)) +
geom_bar() +
ggtitle("Distribution of Target Variable") +
xlab("Target") +
ylab("Count")
# Check the balance of the target variable
balance_level <- prop.table(target_distribution)
print(balance_level)
##
## Dropout Enrolled Graduate
## 0.3211750 0.1794706 0.4993544
# Optional: You can also calculate the imbalance ratio
imbalance_ratio <- max(balance_level) / min(balance_level)
cat("Imbalance Ratio: ", imbalance_ratio, "\n")
## Imbalance Ratio: 2.782374
# Identify numeric columns helper function
get_numeric_cols <- function(df) {
names(df)[sapply(df, is.numeric)]
}
# Standardization function (fits on train, applies on all)
standardize_data <- function(train_df, val_df, test_df, numeric_vars) {
train_means <- sapply(train_df[, numeric_vars], mean, na.rm = TRUE)
train_sds <- sapply(train_df[, numeric_vars], sd, na.rm = TRUE)
scale_col <- function(x, mean_, sd_) {
(x - mean_) / sd_
}
train_df[, numeric_vars] <- mapply(scale_col, train_df[, numeric_vars], train_means, train_sds, SIMPLIFY = FALSE)
train_df <- as.data.frame(train_df)
val_df[, numeric_vars] <- mapply(scale_col, val_df[, numeric_vars], train_means, train_sds, SIMPLIFY = FALSE)
val_df <- as.data.frame(val_df)
test_df[, numeric_vars] <- mapply(scale_col, test_df[, numeric_vars], train_means, train_sds, SIMPLIFY = FALSE)
test_df <- as.data.frame(test_df)
return(list(train = train_df, val = val_df, test = test_df))
}
# For full datasets
numeric_cols_full <- get_numeric_cols(train_data)
scaled_full <- standardize_data(train_data, validation_data, test_data, numeric_cols_full)
train_data_scaled <- scaled_full$train
validation_data_scaled <- scaled_full$val
test_data_scaled <- scaled_full$test
# For linear datasets (exclude 4 vars already)
numeric_cols_linear <- get_numeric_cols(train_data_linear)
scaled_linear <- standardize_data(train_data_linear, val_data_linear, test_data_linear, numeric_cols_linear)
train_data_linear_scaled <- scaled_linear$train
val_data_linear_scaled <- scaled_linear$val
test_data_linear_scaled <- scaled_linear$test
label_encode <- function(df, categorical_cols) {
for (col in categorical_cols) {
if (col %in% names(df)) {
df[[col]] <- as.integer(as.factor(df[[col]]))
}
}
return(df)
}
categorical_cols <- c(
"Marital.status",
"Application.mode",
"Application.order",
"Course",
"Daytime.evening.attendance.",
"Previous.qualification",
"Nacionality",
"Mother.s.qualification",
"Father.s.qualification",
"Mother.s.occupation",
"Father.s.occupation",
"Displaced",
"Educational.special.needs",
"Debtor",
"Tuition.fees.up.to.date",
"Gender",
"Scholarship.holder",
"International",
"Target"
)
# Full datasets (scaled)
train_data_scaled_label <- label_encode(train_data_scaled, categorical_cols)
validation_data_scaled_label <- label_encode(validation_data_scaled, categorical_cols)
test_data_scaled_label <- label_encode(test_data_scaled, categorical_cols)
# Linear datasets (scaled and reduced)
train_data_linear_scaled_label <- label_encode(train_data_linear_scaled, categorical_cols)
val_data_linear_scaled_label <- label_encode(val_data_linear_scaled, categorical_cols)
test_data_linear_scaled_label <- label_encode(test_data_linear_scaled, categorical_cols)
# Define the original class labels in order
levels <- c("Dropout", "Enrolled", "Graduate")
# Convert Target to factor in full scaled label datasets
train_data_scaled_label$Target <- factor(train_data_scaled_label$Target,
levels = 1:3,
labels = levels)
validation_data_scaled_label$Target <- factor(validation_data_scaled_label$Target,
levels = 1:3,
labels = levels)
test_data_scaled_label$Target <- factor(test_data_scaled_label$Target,
levels = 1:3,
labels = levels)
# Convert Target to factor in linear scaled label datasets
train_data_linear_scaled_label$Target <- factor(train_data_linear_scaled_label$Target,
levels = 1:3,
labels = levels)
val_data_linear_scaled_label$Target <- factor(val_data_linear_scaled_label$Target,
levels = 1:3,
labels = levels)
test_data_linear_scaled_label$Target <- factor(test_data_linear_scaled_label$Target,
levels = 1:3,
labels = levels)
# Fit multinomial logistic regression on train linear data
model_multinom <- multinom(Target ~ ., data = train_data_linear_scaled_label)
## # weights: 102 (66 variable)
## initial value 3403.500870
## iter 10 value 2625.912433
## iter 20 value 2391.883881
## iter 30 value 2265.647018
## iter 40 value 2144.227671
## iter 50 value 2093.493937
## iter 60 value 2072.899405
## iter 70 value 2064.472794
## final value 2063.827872
## converged
summary(model_multinom)
## Call:
## multinom(formula = Target ~ ., data = train_data_linear_scaled_label)
##
## Coefficients:
## (Intercept) Marital.status Application.mode Application.order
## Enrolled -4.970986 0.1349341 0.004792362 -0.087231018
## Graduate -4.646281 0.0740570 -0.038629301 -0.004268598
## Course Daytime.evening.attendance. Previous.qualification
## Enrolled -0.05356977 -0.2057806 -0.02035063
## Graduate -0.11413040 -0.4776923 0.00240806
## Previous.qualification..grade. Nacionality Mother.s.qualification
## Enrolled -0.04615625 -0.1762480 -0.02669279
## Graduate 0.05195457 -0.1852153 -0.01496183
## Father.s.qualification Mother.s.occupation Father.s.occupation
## Enrolled 0.0007524527 0.06516743 0.021592398
## Graduate 0.0062540554 0.08119092 -0.004775616
## Admission.grade Displaced Educational.special.needs Debtor
## Enrolled 0.05409725 -0.2462297 -0.01231618 -0.07868301
## Graduate 0.13824526 -0.1970616 -0.17080582 -0.82425788
## Tuition.fees.up.to.date Gender Scholarship.holder
## Enrolled 2.158581 -0.1856010 0.2784741
## Graduate 2.938506 -0.6449061 1.1008171
## Age.at.enrollment International Curricular.units.1st.sem..evaluations.
## Enrolled -0.4328661 1.692527 0.003455634
## Graduate -0.3877913 2.290398 -0.543703485
## Curricular.units.1st.sem..grade.
## Enrolled 0.0859260
## Graduate 0.4839606
## Curricular.units.1st.sem..without.evaluations.
## Enrolled 0.0659562
## Graduate 0.1207751
## Curricular.units.2nd.sem..credited.
## Enrolled 0.02322858
## Graduate 0.41981655
## Curricular.units.2nd.sem..enrolled.
## Enrolled -0.63222748
## Graduate 0.02060578
## Curricular.units.2nd.sem..evaluations.
## Enrolled 0.3412665
## Graduate -0.5238160
## Curricular.units.2nd.sem..grade.
## Enrolled 0.9785803
## Graduate 1.7934192
## Curricular.units.2nd.sem..without.evaluations. Unemployment.rate
## Enrolled -0.04840042 -0.23687648
## Graduate -0.06725656 -0.02150649
## Inflation.rate GDP
## Enrolled -0.048423740 0.005129479
## Graduate 0.002158582 -0.030856700
##
## Std. Errors:
## (Intercept) Marital.status Application.mode Application.order
## Enrolled 1.578831 0.1158612 0.01478480 0.05401459
## Graduate 1.584823 0.1140869 0.01377629 0.04840572
## Course Daytime.evening.attendance. Previous.qualification
## Enrolled 0.01668229 0.2384172 0.01822625
## Graduate 0.01544589 0.2196586 0.01733365
## Previous.qualification..grade. Nacionality Mother.s.qualification
## Enrolled 0.07878344 0.1342293 0.009401995
## Graduate 0.07269507 0.1295438 0.008845458
## Father.s.qualification Mother.s.occupation Father.s.occupation
## Enrolled 0.007775230 0.02394872 0.02079515
## Graduate 0.007384023 0.02347498 0.02057611
## Admission.grade Displaced Educational.special.needs Debtor
## Enrolled 0.07930726 0.1438526 0.5413504 0.1999463
## Graduate 0.07421268 0.1363281 0.5274062 0.2156568
## Tuition.fees.up.to.date Gender Scholarship.holder Age.at.enrollment
## Enrolled 0.2374360 0.1337255 0.1796631 0.09247572
## Graduate 0.2765203 0.1276759 0.1594349 0.08379577
## International Curricular.units.1st.sem..evaluations.
## Enrolled 1.317618 0.1045628
## Graduate 1.325307 0.1068802
## Curricular.units.1st.sem..grade.
## Enrolled 0.1175637
## Graduate 0.1390868
## Curricular.units.1st.sem..without.evaluations.
## Enrolled 0.07620165
## Graduate 0.08449408
## Curricular.units.2nd.sem..credited.
## Enrolled 0.10920732
## Graduate 0.08501929
## Curricular.units.2nd.sem..enrolled.
## Enrolled 0.1142730
## Graduate 0.1001509
## Curricular.units.2nd.sem..evaluations.
## Enrolled 0.09940148
## Graduate 0.10359026
## Curricular.units.2nd.sem..grade.
## Enrolled 0.1156692
## Graduate 0.1458657
## Curricular.units.2nd.sem..without.evaluations. Unemployment.rate
## Enrolled 0.07373720 0.06936053
## Graduate 0.08398346 0.06564656
## Inflation.rate GDP
## Enrolled 0.06354519 0.07092573
## Graduate 0.05935080 0.06693778
##
## Residual Deviance: 4127.656
## AIC: 4259.656
# 1. Predict classes and probabilities on train data
train_preds_class <- predict(model_multinom, newdata = train_data_linear_scaled_label, type = "class")
train_preds_prob <- predict(model_multinom, newdata = train_data_linear_scaled_label, type = "prob")
# 2. Macro F1 and Balanced Accuracy calculation using caret
conf_mat <- confusionMatrix(train_preds_class, train_data_linear_scaled_label$Target)
# Extract per-class F1 manually
precision <- conf_mat$byClass[,"Precision"]
recall <- conf_mat$byClass[,"Recall"]
f1_per_class <- 2 * precision * recall / (precision + recall)
mlogistic_train_MacroF1 <- mean(f1_per_class, na.rm = TRUE)
# Balanced Accuracy is available directly
mlogistic_train_BA <- conf_mat$byClass[,"Balanced Accuracy"][1] # For multiclass, caret shows averaged in first row
# 3. Log Loss calculation using MLmetrics
# Prepare actual matrix for true classes (one-hot)
actual_matrix <- model.matrix(~ Target - 1, data = train_data_linear_scaled_label)
colnames(actual_matrix) <- gsub("Target", "", colnames(actual_matrix)) # Clean col names
mlogistic_train_LogLoss <- MultiLogLoss(y_pred = train_preds_prob, y_true = actual_matrix)
# Print results
cat("Macro F1 (train): ", mlogistic_train_MacroF1, "\n")
## Macro F1 (train): 0.6333057
cat("Balanced Accuracy (train): ", mlogistic_train_BA, "\n")
## Balanced Accuracy (train): 0.8097083
cat("Log Loss (train): ", mlogistic_train_LogLoss, "\n")
## Log Loss (train): 0.6661807
# 1. Predict classes and probabilities on validation data
val_preds_class <- predict(model_multinom, newdata = val_data_linear_scaled_label, type = "class")
val_preds_prob <- predict(model_multinom, newdata = val_data_linear_scaled_label, type = "prob")
# 2. Macro F1 and Balanced Accuracy calculation using caret
conf_mat_val <- confusionMatrix(val_preds_class, val_data_linear_scaled_label$Target)
# Extract per-class F1 manually
precision_val <- conf_mat_val$byClass[,"Precision"]
recall_val <- conf_mat_val$byClass[,"Recall"]
f1_per_class_val <- 2 * precision_val * recall_val / (precision_val + recall_val)
mlogistic_val_MacroF1 <- mean(f1_per_class_val, na.rm = TRUE)
# Balanced Accuracy is available directly
mlogistic_val_BA <- conf_mat_val$byClass[,"Balanced Accuracy"][1] # For multiclass, caret shows averaged in first row
# 3. Log Loss calculation using MLmetrics
# Prepare actual matrix for true classes (one-hot)
actual_matrix_val <- model.matrix(~ Target - 1, data = val_data_linear_scaled_label)
colnames(actual_matrix_val) <- gsub("Target", "", colnames(actual_matrix_val)) # Clean col names
mlogistic_val_LogLoss <- MLmetrics::MultiLogLoss(y_pred = val_preds_prob, y_true = actual_matrix_val)
# Print results
cat("Macro F1 (validation): ", mlogistic_val_MacroF1, "\n")
## Macro F1 (validation): 0.6213522
cat("Balanced Accuracy (validation): ", mlogistic_val_BA, "\n")
## Balanced Accuracy (validation): 0.8089481
cat("Log Loss (validation): ", mlogistic_val_LogLoss, "\n")
## Log Loss (validation): 0.6649213
# 1. Train SVM with linear kernel
svm_model_linear <- svm(Target ~ ., data = train_data_linear_scaled_label,
kernel = "linear", probability = TRUE)
# 2. Predict on train data
train_svm_preds_class <- predict(svm_model_linear, newdata = train_data_linear_scaled_label)
train_svm_preds_prob <- attr(predict(svm_model_linear, newdata = train_data_linear_scaled_label, probability = TRUE), "probabilities")
# 3. Calculate Macro F1 and Balanced Accuracy
conf_mat_svm <- confusionMatrix(train_svm_preds_class, train_data_linear_scaled_label$Target)
precision_svm <- conf_mat_svm$byClass[,"Precision"]
recall_svm <- conf_mat_svm$byClass[,"Recall"]
f1_per_class_svm <- 2 * precision_svm * recall_svm / (precision_svm + recall_svm)
svm_train_MacroF1 <- mean(f1_per_class_svm, na.rm = TRUE)
svm_train_BA <- conf_mat_svm$byClass[,"Balanced Accuracy"][1] # averaged balanced accuracy
# 4. Calculate Log Loss
actual_matrix_train <- model.matrix(~ Target - 1, data = train_data_linear_scaled_label)
colnames(actual_matrix_train) <- gsub("Target", "", colnames(actual_matrix_train))
svm_train_LogLoss <- MultiLogLoss(y_pred = train_svm_preds_prob, y_true = actual_matrix_train)
# 5. Print results
cat("SVM Linear - Macro F1 (train): ", svm_train_MacroF1, "\n")
## SVM Linear - Macro F1 (train): 0.6370654
cat("SVM Linear - Balanced Accuracy (train): ", svm_train_BA, "\n")
## SVM Linear - Balanced Accuracy (train): 0.7986425
cat("SVM Linear - Log Loss (train): ", svm_train_LogLoss, "\n")
## SVM Linear - Log Loss (train): 2.255126
# 1. Predict classes and probabilities on validation data
val_svm_preds_class <- predict(svm_model_linear, newdata = val_data_linear_scaled_label)
val_svm_preds_prob <- attr(predict(svm_model_linear, newdata = val_data_linear_scaled_label, probability = TRUE), "probabilities")
# 2. Calculate Macro F1 and Balanced Accuracy using caret
conf_mat_val_svm <- confusionMatrix(val_svm_preds_class, val_data_linear_scaled_label$Target)
precision_val_svm <- conf_mat_val_svm$byClass[,"Precision"]
recall_val_svm <- conf_mat_val_svm$byClass[,"Recall"]
f1_per_class_val_svm <- 2 * precision_val_svm * recall_val_svm / (precision_val_svm + recall_val_svm)
svm_val_MacroF1 <- mean(f1_per_class_val_svm, na.rm = TRUE)
svm_val_BA <- conf_mat_val_svm$byClass[,"Balanced Accuracy"][1] # averaged balanced accuracy
# 3. Calculate Log Loss
actual_matrix_val <- model.matrix(~ Target - 1, data = val_data_linear_scaled_label)
colnames(actual_matrix_val) <- gsub("Target", "", colnames(actual_matrix_val))
svm_val_LogLoss <- MLmetrics::MultiLogLoss(y_pred = val_svm_preds_prob, y_true = actual_matrix_val)
# 4. Print results
cat("SVM Linear - Macro F1 (validation): ", svm_val_MacroF1, "\n")
## SVM Linear - Macro F1 (validation): 0.6231165
cat("SVM Linear - Balanced Accuracy (validation): ", svm_val_BA, "\n")
## SVM Linear - Balanced Accuracy (validation): 0.8017125
cat("SVM Linear - Log Loss (validation): ", svm_val_LogLoss, "\n")
## SVM Linear - Log Loss (validation): 2.306354
# Define training control with cross-validation
train_control <- trainControl(method = "cv", number = 5, classProbs = TRUE, summaryFunction = multiClassSummary)
# Parameter grid for cost
tune_grid <- expand.grid(C = c(0.01, 0.1, 1, 5, 10))
# Train linear SVM with grid search using caret
set.seed(123) # For reproducibility
svm_linear_tuned <- train(
Target ~ .,
data = train_data_linear_scaled_label,
method = "svmLinear",
trControl = train_control,
tuneGrid = tune_grid,
metric = "F1" # Optimize for Macro F1 score
)
## Warning in train.default(x, y, weights = w, ...): The metric "F1" was not in
## the result set. logLoss will be used instead.
# Best tuned model
best_svm <- svm_linear_tuned$finalModel
# Predict classes and probabilities on train data
train_preds_class <- predict(svm_linear_tuned, newdata = train_data_linear_scaled_label)
train_preds_prob <- predict(svm_linear_tuned, newdata = train_data_linear_scaled_label, type = "prob")
# Confusion matrix for train data
conf_mat <- confusionMatrix(train_preds_class, train_data_linear_scaled_label$Target)
# Macro F1
precision <- conf_mat$byClass[,"Precision"]
recall <- conf_mat$byClass[,"Recall"]
f1_per_class <- 2 * precision * recall / (precision + recall)
svm_train_MacroF1 <- mean(f1_per_class, na.rm = TRUE)
# Balanced Accuracy
svm_train_BA <- conf_mat$byClass[,"Balanced Accuracy"][1]
# Log Loss
actual_matrix <- model.matrix(~ Target - 1, data = train_data_linear_scaled_label)
colnames(actual_matrix) <- gsub("Target", "", colnames(actual_matrix))
svm_train_LogLoss <- MultiLogLoss(y_pred = as.matrix(train_preds_prob), y_true = actual_matrix)
# Print results
cat("Tuned SVM Linear - Macro F1 (train): ", svm_train_MacroF1, "\n")
## Tuned SVM Linear - Macro F1 (train): 0.625284
cat("Tuned SVM Linear - Balanced Accuracy (train): ", svm_train_BA, "\n")
## Tuned SVM Linear - Balanced Accuracy (train): 0.8012413
cat("Tuned SVM Linear - Log Loss (train): ", svm_train_LogLoss, "\n")
## Tuned SVM Linear - Log Loss (train): 0.6724668
# 1. Predict on validation data using tuned model
val_preds_class <- predict(svm_linear_tuned, newdata = val_data_linear_scaled_label)
val_preds_prob <- predict(svm_linear_tuned, newdata = val_data_linear_scaled_label, type = "prob")
# 2. Calculate Macro F1 and Balanced Accuracy using caret
conf_mat_val <- confusionMatrix(val_preds_class, val_data_linear_scaled_label$Target)
precision_val <- conf_mat_val$byClass[,"Precision"]
recall_val <- conf_mat_val$byClass[,"Recall"]
f1_per_class_val <- 2 * precision_val * recall_val / (precision_val + recall_val)
svm_val_MacroF1 <- mean(f1_per_class_val, na.rm = TRUE)
svm_val_BA <- conf_mat_val$byClass[,"Balanced Accuracy"][1] # averaged balanced accuracy
# 3. Calculate Log Loss
actual_matrix_val <- model.matrix(~ Target - 1, data = val_data_linear_scaled_label)
colnames(actual_matrix_val) <- gsub("Target", "", colnames(actual_matrix_val))
svm_val_LogLoss <- MLmetrics::MultiLogLoss(y_pred = as.matrix(val_preds_prob), y_true = actual_matrix_val)
# 4. Print validation metrics
cat("Tuned SVM Linear - Macro F1 (validation): ", svm_val_MacroF1, "\n")
## Tuned SVM Linear - Macro F1 (validation): 0.6130692
cat("Tuned SVM Linear - Balanced Accuracy (validation): ", svm_val_BA, "\n")
## Tuned SVM Linear - Balanced Accuracy (validation): 0.8029311
cat("Tuned SVM Linear - Log Loss (validation): ", svm_val_LogLoss, "\n")
## Tuned SVM Linear - Log Loss (validation): 0.6600792
# 1. Train SVM with RBF kernel
svm_model_nonlinear <- svm(Target ~ ., data = train_data_linear_scaled_label,
kernel = "radial", probability = TRUE)
# 2. Predict on train data
train_svm_nl_preds_class <- predict(svm_model_nonlinear, newdata = train_data_linear_scaled_label)
train_svm_nl_preds_prob <- attr(predict(svm_model_nonlinear, newdata = train_data_linear_scaled_label, probability = TRUE), "probabilities")
# 3. Calculate Macro F1 and Balanced Accuracy
conf_mat_svm_nl <- confusionMatrix(train_svm_nl_preds_class, train_data_linear_scaled_label$Target)
precision_svm_nl <- conf_mat_svm_nl$byClass[,"Precision"]
recall_svm_nl <- conf_mat_svm_nl$byClass[,"Recall"]
f1_per_class_svm_nl <- 2 * precision_svm_nl * recall_svm_nl / (precision_svm_nl + recall_svm_nl)
svm_nonlinear_train_MacroF1 <- mean(f1_per_class_svm_nl, na.rm = TRUE)
svm_nonlinear_train_BA <- conf_mat_svm_nl$byClass[,"Balanced Accuracy"][1] # averaged balanced accuracy
# 4. Calculate Log Loss
actual_matrix_train <- model.matrix(~ Target - 1, data = train_data_linear_scaled_label)
colnames(actual_matrix_train) <- gsub("Target", "", colnames(actual_matrix_train))
svm_nonlinear_train_LogLoss <- MultiLogLoss(y_pred = train_svm_nl_preds_prob, y_true = actual_matrix_train)
# 5. Print results
cat("SVM Nonlinear - Macro F1 (train): ", svm_nonlinear_train_MacroF1, "\n")
## SVM Nonlinear - Macro F1 (train): 0.7322078
cat("SVM Nonlinear - Balanced Accuracy (train): ", svm_nonlinear_train_BA, "\n")
## SVM Nonlinear - Balanced Accuracy (train): 0.85694
cat("SVM Nonlinear - Log Loss (train): ", svm_nonlinear_train_LogLoss, "\n")
## SVM Nonlinear - Log Loss (train): 2.384729
# 1. Predict classes and probabilities on validation data
val_svm_nl_preds_class <- predict(svm_model_nonlinear, newdata = val_data_linear_scaled_label)
val_svm_nl_preds_prob <- attr(predict(svm_model_nonlinear, newdata = val_data_linear_scaled_label, probability = TRUE), "probabilities")
# 2. Calculate Macro F1 and Balanced Accuracy using caret
conf_mat_val_svm_nl <- confusionMatrix(val_svm_nl_preds_class, val_data_linear_scaled_label$Target)
precision_val_svm_nl <- conf_mat_val_svm_nl$byClass[,"Precision"]
recall_val_svm_nl <- conf_mat_val_svm_nl$byClass[,"Recall"]
f1_per_class_val_svm_nl <- 2 * precision_val_svm_nl * recall_val_svm_nl / (precision_val_svm_nl + recall_val_svm_nl)
svm_nonlinear_val_MacroF1 <- mean(f1_per_class_val_svm_nl, na.rm = TRUE)
svm_nonlinear_val_BA <- conf_mat_val_svm_nl$byClass[,"Balanced Accuracy"][1] # averaged balanced accuracy
# 3. Calculate Log Loss
actual_matrix_val <- model.matrix(~ Target - 1, data = val_data_linear_scaled_label)
colnames(actual_matrix_val) <- gsub("Target", "", colnames(actual_matrix_val))
svm_nonlinear_val_LogLoss <- MLmetrics::MultiLogLoss(y_pred = val_svm_nl_preds_prob, y_true = actual_matrix_val)
# 4. Print results
cat("SVM Nonlinear - Macro F1 (validation): ", svm_nonlinear_val_MacroF1, "\n")
## SVM Nonlinear - Macro F1 (validation): 0.6238172
cat("SVM Nonlinear - Balanced Accuracy (validation): ", svm_nonlinear_val_BA, "\n")
## SVM Nonlinear - Balanced Accuracy (validation): 0.8126245
cat("SVM Nonlinear - Log Loss (validation): ", svm_nonlinear_val_LogLoss, "\n")
## SVM Nonlinear - Log Loss (validation): 2.366319
# Define training control for 5-fold cross-validation
train_control <- trainControl(method = "cv", number = 5, classProbs = TRUE, summaryFunction = multiClassSummary)
# Define tuning grid for cost and gamma
tune_grid <- expand.grid(
C = c(0.1, 1, 5, 10),
sigma = c(0.01, 0.05, 0.1, 0.2)
)
set.seed(123) # for reproducibility
# Train SVM with radial kernel and grid search on full scaled label data
svm_nonlinear_tuned <- train(
Target ~ .,
data = train_data_scaled_label,
method = "svmRadial",
trControl = train_control,
tuneGrid = tune_grid,
metric = "F1" # Optimize for Macro F1
)
## Warning in train.default(x, y, weights = w, ...): The metric "F1" was not in
## the result set. logLoss will be used instead.
# Best model extracted
best_svm_nonlinear <- svm_nonlinear_tuned$finalModel
# Predict on train data using the tuned model
train_preds_class <- predict(svm_nonlinear_tuned, newdata = train_data_scaled_label)
train_preds_prob <- predict(svm_nonlinear_tuned, newdata = train_data_scaled_label, type = "prob")
# Calculate Macro F1 and Balanced Accuracy
conf_mat <- confusionMatrix(train_preds_class, train_data_scaled_label$Target)
precision <- conf_mat$byClass[,"Precision"]
recall <- conf_mat$byClass[,"Recall"]
f1_per_class <- 2 * precision * recall / (precision + recall)
svm_nonlinear_train_MacroF1 <- mean(f1_per_class, na.rm = TRUE)
svm_nonlinear_train_BA <- conf_mat$byClass[,"Balanced Accuracy"][1]
# Calculate Log Loss
actual_matrix <- model.matrix(~ Target - 1, data = train_data_scaled_label)
colnames(actual_matrix) <- gsub("Target", "", colnames(actual_matrix))
svm_nonlinear_train_LogLoss <- MultiLogLoss(y_pred = as.matrix(train_preds_prob), y_true = actual_matrix)
# Print training results
cat("Tuned SVM Nonlinear - Macro F1 (train): ", svm_nonlinear_train_MacroF1, "\n")
## Tuned SVM Nonlinear - Macro F1 (train): 0.774855
cat("Tuned SVM Nonlinear - Balanced Accuracy (train): ", svm_nonlinear_train_BA, "\n")
## Tuned SVM Nonlinear - Balanced Accuracy (train): 0.8829461
cat("Tuned SVM Nonlinear - Log Loss (train): ", svm_nonlinear_train_LogLoss, "\n")
## Tuned SVM Nonlinear - Log Loss (train): 0.4553329
# 1. Predict classes and probabilities on validation data
val_preds_class <- predict(svm_nonlinear_tuned, newdata = validation_data_scaled_label)
val_preds_prob <- predict(svm_nonlinear_tuned, newdata = validation_data_scaled_label, type = "prob")
# 2. Calculate Macro F1 and Balanced Accuracy using caret
conf_mat_val <- confusionMatrix(val_preds_class, validation_data_scaled_label$Target)
precision_val <- conf_mat_val$byClass[,"Precision"]
recall_val <- conf_mat_val$byClass[,"Recall"]
f1_per_class_val <- 2 * precision_val * recall_val / (precision_val + recall_val)
svm_nonlinear_val_MacroF1 <- mean(f1_per_class_val, na.rm = TRUE)
svm_nonlinear_val_BA <- conf_mat_val$byClass[,"Balanced Accuracy"][1] # averaged balanced accuracy
# 3. Calculate Log Loss
actual_matrix_val <- model.matrix(~ Target - 1, data = validation_data_scaled_label)
colnames(actual_matrix_val) <- gsub("Target", "", colnames(actual_matrix_val))
svm_nonlinear_val_LogLoss <- MLmetrics::MultiLogLoss(y_pred = as.matrix(val_preds_prob), y_true = actual_matrix_val)
# 4. Print validation metrics
cat("Tuned SVM Nonlinear - Macro F1 (validation): ", svm_nonlinear_val_MacroF1, "\n")
## Tuned SVM Nonlinear - Macro F1 (validation): 0.6996576
cat("Tuned SVM Nonlinear - Balanced Accuracy (validation): ", svm_nonlinear_val_BA, "\n")
## Tuned SVM Nonlinear - Balanced Accuracy (validation): 0.8649961
cat("Tuned SVM Nonlinear - Log Loss (validation): ", svm_nonlinear_val_LogLoss, "\n")
## Tuned SVM Nonlinear - Log Loss (validation): 0.5423017
# 1. Train Random Forest on full scaled label-encoded train data (default parameters)
set.seed(123)
rf_model <- randomForest(Target ~ ., data = train_data_scaled_label)
# 2. Predict on train data
train_rf_preds_class <- predict(rf_model, newdata = train_data_scaled_label)
train_rf_preds_prob <- predict(rf_model, newdata = train_data_scaled_label, type = "prob")
# 3. Calculate Macro F1 and Balanced Accuracy using caret
conf_mat_rf <- confusionMatrix(train_rf_preds_class, train_data_scaled_label$Target)
precision_rf <- conf_mat_rf$byClass[,"Precision"]
recall_rf <- conf_mat_rf$byClass[,"Recall"]
f1_per_class_rf <- 2 * precision_rf * recall_rf / (precision_rf + recall_rf)
rf_train_MacroF1 <- mean(f1_per_class_rf, na.rm = TRUE)
rf_train_BA <- conf_mat_rf$byClass[,"Balanced Accuracy"][1] # averaged balanced accuracy
# 4. Calculate Log Loss
actual_matrix_train <- model.matrix(~ Target - 1, data = train_data_scaled_label)
colnames(actual_matrix_train) <- gsub("Target", "", colnames(actual_matrix_train))
rf_train_LogLoss <- MultiLogLoss(y_pred = as.matrix(train_rf_preds_prob), y_true = actual_matrix_train)
# 5. Print training results
cat("Random Forest - Macro F1 (train): ", rf_train_MacroF1, "\n")
## Random Forest - Macro F1 (train): 1
cat("Random Forest - Balanced Accuracy (train): ", rf_train_BA, "\n")
## Random Forest - Balanced Accuracy (train): 1
cat("Random Forest - Log Loss (train): ", rf_train_LogLoss, "\n")
## Random Forest - Log Loss (train): 0.1482359
# 1. Predict classes and probabilities on validation data
val_rf_preds_class <- predict(rf_model, newdata = validation_data_scaled_label)
val_rf_preds_prob <- predict(rf_model, newdata = validation_data_scaled_label, type = "prob")
# 2. Calculate Macro F1 and Balanced Accuracy using caret
conf_mat_val_rf <- confusionMatrix(val_rf_preds_class, validation_data_scaled_label$Target)
precision_val_rf <- conf_mat_val_rf$byClass[,"Precision"]
recall_val_rf <- conf_mat_val_rf$byClass[,"Recall"]
f1_per_class_val_rf <- 2 * precision_val_rf * recall_val_rf / (precision_val_rf + recall_val_rf)
rf_val_MacroF1 <- mean(f1_per_class_val_rf, na.rm = TRUE)
rf_val_BA <- conf_mat_val_rf$byClass[,"Balanced Accuracy"][1] # averaged balanced accuracy
# 3. Calculate Log Loss
actual_matrix_val <- model.matrix(~ Target - 1, data = validation_data_scaled_label)
colnames(actual_matrix_val) <- gsub("Target", "", colnames(actual_matrix_val))
rf_val_LogLoss <- MLmetrics::MultiLogLoss(y_pred = as.matrix(val_rf_preds_prob), y_true = actual_matrix_val)
# 4. Print validation metrics
cat("Random Forest - Macro F1 (validation): ", rf_val_MacroF1, "\n")
## Random Forest - Macro F1 (validation): 0.6750711
cat("Random Forest - Balanced Accuracy (validation): ", rf_val_BA, "\n")
## Random Forest - Balanced Accuracy (validation): 0.8326674
cat("Random Forest - Log Loss (validation): ", rf_val_LogLoss, "\n")
## Random Forest - Log Loss (validation): 0.5620534
# Set training control with 5-fold CV
train_control <- trainControl(method = "cv", number = 5, classProbs = TRUE, summaryFunction = multiClassSummary)
# Define grid for tuning mtry (number of variables randomly sampled) and ntree (number of trees)
tune_grid <- expand.grid(
mtry = c(2, 4, 6, 8)
)
set.seed(123)
rf_tuned <- train(
Target ~ .,
data = train_data_scaled_label,
method = "rf",
trControl = train_control,
tuneGrid = tune_grid,
ntree = 500, # Fixed number of trees (you can tune this later)
metric = "F1" # Optimize Macro F1
)
## Warning in train.default(x, y, weights = w, ...): The metric "F1" was not in
## the result set. logLoss will be used instead.
# Predict on train data using tuned model
train_preds_class <- predict(rf_tuned, newdata = train_data_scaled_label)
train_preds_prob <- predict(rf_tuned, newdata = train_data_scaled_label, type = "prob")
# Calculate Macro F1 and Balanced Accuracy
conf_mat <- confusionMatrix(train_preds_class, train_data_scaled_label$Target)
precision <- conf_mat$byClass[,"Precision"]
recall <- conf_mat$byClass[,"Recall"]
f1_per_class <- 2 * precision * recall / (precision + recall)
rf_train_MacroF1 <- mean(f1_per_class, na.rm = TRUE)
rf_train_BA <- conf_mat$byClass[,"Balanced Accuracy"][1]
# Calculate Log Loss
actual_matrix <- model.matrix(~ Target - 1, data = train_data_scaled_label)
colnames(actual_matrix) <- gsub("Target", "", colnames(actual_matrix))
rf_train_LogLoss <- MultiLogLoss(y_pred = as.matrix(train_preds_prob), y_true = actual_matrix)
# Print tuned training results
cat("Tuned RF - Macro F1 (train): ", rf_train_MacroF1, "\n")
## Tuned RF - Macro F1 (train): 1
cat("Tuned RF - Balanced Accuracy (train): ", rf_train_BA, "\n")
## Tuned RF - Balanced Accuracy (train): 1
cat("Tuned RF - Log Loss (train): ", rf_train_LogLoss, "\n")
## Tuned RF - Log Loss (train): 0.1455365
# 1. Predict classes and probabilities on validation data
val_rf_preds_class <- predict(rf_tuned, newdata = validation_data_scaled_label)
val_rf_preds_prob <- predict(rf_tuned, newdata = validation_data_scaled_label, type = "prob")
# 2. Calculate Macro F1 and Balanced Accuracy using caret
conf_mat_val_rf <- confusionMatrix(val_rf_preds_class, validation_data_scaled_label$Target)
precision_val_rf <- conf_mat_val_rf$byClass[,"Precision"]
recall_val_rf <- conf_mat_val_rf$byClass[,"Recall"]
f1_per_class_val_rf <- 2 * precision_val_rf * recall_val_rf / (precision_val_rf + recall_val_rf)
rf_val_MacroF1 <- mean(f1_per_class_val_rf, na.rm = TRUE)
rf_val_BA <- conf_mat_val_rf$byClass[,"Balanced Accuracy"][1] # averaged balanced accuracy
# 3. Calculate Log Loss
actual_matrix_val <- model.matrix(~ Target - 1, data = validation_data_scaled_label)
colnames(actual_matrix_val) <- gsub("Target", "", colnames(actual_matrix_val))
rf_val_LogLoss <- MLmetrics::MultiLogLoss(y_pred = as.matrix(val_rf_preds_prob), y_true = actual_matrix_val)
# 4. Print validation metrics
cat("Tuned RF - Macro F1 (validation): ", rf_val_MacroF1, "\n")
## Tuned RF - Macro F1 (validation): 0.6864719
cat("Tuned RF - Balanced Accuracy (validation): ", rf_val_BA, "\n")
## Tuned RF - Balanced Accuracy (validation): 0.8361885
cat("Tuned RF - Log Loss (validation): ", rf_val_LogLoss, "\n")
## Tuned RF - Log Loss (validation): 0.5578373
set.seed(123)
# Train simpler RF model
rf_simple <- randomForest(
Target ~ .,
data = train_data_scaled_label,
mtry = 2,
ntree = 200,
nodesize = 50,
importance = TRUE
)
# Predict on training data
train_rf_preds_class <- predict(rf_simple, newdata = train_data_scaled_label)
train_rf_preds_prob <- predict(rf_simple, newdata = train_data_scaled_label, type = "prob")
# Confusion matrix for train data
conf_mat_rf <- confusionMatrix(train_rf_preds_class, train_data_scaled_label$Target)
# Macro F1
precision_rf <- conf_mat_rf$byClass[,"Precision"]
recall_rf <- conf_mat_rf$byClass[,"Recall"]
f1_per_class_rf <- 2 * precision_rf * recall_rf / (precision_rf + recall_rf)
rf_train_MacroF1 <- mean(f1_per_class_rf, na.rm = TRUE)
# Balanced Accuracy
rf_train_BA <- conf_mat_rf$byClass[,"Balanced Accuracy"][1]
# Log Loss
actual_matrix_train <- model.matrix(~ Target - 1, data = train_data_scaled_label)
colnames(actual_matrix_train) <- gsub("Target", "", colnames(actual_matrix_train))
rf_train_LogLoss <- MultiLogLoss(y_pred = as.matrix(train_rf_preds_prob), y_true = actual_matrix_train)
# Print training results
cat("Simple RF - Macro F1 (train): ", rf_train_MacroF1, "\n")
## Simple RF - Macro F1 (train): 0.6726683
cat("Simple RF - Balanced Accuracy (train): ", rf_train_BA, "\n")
## Simple RF - Balanced Accuracy (train): 0.8541672
cat("Simple RF - Log Loss (train): ", rf_train_LogLoss, "\n")
## Simple RF - Log Loss (train): 0.5564853
# Predict on validation data
val_rf_preds_class <- predict(rf_simple, newdata = validation_data_scaled_label)
val_rf_preds_prob <- predict(rf_simple, newdata = validation_data_scaled_label, type = "prob")
# Calculate confusion matrix
conf_mat_val_rf <- confusionMatrix(val_rf_preds_class, validation_data_scaled_label$Target)
# Calculate Macro F1
precision_val_rf <- conf_mat_val_rf$byClass[,"Precision"]
recall_val_rf <- conf_mat_val_rf$byClass[,"Recall"]
f1_per_class_val_rf <- 2 * precision_val_rf * recall_val_rf / (precision_val_rf + recall_val_rf)
rf_val_MacroF1 <- mean(f1_per_class_val_rf, na.rm = TRUE)
# Balanced Accuracy
rf_val_BA <- conf_mat_val_rf$byClass[,"Balanced Accuracy"][1]
# Log Loss
actual_matrix_val <- model.matrix(~ Target - 1, data = validation_data_scaled_label)
colnames(actual_matrix_val) <- gsub("Target", "", colnames(actual_matrix_val))
rf_val_LogLoss <- MLmetrics::MultiLogLoss(y_pred = as.matrix(val_rf_preds_prob), y_true = actual_matrix_val)
# Print validation metrics
cat("Simple RF - Macro F1 (validation): ", rf_val_MacroF1, "\n")
## Simple RF - Macro F1 (validation): 0.5735124
cat("Simple RF - Balanced Accuracy (validation): ", rf_val_BA, "\n")
## Simple RF - Balanced Accuracy (validation): 0.835588
cat("Simple RF - Log Loss (validation): ", rf_val_LogLoss, "\n")
## Simple RF - Log Loss (validation): 0.7469131
# Prepare full scaled label data for XGBoost
train_xgb <- train_data_scaled_label
# Convert Target to numeric starting at 0 (required by xgboost)
train_xgb$Target_numeric <- as.numeric(train_xgb$Target) - 1
# Prepare matrix for features and label
train_matrix <- xgb.DMatrix(
data = as.matrix(train_xgb[, !(names(train_xgb) %in% c("Target", "Target_numeric"))]),
label = train_xgb$Target_numeric
)
# Set arbitrary parameters for multiclass classification
params <- list(
objective = "multi:softprob",
num_class = length(levels(train_xgb$Target)),
eval_metric = "mlogloss",
eta = 0.1,
max_depth = 6,
min_child_weight = 1,
subsample = 0.8,
colsample_bytree = 0.8,
seed = 123
)
# Train the XGBoost model
set.seed(123)
xgb_model <- xgb.train(
params = params,
data = train_matrix,
nrounds = 100,
verbose = 0
)
## Warning in xgb.train(params = params, data = train_matrix, nrounds = 100, :
## xgb.train: `seed` is ignored in R package. Use `set.seed()` instead.
# Predict probabilities on train data
train_preds_prob <- predict(xgb_model, as.matrix(train_xgb[, !(names(train_xgb) %in% c("Target", "Target_numeric"))]))
train_preds_prob <- matrix(train_preds_prob, ncol = params$num_class, byrow = TRUE)
# Get predicted classes
train_preds_class <- factor(max.col(train_preds_prob) - 1, levels = 0:(params$num_class - 1))
levels(train_preds_class) <- levels(train_xgb$Target)
# Calculate confusion matrix
conf_mat <- confusionMatrix(train_preds_class, train_xgb$Target)
# Calculate Macro F1
precision <- conf_mat$byClass[,"Precision"]
recall <- conf_mat$byClass[,"Recall"]
f1_per_class <- 2 * precision * recall / (precision + recall)
xgb_train_MacroF1 <- mean(f1_per_class, na.rm = TRUE)
# Calculate Balanced Accuracy
xgb_train_BA <- conf_mat$byClass[,"Balanced Accuracy"][1]
# Prepare actual matrix for Log Loss
actual_matrix <- model.matrix(~ Target - 1, data = train_xgb)
colnames(actual_matrix) <- gsub("Target", "", colnames(actual_matrix))
# Calculate Log Loss
xgb_train_LogLoss <- MultiLogLoss(y_pred = train_preds_prob, y_true = actual_matrix)
# Print training metrics
cat("XGBoost - Macro F1 (train): ", xgb_train_MacroF1, "\n")
## XGBoost - Macro F1 (train): 0.9616612
cat("XGBoost - Balanced Accuracy (train): ", xgb_train_BA, "\n")
## XGBoost - Balanced Accuracy (train): 0.9722051
cat("XGBoost - Log Loss (train): ", xgb_train_LogLoss, "\n")
## XGBoost - Log Loss (train): 0.1978881
# Prepare validation data matrix
val_xgb <- validation_data_scaled_label
val_matrix <- as.matrix(val_xgb[, !(names(val_xgb) %in% c("Target", "Target_numeric"))])
# Predict probabilities on validation data
val_preds_prob <- predict(xgb_model, val_matrix)
# Reshape predictions: samples x classes
val_preds_prob <- matrix(val_preds_prob, ncol = params$num_class, byrow = TRUE)
# Get predicted classes (0-based)
val_preds_class <- factor(max.col(val_preds_prob) - 1, levels = 0:(params$num_class - 1))
levels(val_preds_class) <- levels(val_xgb$Target)
# Confusion matrix for validation
conf_mat_val <- confusionMatrix(val_preds_class, val_xgb$Target)
# Macro F1
precision_val <- conf_mat_val$byClass[,"Precision"]
recall_val <- conf_mat_val$byClass[,"Recall"]
f1_per_class_val <- 2 * precision_val * recall_val / (precision_val + recall_val)
xgb_val_MacroF1 <- mean(f1_per_class_val, na.rm = TRUE)
# Balanced Accuracy
xgb_val_BA <- conf_mat_val$byClass[,"Balanced Accuracy"][1]
# Actual matrix for log loss
actual_matrix_val <- model.matrix(~ Target - 1, data = val_xgb)
colnames(actual_matrix_val) <- gsub("Target", "", colnames(actual_matrix_val))
# Log Loss calculation
xgb_val_LogLoss <- MLmetrics::MultiLogLoss(y_pred = val_preds_prob, y_true = actual_matrix_val)
# Print validation metrics
cat("XGBoost - Macro F1 (validation): ", xgb_val_MacroF1, "\n")
## XGBoost - Macro F1 (validation): 0.6925451
cat("XGBoost - Balanced Accuracy (validation): ", xgb_val_BA, "\n")
## XGBoost - Balanced Accuracy (validation): 0.8384324
cat("XGBoost - Log Loss (validation): ", xgb_val_LogLoss, "\n")
## XGBoost - Log Loss (validation): 0.5443689
# Prepare training control with 5-fold CV and multiclass summary
train_control <- trainControl(
method = "cv",
number = 5,
classProbs = TRUE,
summaryFunction = multiClassSummary,
verboseIter = TRUE
)
# Define tuning grid (you can expand or reduce as needed)
tune_grid <- expand.grid(
nrounds = c(100, 200),
max_depth = c(4, 6, 8),
eta = c(0.01, 0.05, 0.1),
gamma = c(0, 1),
colsample_bytree = c(0.6, 0.8),
min_child_weight = c(1, 5),
subsample = c(0.7, 0.9)
)
# Prepare caret data frame (exclude numeric target)
train_caret <- train_data_scaled_label
train_caret$Target_numeric <- NULL
set.seed(123)
xgb_grid_search <- train(
Target ~ .,
data = train_caret,
method = "xgbTree",
trControl = train_control,
tuneGrid = tune_grid,
metric = "F1"
)
## Warning in train.default(x, y, weights = w, ...): The metric "F1" was not in
## the result set. logLoss will be used instead.
## + Fold1: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:15:42] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:15:42] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold1: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:15:44] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:15:44] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold1: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:15:46] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:15:46] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold1: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:15:47] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:15:47] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold1: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:15:49] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:15:49] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold1: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:15:51] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:15:51] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold1: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:15:53] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:15:53] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold1: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:15:55] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:15:55] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold1: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:15:57] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:15:57] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold1: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:15:59] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:15:59] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold1: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:16:00] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:16:00] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold1: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:16:02] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:16:02] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold1: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:16:04] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:16:04] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold1: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:16:06] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:16:06] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold1: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:16:08] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:16:08] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold1: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:16:10] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:16:10] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold1: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:16:13] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:16:13] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold1: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:16:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:16:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold1: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:16:19] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:16:19] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold1: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:16:22] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:16:22] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold1: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:16:26] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:16:26] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold1: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:16:30] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:16:30] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold1: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:16:33] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:16:33] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold1: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:16:36] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:16:36] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold1: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:16:39] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:16:39] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold1: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:16:43] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:16:43] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold1: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:16:46] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:16:46] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold1: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:16:49] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:16:49] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold1: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:16:52] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:16:52] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold1: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:16:56] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:16:56] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold1: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:16:59] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:16:59] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold1: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:17:02] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:17:02] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold1: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:17:07] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:17:07] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold1: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:17:13] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:17:13] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold1: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:17:17] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:17:17] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold1: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:17:21] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:17:21] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold1: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:17:26] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:17:26] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold1: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:17:32] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:17:32] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold1: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:17:36] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:17:36] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold1: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:17:41] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:17:41] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold1: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:17:46] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:17:46] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold1: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:17:51] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:17:51] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold1: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:17:55] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:17:55] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold1: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:18:00] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:18:00] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold1: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:18:05] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:18:05] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold1: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:18:11] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:18:11] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold1: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:18:15] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:18:15] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold1: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:18:20] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:18:20] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold1: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:18:22] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:18:22] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold1: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:18:23] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:18:23] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold1: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:18:25] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:18:25] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold1: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:18:27] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:18:27] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold1: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:18:29] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:18:29] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold1: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:18:31] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:18:31] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold1: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:18:32] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:18:32] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold1: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:18:34] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:18:34] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold1: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:18:36] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:18:36] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold1: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:18:38] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:18:38] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold1: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:18:40] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:18:40] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold1: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:18:41] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:18:41] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold1: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:18:43] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:18:43] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold1: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:18:45] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:18:45] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold1: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:18:47] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:18:47] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold1: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:18:49] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:18:49] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold1: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:18:52] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:18:52] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold1: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:18:55] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:18:55] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold1: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:18:58] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:18:58] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold1: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:19:00] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:19:00] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold1: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:19:04] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:19:04] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold1: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:19:07] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:19:07] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold1: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:19:10] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:19:10] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold1: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:19:13] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:19:13] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold1: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:19:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:19:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold1: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:19:19] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:19:19] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold1: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:19:22] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:19:22] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold1: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:19:25] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:19:25] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold1: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:19:28] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:19:28] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold1: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:19:31] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:19:31] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold1: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:19:34] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:19:34] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold1: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:19:37] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:19:37] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold1: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:19:42] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:19:42] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold1: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:19:46] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:19:46] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold1: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:19:50] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:19:50] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold1: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:19:54] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:19:54] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold1: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:19:59] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:19:59] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold1: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:20:03] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:20:04] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold1: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:20:07] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:20:07] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold1: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:20:12] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:20:12] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold1: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:20:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:20:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold1: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:20:21] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:20:21] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold1: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:20:25] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:20:25] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold1: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:20:28] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:20:28] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold1: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:20:33] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:20:33] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold1: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:20:38] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:20:38] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold1: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:20:42] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:20:42] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold1: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:20:47] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:20:47] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold1: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:20:48] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:20:48] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold1: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:20:50] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:20:50] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold1: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:20:52] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:20:52] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold1: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:20:54] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:20:54] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold1: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:20:55] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:20:55] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold1: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:20:57] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:20:57] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold1: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:20:59] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:20:59] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold1: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:21:01] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:21:01] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold1: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:21:03] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:21:03] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold1: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:21:05] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:21:05] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold1: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:21:06] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:21:06] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold1: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:21:08] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:21:08] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold1: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:21:10] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:21:10] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold1: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:21:12] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:21:12] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold1: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:21:14] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:21:14] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold1: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:21:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:21:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold1: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:21:19] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:21:19] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold1: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:21:22] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:21:22] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold1: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:21:24] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:21:24] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold1: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:21:27] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:21:27] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold1: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:21:30] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:21:30] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold1: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:21:34] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:21:34] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold1: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:21:37] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:21:37] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold1: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:21:39] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:21:40] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold1: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:21:43] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:21:43] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold1: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:21:46] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:21:46] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold1: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:21:48] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:21:48] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold1: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:21:51] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:21:51] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold1: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:21:54] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:21:54] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold1: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:21:58] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:21:58] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold1: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:22:01] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:22:01] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold1: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:22:04] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:22:04] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold1: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:22:08] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:22:08] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold1: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:22:12] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:22:12] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold1: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:22:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:22:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold1: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:22:20] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:22:20] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold1: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:22:24] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:22:24] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold1: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:22:29] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:22:29] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold1: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:22:33] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:22:33] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold1: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:22:37] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:22:37] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold1: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:22:41] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:22:41] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold1: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:22:46] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:22:46] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold1: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:22:49] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:22:49] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold1: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:22:53] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:22:53] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold1: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:22:58] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:22:58] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold1: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:23:03] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:23:03] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold1: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:23:07] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:23:07] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold1: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:23:11] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:23:11] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold2: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:23:12] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:23:12] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold2: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:23:14] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:23:14] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold2: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:23:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:23:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold2: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:23:18] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:23:18] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold2: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:23:20] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:23:20] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold2: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:23:22] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:23:22] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold2: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:23:24] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:23:24] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold2: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:23:26] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:23:26] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold2: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:23:28] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:23:28] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold2: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:23:30] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:23:30] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold2: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:23:32] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:23:32] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold2: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:23:34] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:23:34] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold2: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:23:36] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:23:36] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold2: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:23:38] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:23:38] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold2: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:23:40] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:23:40] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold2: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:23:42] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:23:42] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold2: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:23:45] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:23:46] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold2: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:23:49] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:23:49] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold2: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:23:52] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:23:52] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold2: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:23:55] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:23:55] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold2: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:23:59] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:23:59] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold2: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:24:03] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:24:03] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold2: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:24:06] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:24:06] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold2: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:24:10] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:24:10] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold2: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:24:13] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:24:13] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold2: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:24:17] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:24:17] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold2: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:24:20] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:24:20] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold2: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:24:23] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:24:23] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold2: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:24:27] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:24:27] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold2: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:24:31] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:24:31] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold2: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:24:34] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:24:34] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold2: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:24:38] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:24:38] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold2: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:24:43] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:24:43] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold2: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:24:49] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:24:49] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold2: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:24:53] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:24:53] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold2: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:24:58] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:24:58] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold2: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:25:03] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:25:03] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold2: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:25:09] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:25:09] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold2: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:25:14] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:25:14] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold2: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:25:19] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:25:19] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold2: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:25:24] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:25:24] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold2: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:25:30] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:25:30] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold2: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:25:34] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:25:34] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold2: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:25:39] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:25:39] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold2: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:25:44] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:25:44] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold2: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:25:50] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:25:50] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold2: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:25:55] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:25:55] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold2: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:26:00] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:26:00] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold2: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:26:02] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:26:02] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold2: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:26:04] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:26:04] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold2: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:26:06] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:26:06] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold2: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:26:07] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:26:07] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold2: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:26:09] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:26:09] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold2: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:26:11] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:26:11] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold2: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:26:13] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:26:13] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold2: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:26:15] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:26:15] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold2: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:26:17] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:26:17] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold2: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:26:19] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:26:19] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold2: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:26:21] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:26:21] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold2: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:26:23] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:26:23] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold2: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:26:25] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:26:25] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold2: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:26:27] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:26:27] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold2: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:26:29] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:26:29] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold2: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:26:31] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:26:31] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold2: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:26:34] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:26:34] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold2: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:26:37] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:26:37] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold2: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:26:40] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:26:40] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold2: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:26:43] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:26:43] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold2: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:26:46] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:26:46] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold2: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:26:50] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:26:50] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold2: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:26:53] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:26:53] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold2: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:26:56] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:26:56] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold2: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:26:59] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:26:59] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold2: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:27:02] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:27:02] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold2: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:27:05] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:27:05] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold2: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:27:08] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:27:08] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold2: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:27:12] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:27:12] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold2: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:27:15] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:27:15] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold2: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:27:18] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:27:18] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold2: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:27:21] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:27:21] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold2: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:27:26] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:27:26] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold2: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:27:31] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:27:31] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold2: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:27:35] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:27:35] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold2: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:27:39] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:27:39] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold2: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:27:44] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:27:44] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold2: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:27:49] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:27:49] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold2: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:27:54] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:27:54] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold2: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:27:58] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:27:58] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold2: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:28:03] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:28:03] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold2: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:28:08] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:28:08] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold2: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:28:12] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:28:12] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold2: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:28:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:28:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold2: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:28:21] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:28:21] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold2: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:28:26] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:28:26] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold2: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:28:30] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:28:30] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold2: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:28:34] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:28:35] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold2: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:28:36] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:28:36] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold2: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:28:38] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:28:38] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold2: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:28:40] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:28:40] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold2: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:28:42] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:28:42] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold2: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:28:44] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:28:44] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold2: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:28:46] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:28:46] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold2: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:28:48] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:28:48] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold2: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:28:50] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:28:50] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold2: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:28:52] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:28:52] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold2: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:28:54] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:28:54] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold2: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:28:55] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:28:55] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold2: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:28:57] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:28:57] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold2: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:28:59] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:28:59] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold2: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:29:01] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:29:01] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold2: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:29:03] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:29:03] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold2: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:29:05] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:29:05] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold2: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:29:08] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:29:08] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold2: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:29:11] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:29:11] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold2: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:29:14] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:29:14] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold2: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:29:17] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:29:17] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold2: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:29:20] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:29:20] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold2: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:29:24] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:29:24] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold2: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:29:27] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:29:27] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold2: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:29:30] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:29:30] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold2: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:29:33] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:29:33] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold2: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:29:36] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:29:36] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold2: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:29:39] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:29:39] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold2: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:29:42] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:29:42] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold2: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:29:45] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:29:45] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold2: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:29:48] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:29:48] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold2: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:29:51] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:29:51] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold2: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:29:54] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:29:54] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold2: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:29:59] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:29:59] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold2: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:30:03] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:30:03] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold2: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:30:07] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:30:07] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold2: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:30:10] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:30:10] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold2: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:30:15] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:30:15] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold2: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:30:20] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:30:20] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold2: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:30:24] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:30:24] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold2: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:30:28] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:30:28] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold2: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:30:32] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:30:32] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold2: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:30:37] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:30:37] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold2: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:30:41] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:30:41] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold2: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:30:44] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:30:44] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold2: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:30:49] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:30:49] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold2: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:30:54] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:30:54] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold2: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:30:58] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:30:58] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold2: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:31:02] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:31:02] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold3: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:31:04] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:31:04] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold3: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:31:06] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:31:06] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold3: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:31:08] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:31:08] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold3: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:31:10] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:31:10] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold3: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:31:12] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:31:12] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold3: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:31:14] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:31:14] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold3: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:31:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:31:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold3: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:31:18] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:31:18] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold3: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:31:20] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:31:20] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold3: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:31:22] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:31:22] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold3: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:31:24] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:31:24] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold3: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:31:26] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:31:26] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold3: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:31:28] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:31:28] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold3: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:31:30] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:31:30] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold3: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:31:32] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:31:32] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold3: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:31:34] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:31:34] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold3: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:31:38] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:31:38] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold3: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:31:41] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:31:41] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold3: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:31:44] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:31:44] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold3: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:31:48] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:31:48] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold3: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:31:51] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:31:51] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold3: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:31:55] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:31:55] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold3: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:31:58] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:31:58] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold3: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:32:02] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:32:02] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold3: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:32:05] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:32:05] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold3: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:32:09] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:32:09] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold3: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:32:12] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:32:12] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold3: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:32:15] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:32:15] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold3: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:32:19] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:32:19] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold3: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:32:23] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:32:23] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold3: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:32:26] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:32:26] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold3: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:32:30] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:32:30] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold3: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:32:35] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:32:35] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold3: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:32:41] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:32:41] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold3: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:32:45] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:32:45] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold3: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:32:50] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:32:50] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold3: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:32:55] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:32:55] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold3: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:33:01] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:33:01] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold3: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:33:06] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:33:06] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold3: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:33:11] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:33:11] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold3: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:33:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:33:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold3: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:33:21] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:33:21] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold3: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:33:26] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:33:26] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold3: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:33:30] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:33:30] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold3: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:33:36] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:33:36] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold3: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:33:42] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:33:42] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold3: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:33:47] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:33:47] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold3: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:33:52] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:33:52] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold3: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:33:54] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:33:54] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold3: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:33:55] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:33:55] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold3: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:33:57] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:33:57] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold3: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:33:59] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:33:59] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold3: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:34:01] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:34:01] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold3: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:34:03] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:34:03] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold3: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:34:05] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:34:05] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold3: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:34:07] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:34:07] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold3: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:34:09] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:34:09] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold3: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:34:11] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:34:11] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold3: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:34:13] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:34:13] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold3: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:34:14] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:34:14] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold3: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:34:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:34:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold3: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:34:18] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:34:18] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold3: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:34:20] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:34:20] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold3: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:34:22] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:34:22] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold3: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:34:26] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:34:26] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold3: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:34:29] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:34:29] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold3: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:34:32] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:34:32] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold3: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:34:34] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:34:34] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold3: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:34:38] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:34:38] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold3: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:34:41] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:34:41] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold3: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:34:45] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:34:45] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold3: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:34:48] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:34:48] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold3: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:34:51] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:34:51] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold3: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:34:54] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:34:54] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold3: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:34:57] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:34:57] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold3: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:35:00] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:35:00] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold3: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:35:03] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:35:03] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold3: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:35:07] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:35:07] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold3: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:35:10] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:35:10] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold3: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:35:13] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:35:13] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold3: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:35:18] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:35:18] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold3: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:35:22] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:35:22] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold3: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:35:26] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:35:26] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold3: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:35:30] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:35:30] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold3: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:35:35] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:35:35] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold3: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:35:40] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:35:40] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold3: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:35:45] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:35:45] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold3: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:35:49] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:35:49] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold3: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:35:54] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:35:54] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold3: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:35:58] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:35:58] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold3: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:36:02] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:36:02] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold3: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:36:06] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:36:06] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold3: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:36:11] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:36:11] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold3: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:36:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:36:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold3: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:36:21] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:36:21] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold3: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:36:25] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:36:25] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold3: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:36:27] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:36:27] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold3: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:36:29] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:36:29] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold3: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:36:30] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:36:30] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold3: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:36:32] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:36:32] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold3: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:36:34] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:36:34] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold3: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:36:36] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:36:36] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold3: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:36:38] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:36:38] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold3: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:36:40] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:36:40] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold3: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:36:42] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:36:42] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold3: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:36:44] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:36:44] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold3: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:36:46] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:36:46] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold3: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:36:47] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:36:47] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold3: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:36:49] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:36:49] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold3: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:36:51] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:36:51] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold3: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:36:53] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:36:53] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold3: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:36:55] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:36:55] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold3: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:36:58] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:36:58] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold3: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:37:02] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:37:02] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold3: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:37:05] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:37:05] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold3: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:37:09] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:37:09] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold3: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:37:12] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:37:12] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold3: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:37:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:37:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold3: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:37:19] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:37:19] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold3: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:37:22] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:37:22] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold3: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:37:25] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:37:25] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold3: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:37:28] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:37:28] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold3: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:37:31] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:37:31] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold3: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:37:33] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:37:33] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold3: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:37:37] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:37:37] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold3: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:37:40] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:37:40] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold3: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:37:43] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:37:43] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold3: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:37:46] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:37:46] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold3: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:37:50] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:37:50] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold3: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:37:55] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:37:55] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold3: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:37:58] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:37:58] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold3: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:38:02] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:38:02] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold3: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:38:07] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:38:07] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold3: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:38:12] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:38:12] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold3: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:38:15] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:38:15] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold3: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:38:19] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:38:19] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold3: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:38:24] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:38:24] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold3: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:38:29] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:38:29] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold3: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:38:32] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:38:32] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold3: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:38:36] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:38:36] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold3: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:38:41] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:38:41] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold3: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:38:46] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:38:46] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold3: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:38:54] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:38:54] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold3: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:39:06] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:39:06] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold4: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:39:10] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:39:10] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold4: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:39:12] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:39:12] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold4: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:39:14] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:39:14] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold4: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:39:15] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:39:15] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold4: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:39:17] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:39:17] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold4: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:39:18] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:39:18] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold4: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:39:20] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:39:20] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold4: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:39:21] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:39:21] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold4: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:39:23] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:39:23] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold4: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:39:26] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:39:26] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold4: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:39:28] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:39:28] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold4: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:39:29] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:39:29] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold4: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:39:31] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:39:31] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold4: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:39:33] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:39:33] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold4: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:39:35] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:39:35] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold4: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:39:37] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:39:37] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold4: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:39:40] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:39:40] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold4: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:39:43] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:39:43] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold4: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:39:46] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:39:46] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold4: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:39:49] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:39:49] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold4: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:39:53] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:39:53] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold4: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:39:56] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:39:56] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold4: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:40:00] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:40:00] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold4: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:40:03] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:40:03] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold4: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:40:06] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:40:06] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold4: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:40:09] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:40:09] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold4: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:40:12] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:40:12] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold4: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:40:15] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:40:15] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold4: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:40:19] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:40:19] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold4: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:40:22] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:40:22] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold4: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:40:25] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:40:25] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold4: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:40:29] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:40:29] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold4: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:40:34] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:40:34] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold4: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:40:39] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:40:39] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold4: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:40:43] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:40:43] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold4: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:40:48] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:40:48] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold4: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:40:53] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:40:53] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold4: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:40:59] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:40:59] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold4: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:41:03] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:41:03] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold4: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:41:08] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:41:08] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold4: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:41:13] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:41:13] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold4: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:41:18] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:41:18] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold4: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:41:23] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:41:23] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold4: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:41:27] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:41:27] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold4: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:41:33] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:41:33] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold4: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:41:39] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:41:39] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold4: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:41:44] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:41:44] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold4: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:41:48] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:41:48] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold4: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:41:50] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:41:50] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold4: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:41:52] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:41:52] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold4: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:41:54] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:41:54] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold4: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:41:56] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:41:56] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold4: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:41:57] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:41:57] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold4: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:41:59] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:41:59] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold4: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:42:01] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:42:01] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold4: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:42:03] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:42:03] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold4: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:42:05] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:42:05] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold4: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:42:07] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:42:07] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold4: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:42:08] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:42:08] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold4: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:42:10] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:42:10] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold4: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:42:12] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:42:12] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold4: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:42:14] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:42:14] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold4: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:42:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:42:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold4: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:42:18] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:42:18] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold4: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:42:21] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:42:21] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold4: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:42:24] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:42:24] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold4: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:42:26] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:42:26] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold4: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:42:29] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:42:29] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold4: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:42:32] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:42:32] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold4: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:42:36] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:42:36] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold4: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:42:39] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:42:39] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold4: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:42:42] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:42:42] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold4: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:42:45] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:42:45] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold4: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:42:48] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:42:48] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold4: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:42:51] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:42:51] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold4: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:42:53] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:42:53] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold4: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:42:57] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:42:57] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold4: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:43:00] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:43:00] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold4: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:43:03] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:43:03] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold4: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:43:06] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:43:06] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold4: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:43:10] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:43:10] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold4: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:43:15] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:43:15] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold4: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:43:18] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:43:18] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold4: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:43:22] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:43:22] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold4: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:43:27] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:43:27] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold4: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:43:33] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:43:33] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold4: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:43:37] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:43:37] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold4: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:43:40] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:43:40] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold4: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:43:45] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:43:45] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold4: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:43:50] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:43:50] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold4: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:43:53] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:43:53] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold4: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:43:57] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:43:57] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold4: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:44:02] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:44:02] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold4: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:44:06] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:44:06] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold4: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:44:10] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:44:10] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold4: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:44:14] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:44:14] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold4: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:44:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:44:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold4: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:44:18] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:44:18] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold4: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:44:19] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:44:19] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold4: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:44:21] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:44:21] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold4: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:44:23] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:44:23] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold4: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:44:25] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:44:25] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold4: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:44:27] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:44:27] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold4: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:44:29] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:44:29] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold4: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:44:31] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:44:31] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold4: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:44:32] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:44:32] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold4: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:44:34] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:44:34] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold4: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:44:36] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:44:36] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold4: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:44:37] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:44:37] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold4: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:44:39] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:44:39] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold4: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:44:41] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:44:41] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold4: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:44:43] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:44:43] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold4: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:44:49] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:44:49] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold4: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:44:51] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:44:51] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold4: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:44:53] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:44:53] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold4: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:44:56] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:44:56] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold4: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:44:59] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:44:59] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold4: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:45:02] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:45:02] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold4: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:45:08] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:45:08] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold4: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:45:11] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:45:11] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold4: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:45:14] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:45:14] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold4: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:45:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:45:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold4: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:45:19] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:45:19] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold4: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:45:22] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:45:22] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold4: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:45:25] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:45:25] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold4: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:45:28] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:45:28] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold4: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:45:31] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:45:31] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold4: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:45:33] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:45:33] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold4: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:45:37] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:45:37] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold4: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:45:45] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:45:45] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold4: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:45:49] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:45:49] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold4: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:45:52] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:45:52] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold4: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:45:56] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:45:56] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold4: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:46:01] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:46:01] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold4: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:46:04] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:46:04] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold4: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:46:08] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:46:08] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold4: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:46:12] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:46:12] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold4: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:46:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:46:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold4: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:46:20] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:46:20] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold4: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:46:23] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:46:23] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold4: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:46:28] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:46:28] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold4: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:46:32] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:46:32] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold4: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:46:36] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:46:36] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold4: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:46:40] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:46:40] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold5: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:46:41] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:46:42] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold5: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:46:43] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:46:43] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold5: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:46:45] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:46:45] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold5: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:46:47] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:46:47] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold5: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:46:49] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:46:49] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold5: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:46:51] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:46:51] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold5: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:46:55] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:46:55] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold5: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:46:57] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:46:57] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold5: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:46:58] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:46:58] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold5: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:47:00] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:47:00] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold5: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:47:02] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:47:02] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold5: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:47:03] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:47:03] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold5: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:47:05] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:47:05] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold5: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:47:09] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:47:09] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold5: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:47:11] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:47:11] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold5: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:47:13] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:47:13] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold5: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:47:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:47:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold5: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:47:19] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:47:19] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold5: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:47:22] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:47:22] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold5: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:47:25] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:47:25] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold5: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:47:28] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:47:28] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold5: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:47:34] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:47:34] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold5: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:47:41] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:47:41] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold5: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:47:49] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:47:49] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold5: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:47:58] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:47:58] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold5: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:48:06] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:48:06] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold5: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:48:13] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:48:13] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold5: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:48:21] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:48:21] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold5: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:48:30] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:48:30] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold5: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:48:42] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:48:42] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold5: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:48:50] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:48:50] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold5: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:49:01] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:49:01] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold5: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:49:14] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:49:14] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold5: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:49:26] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:49:26] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold5: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:49:36] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:49:36] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold5: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:49:47] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:49:47] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold5: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:50:01] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:50:01] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold5: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:50:17] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:50:17] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold5: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:50:27] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:50:27] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold5: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:50:39] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:50:39] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold5: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:50:50] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:50:51] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold5: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:51:06] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:51:06] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold5: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:51:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:51:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold5: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:51:29] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:51:29] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold5: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:51:45] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:51:45] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold5: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:52:00] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:52:00] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold5: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:52:10] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:52:10] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold5: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:52:23] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:52:23] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold5: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:52:31] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:52:31] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold5: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:52:36] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:52:36] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold5: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:52:40] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:52:40] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold5: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:52:46] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:52:46] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold5: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:52:50] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:52:50] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold5: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:52:55] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:52:55] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold5: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:53:02] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:53:02] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold5: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:53:06] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:53:06] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold5: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:53:10] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:53:10] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold5: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:53:15] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:53:15] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold5: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:53:19] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:53:19] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold5: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:53:24] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:53:24] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold5: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:53:28] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:53:28] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold5: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:53:32] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:53:32] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold5: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:53:37] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:53:37] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold5: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:53:41] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:53:41] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold5: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:53:48] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:53:48] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold5: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:53:55] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:53:55] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold5: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:54:02] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:54:02] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold5: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:54:09] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:54:09] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold5: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:54:17] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:54:18] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold5: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:54:28] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:54:28] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold5: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:54:35] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:54:35] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold5: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:54:41] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:54:41] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold5: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:54:49] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:54:49] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold5: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:54:56] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:54:57] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold5: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:55:04] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:55:04] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold5: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:55:12] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:55:12] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold5: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:55:20] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:55:20] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold5: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:55:27] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:55:27] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold5: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:55:34] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:55:34] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold5: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:55:41] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:55:41] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold5: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:55:53] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:55:53] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold5: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:56:04] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:56:04] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold5: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:56:14] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:56:14] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold5: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:56:23] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:56:23] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold5: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:56:36] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:56:36] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold5: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:56:49] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:56:49] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold5: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:57:02] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:57:02] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold5: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:57:14] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:57:14] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold5: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:57:26] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:57:26] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold5: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:57:37] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:57:37] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold5: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:57:45] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:57:45] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold5: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:57:54] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:57:54] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold5: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:58:07] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:58:07] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold5: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:58:21] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:58:21] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold5: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:58:30] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:58:30] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold5: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:58:39] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:58:39] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold5: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:58:44] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:58:44] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold5: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:58:48] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:58:48] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold5: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:58:52] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:58:52] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold5: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:58:56] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:58:56] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold5: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:59:02] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:59:02] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold5: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:59:07] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:59:07] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold5: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:59:11] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:59:11] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold5: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:59:15] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:59:15] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold5: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [22:59:19] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:59:19] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold5: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [22:59:23] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:59:23] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold5: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [22:59:32] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:59:32] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold5: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [22:59:36] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:59:36] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold5: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [22:59:41] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:59:41] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold5: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [22:59:45] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:59:45] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold5: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [22:59:49] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:59:49] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold5: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [22:59:53] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [22:59:53] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold5: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [23:00:00] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [23:00:00] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold5: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [23:00:07] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [23:00:07] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold5: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [23:00:14] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [23:00:14] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold5: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [23:00:20] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [23:00:20] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold5: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [23:00:27] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [23:00:27] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold5: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [23:00:35] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [23:00:35] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold5: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [23:00:42] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [23:00:42] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold5: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [23:00:48] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [23:00:48] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=6, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold5: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [23:00:56] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [23:00:56] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold5: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [23:01:03] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [23:01:03] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold5: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [23:01:09] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [23:01:09] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold5: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [23:01:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [23:01:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold5: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [23:01:23] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [23:01:24] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold5: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [23:01:33] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [23:01:33] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold5: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [23:01:39] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [23:01:39] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold5: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [23:01:46] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [23:01:46] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=6, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold5: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [23:01:56] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [23:01:56] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold5: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [23:02:08] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [23:02:08] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold5: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [23:02:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [23:02:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold5: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [23:02:26] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [23:02:26] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold5: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [23:02:36] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [23:02:36] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold5: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [23:02:50] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [23:02:50] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold5: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [23:03:01] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [23:03:01] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold5: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [23:03:12] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [23:03:12] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=8, gamma=0, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold5: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## [23:03:23] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [23:03:23] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold5: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## [23:03:35] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [23:03:35] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold5: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## [23:03:47] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [23:03:47] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold5: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## [23:03:56] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [23:03:56] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.6, min_child_weight=5, subsample=0.9, nrounds=200
## + Fold5: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## [23:04:07] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [23:04:07] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.7, nrounds=200
## + Fold5: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## [23:04:19] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [23:04:19] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.9, nrounds=200
## + Fold5: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## [23:04:27] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [23:04:27] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.7, nrounds=200
## + Fold5: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## [23:04:37] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [23:04:37] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=8, gamma=1, colsample_bytree=0.8, min_child_weight=5, subsample=0.9, nrounds=200
## Aggregating results
## Selecting tuning parameters
## Fitting nrounds = 200, max_depth = 4, eta = 0.05, gamma = 1, colsample_bytree = 0.6, min_child_weight = 5, subsample = 0.9 on full training set
# Best tuned model
best_xgb <- xgb_grid_search$finalModel
# Predict on train data with best model
train_preds_class <- predict(xgb_grid_search, newdata = train_caret)
train_preds_prob <- predict(xgb_grid_search, newdata = train_caret, type = "prob")
# Calculate metrics
conf_mat <- confusionMatrix(train_preds_class, train_caret$Target)
precision <- conf_mat$byClass[,"Precision"]
recall <- conf_mat$byClass[,"Recall"]
f1_per_class <- 2 * precision * recall / (precision + recall)
xgb_train_MacroF1 <- mean(f1_per_class, na.rm = TRUE)
xgb_train_BA <- conf_mat$byClass[,"Balanced Accuracy"][1]
actual_matrix <- model.matrix(~ Target - 1, data = train_caret)
colnames(actual_matrix) <- gsub("Target", "", colnames(actual_matrix))
xgb_train_LogLoss <- MultiLogLoss(y_pred = as.matrix(train_preds_prob), y_true = actual_matrix)
# Print tuned training results
cat("Tuned XGBoost - Macro F1 (train): ", xgb_train_MacroF1, "\n")
## Tuned XGBoost - Macro F1 (train): 0.809265
cat("Tuned XGBoost - Balanced Accuracy (train): ", xgb_train_BA, "\n")
## Tuned XGBoost - Balanced Accuracy (train): 0.8902895
cat("Tuned XGBoost - Log Loss (train): ", xgb_train_LogLoss, "\n")
## Tuned XGBoost - Log Loss (train): 0.4134472
# Prepare validation data
val_caret <- validation_data_scaled_label
val_caret$Target_numeric <- NULL # Just to be safe
# Predict classes and probabilities on validation data using the tuned model
val_preds_class <- predict(xgb_grid_search, newdata = val_caret)
val_preds_prob <- predict(xgb_grid_search, newdata = val_caret, type = "prob")
# Calculate confusion matrix
conf_mat_val <- confusionMatrix(val_preds_class, val_caret$Target)
# Macro F1 calculation
precision_val <- conf_mat_val$byClass[,"Precision"]
recall_val <- conf_mat_val$byClass[,"Recall"]
f1_per_class_val <- 2 * precision_val * recall_val / (precision_val + recall_val)
xgb_val_MacroF1 <- mean(f1_per_class_val, na.rm = TRUE)
# Balanced Accuracy
xgb_val_BA <- conf_mat_val$byClass[,"Balanced Accuracy"][1]
# Prepare actual matrix for Log Loss
actual_matrix_val <- model.matrix(~ Target - 1, data = val_caret)
colnames(actual_matrix_val) <- gsub("Target", "", colnames(actual_matrix_val))
# Calculate Log Loss
xgb_val_LogLoss <- MLmetrics::MultiLogLoss(y_pred = as.matrix(val_preds_prob), y_true = actual_matrix_val)
# Print validation metrics
cat("Tuned XGBoost - Macro F1 (validation): ", xgb_val_MacroF1, "\n")
## Tuned XGBoost - Macro F1 (validation): 0.6949756
cat("Tuned XGBoost - Balanced Accuracy (validation): ", xgb_val_BA, "\n")
## Tuned XGBoost - Balanced Accuracy (validation): 0.8416635
cat("Tuned XGBoost - Log Loss (validation): ", xgb_val_LogLoss, "\n")
## Tuned XGBoost - Log Loss (validation): 0.5319555
# Prepare test data
test_caret <- test_data_linear_scaled_label
test_caret$Target_numeric <- NULL # Make sure target numeric is not present
# Predict classes and probabilities on test data using trained multinomial logistic regression
test_preds_class <- predict(model_multinom, newdata = test_caret, type = "class")
test_preds_prob <- predict(model_multinom, newdata = test_caret, type = "prob")
# Calculate confusion matrix
conf_mat_test <- confusionMatrix(test_preds_class, test_caret$Target)
# Macro F1 calculation
precision_test <- conf_mat_test$byClass[,"Precision"]
recall_test <- conf_mat_test$byClass[,"Recall"]
f1_per_class_test <- 2 * precision_test * recall_test / (precision_test + recall_test)
mlogistic_test_MacroF1 <- mean(f1_per_class_test, na.rm = TRUE)
# Balanced Accuracy
mlogistic_test_BA <- conf_mat_test$byClass[,"Balanced Accuracy"][1]
# Prepare actual matrix for Log Loss
actual_matrix_test <- model.matrix(~ Target - 1, data = test_caret)
colnames(actual_matrix_test) <- gsub("Target", "", colnames(actual_matrix_test))
# Calculate Log Loss
mlogistic_test_LogLoss <- MultiLogLoss(y_pred = as.matrix(test_preds_prob), y_true = actual_matrix_test)
# Print test metrics
cat("Multinomial Logistic - Macro F1 (test): ", mlogistic_test_MacroF1, "\n")
## Multinomial Logistic - Macro F1 (test): 0.6608702
cat("Multinomial Logistic - Balanced Accuracy (test): ", mlogistic_test_BA, "\n")
## Multinomial Logistic - Balanced Accuracy (test): 0.8507113
cat("Multinomial Logistic - Log Loss (test): ", mlogistic_test_LogLoss, "\n")
## Multinomial Logistic - Log Loss (test): 0.6367168
# Prepare test data
test_svm <- test_data_linear_scaled_label
test_svm$Target_numeric <- NULL # Ensure numeric target is not included
# Predict classes and probabilities on test data using tuned linear SVM
test_svm_preds_class <- predict(svm_linear_tuned, newdata = test_svm)
test_svm_preds_prob <- predict(svm_linear_tuned, newdata = test_svm, type = "prob")
# Calculate confusion matrix
conf_mat_test_svm <- confusionMatrix(test_svm_preds_class, test_svm$Target)
# Macro F1 calculation
precision_test_svm <- conf_mat_test_svm$byClass[,"Precision"]
recall_test_svm <- conf_mat_test_svm$byClass[,"Recall"]
f1_per_class_test_svm <- 2 * precision_test_svm * recall_test_svm / (precision_test_svm + recall_test_svm)
svm_test_MacroF1 <- mean(f1_per_class_test_svm, na.rm = TRUE)
# Balanced Accuracy
svm_test_BA <- conf_mat_test_svm$byClass[,"Balanced Accuracy"][1]
# Prepare actual matrix for Log Loss
actual_matrix_test_svm <- model.matrix(~ Target - 1, data = test_svm)
colnames(actual_matrix_test_svm) <- gsub("Target", "", colnames(actual_matrix_test_svm))
# Calculate Log Loss
svm_test_LogLoss <- MultiLogLoss(y_pred = test_svm_preds_prob, y_true = actual_matrix_test_svm)
# Print test metrics
cat("Tuned Linear SVM - Macro F1 (test): ", svm_test_MacroF1, "\n")
## Tuned Linear SVM - Macro F1 (test): 0.6531829
cat("Tuned Linear SVM - Balanced Accuracy (test): ", svm_test_BA, "\n")
## Tuned Linear SVM - Balanced Accuracy (test): 0.8438457
cat("Tuned Linear SVM - Log Loss (test): ", svm_test_LogLoss, "\n")
## Tuned Linear SVM - Log Loss (test): 0.6380774
# Prepare test data
test_svm_nl <- test_data_scaled_label
test_svm_nl$Target_numeric <- NULL # Just in case
# Predict class labels on test data
test_svm_nl_preds_class <- predict(svm_nonlinear_tuned, newdata = test_svm_nl)
# Predict class probabilities on test data
test_svm_nl_preds_prob <- predict(svm_nonlinear_tuned, newdata = test_svm_nl, type = "prob")
# Check if probabilities are NULL or missing
if (is.null(test_svm_nl_preds_prob)) {
stop("Predicted probabilities are NULL! Please check the model and data.")
}
# Calculate confusion matrix
conf_mat_test_svm_nl <- confusionMatrix(test_svm_nl_preds_class, test_svm_nl$Target)
# Calculate Macro F1
precision_test_svm_nl <- conf_mat_test_svm_nl$byClass[,"Precision"]
recall_test_svm_nl <- conf_mat_test_svm_nl$byClass[,"Recall"]
f1_per_class_test_svm_nl <- 2 * precision_test_svm_nl * recall_test_svm_nl / (precision_test_svm_nl + recall_test_svm_nl)
svm_nonlinear_test_MacroF1 <- mean(f1_per_class_test_svm_nl, na.rm = TRUE)
# Calculate Balanced Accuracy
svm_nonlinear_test_BA <- conf_mat_test_svm_nl$byClass[,"Balanced Accuracy"][1]
# Prepare actual matrix for Log Loss
actual_matrix_test_svm_nl <- model.matrix(~ Target - 1, data = test_svm_nl)
colnames(actual_matrix_test_svm_nl) <- gsub("Target", "", colnames(actual_matrix_test_svm_nl))
# Calculate Log Loss
svm_nonlinear_test_LogLoss <- MultiLogLoss(y_pred = as.matrix(test_svm_nl_preds_prob), y_true = actual_matrix_test_svm_nl)
# Print test metrics
cat("Tuned Nonlinear SVM - Macro F1 (test): ", svm_nonlinear_test_MacroF1, "\n")
## Tuned Nonlinear SVM - Macro F1 (test): 0.6994147
cat("Tuned Nonlinear SVM - Balanced Accuracy (test): ", svm_nonlinear_test_BA, "\n")
## Tuned Nonlinear SVM - Balanced Accuracy (test): 0.8627703
cat("Tuned Nonlinear SVM - Log Loss (test): ", svm_nonlinear_test_LogLoss, "\n")
## Tuned Nonlinear SVM - Log Loss (test): 0.554505
# Prepare test data
test_rf <- test_data_scaled_label
test_rf$Target_numeric <- NULL # Ensure this column is not present
# Predict classes and probabilities on test data using your best RF model
test_rf_preds_class <- predict(rf_simple, newdata = test_rf)
test_rf_preds_prob <- predict(rf_simple, newdata = test_rf, type = "prob")
# Calculate confusion matrix
conf_mat_test_rf <- confusionMatrix(test_rf_preds_class, test_rf$Target)
# Calculate Macro F1
precision_test_rf <- conf_mat_test_rf$byClass[,"Precision"]
recall_test_rf <- conf_mat_test_rf$byClass[,"Recall"]
f1_per_class_test_rf <- 2 * precision_test_rf * recall_test_rf / (precision_test_rf + recall_test_rf)
rf_test_MacroF1 <- mean(f1_per_class_test_rf, na.rm = TRUE)
# Balanced Accuracy
rf_test_BA <- conf_mat_test_rf$byClass[,"Balanced Accuracy"][1]
# Prepare actual matrix for Log Loss
actual_matrix_test_rf <- model.matrix(~ Target - 1, data = test_rf)
colnames(actual_matrix_test_rf) <- gsub("Target", "", colnames(actual_matrix_test_rf))
# Calculate Log Loss
rf_test_LogLoss <- MultiLogLoss(y_pred = as.matrix(test_rf_preds_prob), y_true = actual_matrix_test_rf)
# Print test metrics
cat("Simple RF - Macro F1 (test): ", rf_test_MacroF1, "\n")
## Simple RF - Macro F1 (test): 0.615132
cat("Simple RF - Balanced Accuracy (test): ", rf_test_BA, "\n")
## Simple RF - Balanced Accuracy (test): 0.8799402
cat("Simple RF - Log Loss (test): ", rf_test_LogLoss, "\n")
## Simple RF - Log Loss (test): 0.6847082
# Prepare test data
test_caret <- test_data_scaled_label
test_caret$Target_numeric <- NULL # Ensure this column is not present
# Predict classes and probabilities on test data using tuned XGBoost model
test_preds_class <- predict(xgb_grid_search, newdata = test_caret)
test_preds_prob <- predict(xgb_grid_search, newdata = test_caret, type = "prob")
# Calculate confusion matrix
conf_mat_test <- confusionMatrix(test_preds_class, test_caret$Target)
# Calculate Macro F1
precision_test <- conf_mat_test$byClass[,"Precision"]
recall_test <- conf_mat_test$byClass[,"Recall"]
f1_per_class_test <- 2 * precision_test * recall_test / (precision_test + recall_test)
xgb_test_MacroF1 <- mean(f1_per_class_test, na.rm = TRUE)
# Balanced Accuracy
xgb_test_BA <- conf_mat_test$byClass[,"Balanced Accuracy"][1]
# Prepare actual matrix for Log Loss
actual_matrix_test <- model.matrix(~ Target - 1, data = test_caret)
colnames(actual_matrix_test) <- gsub("Target", "", colnames(actual_matrix_test))
# Calculate Log Loss
xgb_test_LogLoss <- MultiLogLoss(y_pred = as.matrix(test_preds_prob), y_true = actual_matrix_test)
# Print test metrics
cat("Tuned XGBoost - Macro F1 (test): ", xgb_test_MacroF1, "\n")
## Tuned XGBoost - Macro F1 (test): 0.7143521
cat("Tuned XGBoost - Balanced Accuracy (test): ", xgb_test_BA, "\n")
## Tuned XGBoost - Balanced Accuracy (test): 0.8887371
cat("Tuned XGBoost - Log Loss (test): ", xgb_test_LogLoss, "\n")
## Tuned XGBoost - Log Loss (test): 0.5342682
# Create a summary data frame with your results
results_summary <- data.frame(
Model = rep(c("Logistic Regression", "Linear SVM", "Nonlinear SVM", "Random Forest", "XGBoost"), each = 3),
Dataset = rep(c("Train", "Validation", "Test"), times = 5),
Macro_F1 = c(
mlogistic_train_MacroF1, mlogistic_val_MacroF1, mlogistic_test_MacroF1,
svm_train_MacroF1, svm_val_MacroF1, svm_test_MacroF1,
svm_nonlinear_train_MacroF1, svm_nonlinear_val_MacroF1, svm_nonlinear_test_MacroF1,
rf_train_MacroF1, rf_val_MacroF1, rf_test_MacroF1,
xgb_train_MacroF1, xgb_val_MacroF1, xgb_test_MacroF1
),
Balanced_Accuracy = c(
mlogistic_train_BA, mlogistic_val_BA, mlogistic_test_BA,
svm_train_BA, svm_val_BA, svm_test_BA,
svm_nonlinear_train_BA, svm_nonlinear_val_BA, svm_nonlinear_test_BA,
rf_train_BA, rf_val_BA, rf_test_BA,
xgb_train_BA, xgb_val_BA, xgb_test_BA
),
Log_Loss = c(
mlogistic_train_LogLoss, mlogistic_val_LogLoss, mlogistic_test_LogLoss,
svm_train_LogLoss, svm_val_LogLoss, svm_test_LogLoss,
svm_nonlinear_train_LogLoss, svm_nonlinear_val_LogLoss, svm_nonlinear_test_LogLoss,
rf_train_LogLoss, rf_val_LogLoss, rf_test_LogLoss,
xgb_train_LogLoss, xgb_val_LogLoss, xgb_test_LogLoss
)
)
# Display the summary table
print(results_summary)
## Model Dataset Macro_F1 Balanced_Accuracy Log_Loss
## 1 Logistic Regression Train 0.6333057 0.8097083 0.6661807
## 2 Logistic Regression Validation 0.6213522 0.8089481 0.6649213
## 3 Logistic Regression Test 0.6608702 0.8507113 0.6367168
## 4 Linear SVM Train 0.6252840 0.8012413 0.6724668
## 5 Linear SVM Validation 0.6130692 0.8029311 0.6600792
## 6 Linear SVM Test 0.6531829 0.8438457 0.6380774
## 7 Nonlinear SVM Train 0.7748550 0.8829461 0.4553329
## 8 Nonlinear SVM Validation 0.6996576 0.8649961 0.5423017
## 9 Nonlinear SVM Test 0.6994147 0.8627703 0.5545050
## 10 Random Forest Train 0.6726683 0.8541672 0.5564853
## 11 Random Forest Validation 0.5735124 0.8355880 0.7469131
## 12 Random Forest Test 0.6151320 0.8799402 0.6847082
## 13 XGBoost Train 0.8092650 0.8902895 0.4134472
## 14 XGBoost Validation 0.6949756 0.8416635 0.5319555
## 15 XGBoost Test 0.7143521 0.8887371 0.5342682
library(ggplot2)
# Assuming you have your results_summary data frame from before
# Plot Balanced Accuracy
ggplot(results_summary, aes(x = Dataset, y = Balanced_Accuracy, group = Model, color = Model)) +
geom_line(size = 1.2) +
geom_point(size = 3) +
labs(
title = "Balanced Accuracy of 5 Models on Train, Validation, and Test Sets",
x = "Dataset",
y = "Balanced Accuracy"
) +
theme_minimal() +
theme(
plot.title = element_text(face = "bold", hjust = 0.5),
axis.title = element_text(face = "bold"),
legend.title = element_blank()
)
## Warning: Using `size` aesthetic for lines was deprecated in ggplot2 3.4.0.
## ℹ Please use `linewidth` instead.
## This warning is displayed once every 8 hours.
## Call `lifecycle::last_lifecycle_warnings()` to see where this warning was
## generated.
# Convert Dataset to factor with desired order
results_summary <- results_summary %>%
mutate(Dataset = factor(Dataset, levels = c("Train", "Validation", "Test")))
# Create formal line plot with y-axis breaks every 0.05
ggplot(results_summary, aes(x = Dataset, y = Balanced_Accuracy, group = Model, color = Model)) +
geom_line(size = 1.2) +
geom_point(size = 4, shape = 21, fill = "white") + # Larger points with white fill for clarity
scale_color_brewer(palette = "Set1") + # Professional color palette
scale_y_continuous(breaks = seq(0.7, 0.9, by = 0.05), limits = c(0.7, 0.9)) + # Adjust breaks and limits
labs(
title = "Balanced Accuracy of Five Models Across Datasets",
subtitle = "Train, Validation, and Test Performance Comparison",
x = "Dataset",
y = "Balanced Accuracy",
color = "Model"
) +
theme_minimal(base_size = 14) +
theme(
plot.title = element_text(face = "bold", size = 16, hjust = 0.5),
plot.subtitle = element_text(size = 12, hjust = 0.5, margin = ggplot2::margin(b = 15)),
axis.title = element_text(face = "bold", size = 14),
axis.text = element_text(size = 12),
legend.position = "right",
legend.title = element_text(face = "bold", size = 13),
legend.text = element_text(size = 11)
)
ggplot(results_summary, aes(x = Dataset, y = Macro_F1, group = Model, color = Model)) +
geom_line(size = 1.2) +
geom_point(size = 4, shape = 21, fill = "white") +
scale_color_brewer(palette = "Set1") +
scale_y_continuous(breaks = seq(0.5, 0.85, by = 0.05), limits = c(0.5, 0.85)) +
labs(
title = "Macro F1 Score of Five Models Across Datasets",
subtitle = "Train, Validation, and Test Performance Comparison",
x = "Dataset",
y = "Macro F1 Score",
color = "Model"
) +
theme_minimal(base_size = 14) +
theme(
plot.title = element_text(face = "bold", size = 16, hjust = 0.5),
plot.subtitle = element_text(size = 12, hjust = 0.5, margin = ggplot2::margin(b = 15)),
axis.title = element_text(face = "bold", size = 14),
axis.text = element_text(size = 12),
legend.position = "right",
legend.title = element_text(face = "bold", size = 13),
legend.text = element_text(size = 11)
)
““” 🥇 1 XGBoost Best Macro F1, Best Balanced Accuracy, Lowest Log Loss, acceptable overfitting 🥈 2 Nonlinear SVM Strong across all metrics, very close second 🥉 3 Linear SVM Decent performance, very stable (least overfit) 4 Random Forest Great Balanced Accuracy, but lowest Macro F1 5 Logistic Reg. Severe overfitting in Log Loss, not recommended
✅ Best Model: XGBoost Why XGBoost?
Highest Macro F1: 0.714
Highest Balanced Accuracy: 0.889
Lowest Log Loss: 0.534
Moderate overfitting, but still within acceptable bounds ““”
# Load required package
library(nnet)
# Show summary of the multinomial logistic regression model
summary(model_multinom)
## Call:
## multinom(formula = Target ~ ., data = train_data_linear_scaled_label)
##
## Coefficients:
## (Intercept) Marital.status Application.mode Application.order
## Enrolled -4.970986 0.1349341 0.004792362 -0.087231018
## Graduate -4.646281 0.0740570 -0.038629301 -0.004268598
## Course Daytime.evening.attendance. Previous.qualification
## Enrolled -0.05356977 -0.2057806 -0.02035063
## Graduate -0.11413040 -0.4776923 0.00240806
## Previous.qualification..grade. Nacionality Mother.s.qualification
## Enrolled -0.04615625 -0.1762480 -0.02669279
## Graduate 0.05195457 -0.1852153 -0.01496183
## Father.s.qualification Mother.s.occupation Father.s.occupation
## Enrolled 0.0007524527 0.06516743 0.021592398
## Graduate 0.0062540554 0.08119092 -0.004775616
## Admission.grade Displaced Educational.special.needs Debtor
## Enrolled 0.05409725 -0.2462297 -0.01231618 -0.07868301
## Graduate 0.13824526 -0.1970616 -0.17080582 -0.82425788
## Tuition.fees.up.to.date Gender Scholarship.holder
## Enrolled 2.158581 -0.1856010 0.2784741
## Graduate 2.938506 -0.6449061 1.1008171
## Age.at.enrollment International Curricular.units.1st.sem..evaluations.
## Enrolled -0.4328661 1.692527 0.003455634
## Graduate -0.3877913 2.290398 -0.543703485
## Curricular.units.1st.sem..grade.
## Enrolled 0.0859260
## Graduate 0.4839606
## Curricular.units.1st.sem..without.evaluations.
## Enrolled 0.0659562
## Graduate 0.1207751
## Curricular.units.2nd.sem..credited.
## Enrolled 0.02322858
## Graduate 0.41981655
## Curricular.units.2nd.sem..enrolled.
## Enrolled -0.63222748
## Graduate 0.02060578
## Curricular.units.2nd.sem..evaluations.
## Enrolled 0.3412665
## Graduate -0.5238160
## Curricular.units.2nd.sem..grade.
## Enrolled 0.9785803
## Graduate 1.7934192
## Curricular.units.2nd.sem..without.evaluations. Unemployment.rate
## Enrolled -0.04840042 -0.23687648
## Graduate -0.06725656 -0.02150649
## Inflation.rate GDP
## Enrolled -0.048423740 0.005129479
## Graduate 0.002158582 -0.030856700
##
## Std. Errors:
## (Intercept) Marital.status Application.mode Application.order
## Enrolled 1.578831 0.1158612 0.01478480 0.05401459
## Graduate 1.584823 0.1140869 0.01377629 0.04840572
## Course Daytime.evening.attendance. Previous.qualification
## Enrolled 0.01668229 0.2384172 0.01822625
## Graduate 0.01544589 0.2196586 0.01733365
## Previous.qualification..grade. Nacionality Mother.s.qualification
## Enrolled 0.07878344 0.1342293 0.009401995
## Graduate 0.07269507 0.1295438 0.008845458
## Father.s.qualification Mother.s.occupation Father.s.occupation
## Enrolled 0.007775230 0.02394872 0.02079515
## Graduate 0.007384023 0.02347498 0.02057611
## Admission.grade Displaced Educational.special.needs Debtor
## Enrolled 0.07930726 0.1438526 0.5413504 0.1999463
## Graduate 0.07421268 0.1363281 0.5274062 0.2156568
## Tuition.fees.up.to.date Gender Scholarship.holder Age.at.enrollment
## Enrolled 0.2374360 0.1337255 0.1796631 0.09247572
## Graduate 0.2765203 0.1276759 0.1594349 0.08379577
## International Curricular.units.1st.sem..evaluations.
## Enrolled 1.317618 0.1045628
## Graduate 1.325307 0.1068802
## Curricular.units.1st.sem..grade.
## Enrolled 0.1175637
## Graduate 0.1390868
## Curricular.units.1st.sem..without.evaluations.
## Enrolled 0.07620165
## Graduate 0.08449408
## Curricular.units.2nd.sem..credited.
## Enrolled 0.10920732
## Graduate 0.08501929
## Curricular.units.2nd.sem..enrolled.
## Enrolled 0.1142730
## Graduate 0.1001509
## Curricular.units.2nd.sem..evaluations.
## Enrolled 0.09940148
## Graduate 0.10359026
## Curricular.units.2nd.sem..grade.
## Enrolled 0.1156692
## Graduate 0.1458657
## Curricular.units.2nd.sem..without.evaluations. Unemployment.rate
## Enrolled 0.07373720 0.06936053
## Graduate 0.08398346 0.06564656
## Inflation.rate GDP
## Enrolled 0.06354519 0.07092573
## Graduate 0.05935080 0.06693778
##
## Residual Deviance: 4127.656
## AIC: 4259.656
# Get variable importance from the trained and tuned XGBoost model
xgb_importance <- varImp(xgb_grid_search)
# Convert to dataframe for plotting
xgb_importance_df <- xgb_importance$importance
xgb_importance_df$Variable <- rownames(xgb_importance_df)
# Sort by importance descending
xgb_importance_df <- xgb_importance_df[order(xgb_importance_df$Overall, decreasing = TRUE), ]
# Plot the top 20 features (you can change this number)
ggplot(xgb_importance_df[1:20, ], aes(x = reorder(Variable, Overall), y = Overall)) +
geom_col(fill = "steelblue") +
coord_flip() +
labs(title = "Top 20 Variable Importances - Tuned XGBoost (Test Model)",
x = "Variable",
y = "Importance (Overall Score)") +
theme_minimal() +
theme(text = element_text(size = 12),
plot.title = element_text(face = "bold"))