#loading libraries
library(ggplot2)
library(caret)
## Loading required package: lattice
library(corrplot)
## corrplot 0.95 loaded
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(stats)
library(car)
## Loading required package: carData
## 
## Attaching package: 'car'
## The following object is masked from 'package:dplyr':
## 
##     recode
library(pROC)
## Type 'citation("pROC")' for a citation.
## 
## Attaching package: 'pROC'
## The following objects are masked from 'package:stats':
## 
##     cov, smooth, var
library(rpart)
library(rattle)
## Loading required package: tibble
## Loading required package: bitops
## Rattle: A free graphical interface for data science with R.
## Version 5.5.1 Copyright (c) 2006-2021 Togaware Pty Ltd.
## Type 'rattle()' to shake, rattle, and roll your data.
library(randomForestSRC)
## 
##  randomForestSRC 3.3.3 
##  
##  Type rfsrc.news() to see new features, changes, and bug fixes. 
## 
library(gridExtra)
## 
## Attaching package: 'gridExtra'
## The following object is masked from 'package:dplyr':
## 
##     combine
library(xgboost)
## 
## Attaching package: 'xgboost'
## The following object is masked from 'package:rattle':
## 
##     xgboost
## The following object is masked from 'package:dplyr':
## 
##     slice
library(vip)
## 
## Attaching package: 'vip'
## The following object is masked from 'package:utils':
## 
##     vi
library(tidyverse)
## ── Attaching core tidyverse packages ──────────────────────── tidyverse 2.0.0 ──
## ✔ forcats   1.0.0     ✔ readr     2.1.5
## ✔ lubridate 1.9.3     ✔ stringr   1.5.1
## ✔ purrr     1.0.4     ✔ tidyr     1.3.1
## ── Conflicts ────────────────────────────────────────── tidyverse_conflicts() ──
## ✖ gridExtra::combine() masks dplyr::combine()
## ✖ dplyr::filter()      masks stats::filter()
## ✖ dplyr::lag()         masks stats::lag()
## ✖ purrr::lift()        masks caret::lift()
## ✖ purrr::partial()     masks randomForestSRC::partial()
## ✖ car::recode()        masks dplyr::recode()
## ✖ xgboost::slice()     masks dplyr::slice()
## ✖ purrr::some()        masks car::some()
## ℹ Use the conflicted package (<http://conflicted.r-lib.org/>) to force all conflicts to become errors

TelCo Customer Churn

#load dataset
df <- read.csv('/Users/ponce/Desktop/DA-6813/DA6813 Project/TelCo_Dataset.csv')

Exploratory Analysis

str(df)
## 'data.frame':    7043 obs. of  21 variables:
##  $ customerID      : chr  "7590-VHVEG" "5575-GNVDE" "3668-QPYBK" "7795-CFOCW" ...
##  $ gender          : chr  "Female" "Male" "Male" "Male" ...
##  $ SeniorCitizen   : int  0 0 0 0 0 0 0 0 0 0 ...
##  $ Partner         : chr  "Yes" "No" "No" "No" ...
##  $ Dependents      : chr  "No" "No" "No" "No" ...
##  $ tenure          : int  1 34 2 45 2 8 22 10 28 62 ...
##  $ PhoneService    : chr  "No" "Yes" "Yes" "No" ...
##  $ MultipleLines   : chr  "No phone service" "No" "No" "No phone service" ...
##  $ InternetService : chr  "DSL" "DSL" "DSL" "DSL" ...
##  $ OnlineSecurity  : chr  "No" "Yes" "Yes" "Yes" ...
##  $ OnlineBackup    : chr  "Yes" "No" "Yes" "No" ...
##  $ DeviceProtection: chr  "No" "Yes" "No" "Yes" ...
##  $ TechSupport     : chr  "No" "No" "No" "Yes" ...
##  $ StreamingTV     : chr  "No" "No" "No" "No" ...
##  $ StreamingMovies : chr  "No" "No" "No" "No" ...
##  $ Contract        : chr  "Month-to-month" "One year" "Month-to-month" "One year" ...
##  $ PaperlessBilling: chr  "Yes" "No" "Yes" "No" ...
##  $ PaymentMethod   : chr  "Electronic check" "Mailed check" "Mailed check" "Bank transfer (automatic)" ...
##  $ MonthlyCharges  : num  29.9 57 53.9 42.3 70.7 ...
##  $ TotalCharges    : num  29.9 1889.5 108.2 1840.8 151.7 ...
##  $ Churn           : chr  "No" "No" "Yes" "No" ...

Multiple categorical variables that aren’t specified as such.

Categorical variables

#convert character variables into categorical
df$SeniorCitizen <- as.factor(df$SeniorCitizen)
df$Churn <- as.factor(df$Churn)
df$gender <- as.factor(df$gender)
df$Partner <- as.factor(df$Partner)
df$Dependents <- as.factor(df$Dependents)
df$PhoneService <- as.factor(df$PhoneService)
df$MultipleLines <- as.factor(df$MultipleLines)
df$InternetService <- as.factor(df$InternetService)
df$OnlineSecurity <- as.factor(df$OnlineSecurity)
df$OnlineBackup <- as.factor(df$OnlineBackup)
df$DeviceProtection <- as.factor(df$DeviceProtection)
df$TechSupport <- as.factor(df$TechSupport)
df$StreamingTV <- as.factor(df$StreamingTV)
df$StreamingMovies <- as.factor(df$StreamingMovies)
df$Contract <- as.factor(df$Contract)
df$PaperlessBilling <- as.factor(df$PaperlessBilling)
df$PaymentMethod <- as.factor(df$PaymentMethod)

Missing values

colSums(is.na(df))
##       customerID           gender    SeniorCitizen          Partner 
##                0                0                0                0 
##       Dependents           tenure     PhoneService    MultipleLines 
##                0                0                0                0 
##  InternetService   OnlineSecurity     OnlineBackup DeviceProtection 
##                0                0                0                0 
##      TechSupport      StreamingTV  StreamingMovies         Contract 
##                0                0                0                0 
## PaperlessBilling    PaymentMethod   MonthlyCharges     TotalCharges 
##                0                0                0               11 
##            Churn 
##                0

TotalCharges has 11 observations with missing values. Must come from customers that are newly acquired and tenure is equal to 0.

In this case, it is safe to remove them when trying to predict Churn.

nrow(df)
## [1] 7043
df <- na.omit(df)
nrow(df)
## [1] 7032

We have successfully removed the 11 observations with missing values.

We will also remove customerID since it is not useful for this study.

df <- df|>
  select(-customerID)

Check structure of data again to ensure all variables are correct, and we have 7032 observations with now 20 variables.

str(df)
## 'data.frame':    7032 obs. of  20 variables:
##  $ gender          : Factor w/ 2 levels "Female","Male": 1 2 2 2 1 1 2 1 1 2 ...
##  $ SeniorCitizen   : Factor w/ 2 levels "0","1": 1 1 1 1 1 1 1 1 1 1 ...
##  $ Partner         : Factor w/ 2 levels "No","Yes": 2 1 1 1 1 1 1 1 2 1 ...
##  $ Dependents      : Factor w/ 2 levels "No","Yes": 1 1 1 1 1 1 2 1 1 2 ...
##  $ tenure          : int  1 34 2 45 2 8 22 10 28 62 ...
##  $ PhoneService    : Factor w/ 2 levels "No","Yes": 1 2 2 1 2 2 2 1 2 2 ...
##  $ MultipleLines   : Factor w/ 3 levels "No","No phone service",..: 2 1 1 2 1 3 3 2 3 1 ...
##  $ InternetService : Factor w/ 3 levels "DSL","Fiber optic",..: 1 1 1 1 2 2 2 1 2 1 ...
##  $ OnlineSecurity  : Factor w/ 3 levels "No","No internet service",..: 1 3 3 3 1 1 1 3 1 3 ...
##  $ OnlineBackup    : Factor w/ 3 levels "No","No internet service",..: 3 1 3 1 1 1 3 1 1 3 ...
##  $ DeviceProtection: Factor w/ 3 levels "No","No internet service",..: 1 3 1 3 1 3 1 1 3 1 ...
##  $ TechSupport     : Factor w/ 3 levels "No","No internet service",..: 1 1 1 3 1 1 1 1 3 1 ...
##  $ StreamingTV     : Factor w/ 3 levels "No","No internet service",..: 1 1 1 1 1 3 3 1 3 1 ...
##  $ StreamingMovies : Factor w/ 3 levels "No","No internet service",..: 1 1 1 1 1 3 1 1 3 1 ...
##  $ Contract        : Factor w/ 3 levels "Month-to-month",..: 1 2 1 2 1 1 1 1 1 2 ...
##  $ PaperlessBilling: Factor w/ 2 levels "No","Yes": 2 1 2 1 2 2 2 1 2 1 ...
##  $ PaymentMethod   : Factor w/ 4 levels "Bank transfer (automatic)",..: 3 4 4 1 3 3 2 4 3 1 ...
##  $ MonthlyCharges  : num  29.9 57 53.9 42.3 70.7 ...
##  $ TotalCharges    : num  29.9 1889.5 108.2 1840.8 151.7 ...
##  $ Churn           : Factor w/ 2 levels "No","Yes": 1 1 2 1 2 2 1 1 2 1 ...
##  - attr(*, "na.action")= 'omit' Named int [1:11] 489 754 937 1083 1341 3332 3827 4381 5219 6671 ...
##   ..- attr(*, "names")= chr [1:11] "489" "754" "937" "1083" ...

Summary

knitr::kable(summary(df))
gender SeniorCitizen Partner Dependents tenure PhoneService MultipleLines InternetService OnlineSecurity OnlineBackup DeviceProtection TechSupport StreamingTV StreamingMovies Contract PaperlessBilling PaymentMethod MonthlyCharges TotalCharges Churn
Female:3483 0:5890 No :3639 No :4933 Min. : 1.00 No : 680 No :3385 DSL :2416 No :3497 No :3087 No :3094 No :3472 No :2809 No :2781 Month-to-month:3875 No :2864 Bank transfer (automatic):1542 Min. : 18.25 Min. : 18.8 No :5163
Male :3549 1:1142 Yes:3393 Yes:2099 1st Qu.: 9.00 Yes:6352 No phone service: 680 Fiber optic:3096 No internet service:1520 No internet service:1520 No internet service:1520 No internet service:1520 No internet service:1520 No internet service:1520 One year :1472 Yes:4168 Credit card (automatic) :1521 1st Qu.: 35.59 1st Qu.: 401.4 Yes:1869
NA NA NA NA Median :29.00 NA Yes :2967 No :1520 Yes :2015 Yes :2425 Yes :2418 Yes :2040 Yes :2703 Yes :2731 Two year :1685 NA Electronic check :2365 Median : 70.35 Median :1397.5 NA
NA NA NA NA Mean :32.42 NA NA NA NA NA NA NA NA NA NA NA Mailed check :1604 Mean : 64.80 Mean :2283.3 NA
NA NA NA NA 3rd Qu.:55.00 NA NA NA NA NA NA NA NA NA NA NA NA 3rd Qu.: 89.86 3rd Qu.:3794.7 NA
NA NA NA NA Max. :72.00 NA NA NA NA NA NA NA NA NA NA NA NA Max. :118.75 Max. :8684.8 NA

We see a few categories with unbalanced data like Churn, SeniorCitizen, PhoneService.

It is possible that Random Forests or XGBoost work better for this task since are often better suited for unbalanced datasets.

Correlation of Numerical Variables

cor(df[, sapply(df, is.numeric)])
##                   tenure MonthlyCharges TotalCharges
## tenure         1.0000000      0.2468618    0.8258805
## MonthlyCharges 0.2468618      1.0000000    0.6510648
## TotalCharges   0.8258805      0.6510648    1.0000000

With the few non-categorical variables that we have, we can observe the obvious relationship that tenure has with TotalCharges, as well as Monthly and Total Charges

Churn Rates across different customer segments

Churn based on Gender

ggplot(df, aes(x = gender, fill = Churn)) + 
  geom_bar(position = 'dodge') +
  geom_text(stat = 'count', aes(label = after_stat(count)), 
            position = position_dodge(width = 0.9), 
            vjust = -0.3, size = 3) +
  labs(title = 'Churn Rates across Gender', 
       x = 'Gender', 
       y = 'Churn Count') +
  theme_minimal()

Churn rates across gender don’t seem to show any significant differences.

Churn based on SeniorCitizen

ggplot(df, aes(x = SeniorCitizen, fill = Churn)) + 
  geom_bar(position = 'dodge') + 
  geom_text(stat = 'count', aes(label = after_stat(count)), 
            position = position_dodge(width = 0.9), 
            vjust = -0.3, size = 3) +
  labs(title = 'Churn Rates across Senior Demographics', 
       x = 'Senior Citizen', 
       y = 'Churn Count') +
  theme_minimal()

We can see a big class imbalance in SeniorCitizen, which likely means that most of our customers aren’t seniors.

We are able to see that almost half of our SeniorCitizens are churning. This means that a bigger proportion of our SeniorCitizen class is churning.

Churn based on Partner

ggplot(df, aes(x = Partner, fill = Churn)) + 
  geom_bar(position = 'dodge') + 
  geom_text(stat = 'count', aes(label = after_stat(count)), 
            position = position_dodge(width = 0.9), 
            vjust = -0.3, size = 3) +
  labs(title = 'Churn Rates based on Partner', 
       x = 'Partner', 
       y = 'Churn Count') +
  theme_minimal()

When Partner is ‘No’ we have a higher proportion of people churning than then it is ‘Yes’.

This could be interpreted as a negative association with Churn.

People with Partners have a lower proportion of churning.

Churn based on whether the customer has dependents or not

ggplot(df, aes(x = Dependents, fill = Churn)) + 
  geom_bar(position = 'dodge') + 
  geom_text(stat = 'count', aes(label = after_stat(count)), 
            position = position_dodge(width = 0.9), 
            vjust = -0.3, size = 3) +
  labs(title = 'Churn Rates based on whether Customer has Dependents', 
       x = 'Dependents', 
       y = 'Churn Count') +
  theme_minimal()

Having Dependents seems to have a negative association with Churn.

People with Dependents have a lower proportion of churning.

Plots that separate Churn

ggplot(df, aes(x = Churn, y = tenure)) + 
  geom_boxplot() + 
  labs(title = 'Tenure affects Churn probability', 
       x = 'Churn', 
       y = 'Tenure (months)') + 
  theme_minimal()

tenure seems to be a good separator for Churn. It is possible to see that a lower tenure is associated with higher probability of churning.

ggplot(df, aes(x = Churn, y = MonthlyCharges)) + 
  geom_boxplot() + 
  labs(title = 'Monthly Charges affecting Churn', 
       x = 'Churn', 
       y = 'Monthly Charges') + 
  theme_minimal()

Our boxplot doesn’t show much separation in Monthly Charges when comparing to Churn.

It seems like higher Monthly Charges do have an association with Churn.

ggplot(df, aes(x = Churn, y = TotalCharges)) + 
  geom_boxplot() + 
  labs(title = 'Total Charges has almost no separation when classifying Churn', 
       x = 'Churn', 
       y = 'Total Charges') + 
  theme_minimal()

Seems almost irrelevant to compare TotalCharges to Churn, since we already have a small idea that a longer tenure is positively associated with not churning.

The plot does show a small cluster of outliers with high TotalCharges in the ChurnYes. This could be interesting because that must mean we are losing valued customers with a high tenure.

#subset Churn == Yes
churn_yes <- subset(df, Churn == "Yes")

#calculate IQR for churn_yes and TotalCharges
Q1 <- quantile(churn_yes$TotalCharges, 0.25, na.rm = TRUE)
Q3 <- quantile(churn_yes$TotalCharges, 0.75, na.rm = TRUE)
IQR_val <- Q3 - Q1

#outlier threshold
lower_bound <- Q1 - 1.5 * IQR_val
upper_bound <- Q3 + 1.5 * IQR_val

#filter outliers
churn_yes_outliers <- subset(churn_yes, TotalCharges < lower_bound | TotalCharges > upper_bound)

summary(churn_yes_outliers)
##     gender   SeniorCitizen Partner  Dependents     tenure      PhoneService
##  Female:47   0:82          No :33   No :84     Min.   :52.00   No :  0     
##  Male  :62   1:27          Yes:76   Yes:25     1st Qu.:59.00   Yes:109     
##                                                Median :65.00               
##                                                Mean   :63.88               
##                                                3rd Qu.:68.00               
##                                                Max.   :72.00               
##           MultipleLines    InternetService             OnlineSecurity
##  No              :10    DSL        :  1    No                 :67    
##  No phone service: 0    Fiber optic:108    No internet service: 0    
##  Yes             :99    No         :  0    Yes                :42    
##                                                                      
##                                                                      
##                                                                      
##               OnlineBackup            DeviceProtection              TechSupport
##  No                 :30    No                 :26      No                 :62  
##  No internet service: 0    No internet service: 0      No internet service: 0  
##  Yes                :79    Yes                :83      Yes                :47  
##                                                                                
##                                                                                
##                                                                                
##               StreamingTV             StreamingMovies           Contract 
##  No                 :  8   No                 :11     Month-to-month:32  
##  No internet service:  0   No internet service: 0     One year      :52  
##  Yes                :101   Yes                :98     Two year      :25  
##                                                                          
##                                                                          
##                                                                          
##  PaperlessBilling                   PaymentMethod MonthlyCharges 
##  No :22           Bank transfer (automatic):29    Min.   : 83.0  
##  Yes:87           Credit card (automatic)  :30    1st Qu.:100.2  
##                   Electronic check         :50    Median :105.0  
##                   Mailed check             : 0    Mean   :104.1  
##                                                   3rd Qu.:108.6  
##                                                   Max.   :118.3  
##   TotalCharges  Churn    
##  Min.   :5638   No :  0  
##  1st Qu.:6125   Yes:109  
##  Median :6579            
##  Mean   :6670            
##  3rd Qu.:7177            
##  Max.   :8685

A lot of these outliers were indeed customers with high tenure and it is vital that our model identifies these.

outlier_indices <- as.numeric(rownames(churn_yes_outliers))

With this index, we will test the accuracy of the models and see how well they predicted these ‘loyal customers’ churning.

Key Questions

Do certain demographics have a higher churn rate?

Based on our plots, it appears that Senior Citizens do have a higher churn rate. To prove this, we will use chi-square tests of independence between our categorical demographic variables and Churn.

Our null hypothesis states that Churn is independent of being a Senior Citizen. (Gender, Dependents)

Alternative hypothesis that Churn is related to being a Senior Citizen.

Chi-square tests

#chi-square test for SeniorCitizen
chisq.test(table(df$SeniorCitizen, df$Churn))
## 
##  Pearson's Chi-squared test with Yates' continuity correction
## 
## data:  table(df$SeniorCitizen, df$Churn)
## X-squared = 158.44, df = 1, p-value < 2.2e-16

p-value is lower than 0.05 so we reject the null hypothesis

There is strong evidence that being a SeniorCitizen is associated with churn.

#chi-square test for Gender
chisq.test(table(df$gender, df$Churn))
## 
##  Pearson's Chi-squared test with Yates' continuity correction
## 
## data:  table(df$gender, df$Churn)
## X-squared = 0.47545, df = 1, p-value = 0.4905

p-value is higher than 0.05 so we fail to reject the null hypothesis.

There is no significant evidence that gender is associated with churn.

#chi-square test for Partner
chisq.test(table(df$Partner, df$Churn))
## 
##  Pearson's Chi-squared test with Yates' continuity correction
## 
## data:  table(df$Partner, df$Churn)
## X-squared = 157.5, df = 1, p-value < 2.2e-16
#chi-square test for Dependents
chisq.test(table(df$Dependents, df$Churn))
## 
##  Pearson's Chi-squared test with Yates' continuity correction
## 
## data:  table(df$Dependents, df$Churn)
## X-squared = 186.32, df = 1, p-value < 2.2e-16

Based on the chi-square test p-value lower than 0.05, we reject the null hypothesis and assume that both Partner and Dependents are associated with churn.

As we identified from our plots, Partner and Dependents seemed to have a negative association with Churn.

What factors influence customer churn the most?

In order to account for possible multivariate effects, we are not going to run Chi-square, ANOVA, or t-tests.

numerical_vars <- df[, sapply(df, is.numeric)]
categorical_vars <- df[, sapply(df, function(x) !is.numeric(x))]

for(var in colnames(numerical_vars)){
  print(paste('T-test for', var))
  print(t.test(df[[var]] ~ df$Churn, data = df)$p.value)
}
## [1] "T-test for tenure"
## [1] 2.347075e-234
## [1] "T-test for MonthlyCharges"
## [1] 2.657357e-72
## [1] "T-test for TotalCharges"
## [1] 1.152494e-75
for(var in colnames(categorical_vars)){
  print(paste('Chi-square for', var))
  print(chisq.test(table(df[[var]], df$Churn))$p.value)
}
## [1] "Chi-square for gender"
## [1] 0.4904885
## [1] "Chi-square for SeniorCitizen"
## [1] 2.479256e-36
## [1] "Chi-square for Partner"
## [1] 3.973798e-36
## [1] "Chi-square for Dependents"
## [1] 2.019659e-42
## [1] "Chi-square for PhoneService"
## [1] 0.349924
## [1] "Chi-square for MultipleLines"
## [1] 0.003567927
## [1] "Chi-square for InternetService"
## [1] 5.831199e-159
## [1] "Chi-square for OnlineSecurity"
## [1] 1.400687e-184
## [1] "Chi-square for OnlineBackup"
## [1] 7.776099e-131
## [1] "Chi-square for DeviceProtection"
## [1] 1.959389e-121
## [1] "Chi-square for TechSupport"
## [1] 7.407808e-180
## [1] "Chi-square for StreamingTV"
## [1] 1.324641e-81
## [1] "Chi-square for StreamingMovies"
## [1] 5.35356e-82
## [1] "Chi-square for Contract"
## [1] 7.326182e-257
## [1] "Chi-square for PaperlessBilling"
## [1] 8.236203e-58
## [1] "Chi-square for PaymentMethod"
## [1] 1.42631e-139
## [1] "Chi-square for Churn"
## [1] 0

Based on our hypothesis tests, we want to reject null hypothesis to suggest strong evidence that the variables are associated with Churn. The lower the p-values, the stronger the evidence. Below are our most significant variables:

  1. Contract (p-value of 7.33e-257)
  2. Tenure (p-value of 2.35e-254)
  3. OnlineSecurity (p-value of 1.4e-180)
  4. TechSupport (p-value of 7.41e-180)
  5. InternetService(p-value of 5.83e-159)

These five variables show the strongest univariate association with Churn. However, it is important to note that these tests do not account for multivariate effects. One variable could in theory explain the same amount of variance in Churn as another, making one of the two statistically insignificant. Therefore, we will refrain from making an assumption about which factors influence customer churn the most until we fit them on predictive models. By building models such as logistic regression, we can interpret the coefficients to see the direction and strength of each variable’s effect. Similarly, Random Forests can provide a ranked feature importance that takes into account complex, nonlinear interactions and multicollinearity.

Are customers with long-term contracts less likely to leave?

For this question, we can use another Chi-square test to assess whether there’s a statistically significant association between contract type and churn status.

Null hypothesis: Contract type does not have a statistically significant association with Churn

Alternative hypothesis: Contract type and Churn have a statistically significant association.

chisq.test(table(df$Contract, df$Churn))
## 
##  Pearson's Chi-squared test
## 
## data:  table(df$Contract, df$Churn)
## X-squared = 1179.5, df = 2, p-value < 2.2e-16

We reject the null hypothesis. Our p-value lower than 0.05 suggests that there is a significant association between contract type and Churn. We can assume that at least one contract type has a different churn rate compared to the others.

We can create a bar plot to visualize these differences.

ggplot(df, aes(x = Contract, fill = Churn)) +
  geom_bar(position = "fill") +
  labs(title = "Churn Proportions by Contract Type",
       y = "Proportion",
       x = "Contract Type") +
  theme_minimal()

It does in fact seem like month-to-month has a much bigger difference in people who churned.

Which service do most customers subscribe to?

First we need to create a dataframe that contains the counts of all customers subscribed to certain services.

service_vars <- c('PhoneService', 'OnlineSecurity', 'OnlineBackup', 
                  'DeviceProtection', 'TechSupport', 'StreamingTV', 'StreamingMovies', 
                  'MultipleLines')

service_counts <- sapply(service_vars, function(var){
  sum(df[[var]] == 'Yes', na.rm = TRUE)
})

#InternetService isn't a yes/no so we do that separately
InternetService_counts <- sum(df$InternetService == 'DSL', na.rm = TRUE) + 
  sum(df$InternetService == 'Fiber optic', na.rm = TRUE)

#bind it to service_counts
service_counts <- c(service_counts, InternetService = InternetService_counts)

#turn it to a dataframe
service_counts <- data.frame(
  service = names(service_counts), 
  count = service_counts
)
ggplot(service_counts, aes(x = reorder(service, -count), y = count)) + 
  geom_bar(stat = 'identity', fill = 'lightblue') + 
  geom_text(aes(label = count), 
            position = position_dodge(width = 0.9), 
            vjust = -0.3, size = 3) +
  labs(title = 'Most subscribed services', 
       x = 'Service', 
       y = 'Number of Customers') + 
  theme_minimal() + 
  theme(axis.text.x = element_text(angle = 45, hjust = 1))

From our plot, we can see that PhoneService is the service that most customers subscribe to. InternetService is second. We expected this since it appears that the company does not sell StreamingMovies or StreamingTV unless they have the InternetService, just as they can’t sell MultipleLines if the customer doesn’t have PhoneService.

Can we build a predictive model to identify customers at risk of churning?

For the sake of simplicity, we will adapt our dataframe so that the categorical variables with 3 levels will be reduced to 2. Since we are only interested in Churn, having a ‘No internet service’ level will just be treated the same as No. Same will apply for ‘No phone service’.

service_vars2 <- c('OnlineSecurity', 'OnlineBackup',
                  'DeviceProtection', 'TechSupport', 'StreamingTV', 'StreamingMovies', 
                  'MultipleLines')

for(var in service_vars2) {
  df[[var]] <- as.character(df[[var]]) #temporary make it character 
  df[[var]][df[[var]] %in% c('No internet service', 'No phone service')] <- 'No'
  df[[var]] <- as.factor(df[[var]]) #convert back to factor
}

InternetService also has a different reference level than all other categorical variables so for better interpretability we shall re-level.

#set 'No' as reference level for InternetService
df$InternetService <- relevel(df$InternetService, ref = 'No')

Train-test split

set.seed(42)
train_index <- createDataPartition(df$Churn, p = 0.7, list = FALSE)
train_data <- df[train_index, ]
test_data <- df[-train_index, ]

#validation set for threshold adjusting in log_model
train_val_index <- createDataPartition(train_data$Churn, p = 0.8, list = FALSE)
validation_data <- train_data[-train_val_index, ]
train_data <- train_data[train_val_index, ]

Logistic Regression

Based on our analysis of factors influencing Churn, we can expect Contract and tenure to be significant, even with the multivariate effects since they stood out with the lowest p-values by a large margin.

We also know that it is likely one of our numerical variables to have a high VIF, because we saw previously that they had a strong positive correlation with one another. This means we must check for VIF.

Full Model

full_log_model <- glm(Churn ~ ., 
                  data = train_data, 
                  family = 'binomial')
summary(full_log_model)
## 
## Call:
## glm(formula = Churn ~ ., family = "binomial", data = train_data)
## 
## Coefficients:
##                                        Estimate Std. Error z value Pr(>|z|)    
## (Intercept)                          -8.764e-01  2.860e-01  -3.065 0.002179 ** 
## genderMale                            4.759e-02  8.622e-02   0.552 0.580969    
## SeniorCitizen1                        1.793e-01  1.130e-01   1.586 0.112693    
## PartnerYes                           -6.792e-02  1.032e-01  -0.658 0.510508    
## DependentsYes                        -1.589e-01  1.192e-01  -1.332 0.182795    
## tenure                               -5.096e-02  8.037e-03  -6.341 2.28e-10 ***
## PhoneServiceYes                      -6.166e-01  8.649e-01  -0.713 0.475933    
## MultipleLinesYes                      2.678e-01  2.342e-01   1.144 0.252754    
## InternetServiceDSL                    5.348e-01  1.076e+00   0.497 0.619278    
## InternetServiceFiber optic            1.060e+00  2.123e+00   0.499 0.617674    
## OnlineSecurityYes                    -4.220e-01  2.367e-01  -1.783 0.074605 .  
## OnlineBackupYes                      -1.155e-01  2.321e-01  -0.498 0.618753    
## DeviceProtectionYes                  -1.470e-01  2.368e-01  -0.621 0.534608    
## TechSupportYes                       -4.057e-01  2.430e-01  -1.670 0.094955 .  
## StreamingTVYes                        2.540e-02  4.340e-01   0.059 0.953326    
## StreamingMoviesYes                    1.701e-01  4.335e-01   0.392 0.694721    
## ContractOne year                     -5.730e-01  1.423e-01  -4.027 5.65e-05 ***
## ContractTwo year                     -1.285e+00  2.338e-01  -5.498 3.84e-08 ***
## PaperlessBillingYes                   3.567e-01  9.918e-02   3.597 0.000322 ***
## PaymentMethodCredit card (automatic) -1.839e-01  1.529e-01  -1.203 0.229015    
## PaymentMethodElectronic check         3.719e-01  1.268e-01   2.933 0.003356 ** 
## PaymentMethodMailed check            -4.940e-02  1.557e-01  -0.317 0.750978    
## MonthlyCharges                        8.448e-03  4.229e-02   0.200 0.841668    
## TotalCharges                          2.240e-04  9.207e-05   2.433 0.014971 *  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## (Dispersion parameter for binomial family taken to be 1)
## 
##     Null deviance: 4564.3  on 3939  degrees of freedom
## Residual deviance: 3299.4  on 3916  degrees of freedom
## AIC: 3347.4
## 
## Number of Fisher Scoring iterations: 6

VIF

vif(full_log_model)
##                        GVIF Df GVIF^(1/(2*Df))
## gender             1.004232  1        1.002114
## SeniorCitizen      1.141350  1        1.068340
## Partner            1.358216  1        1.165425
## Dependents         1.279603  1        1.131195
## tenure            14.691586  1        3.832960
## PhoneService      34.328595  1        5.859061
## MultipleLines      7.236077  1        2.689996
## InternetService  391.567380  2        4.448377
## OnlineSecurity     4.985436  1        2.232809
## OnlineBackup       6.438307  1        2.537382
## DeviceProtection   6.565094  1        2.562244
## TechSupport        5.411639  1        2.326293
## StreamingTV       24.645002  1        4.964373
## StreamingMovies   24.560803  1        4.955886
## Contract           1.581515  2        1.121420
## PaperlessBilling   1.134396  1        1.065080
## PaymentMethod      1.438029  3        1.062416
## MonthlyCharges   695.026740  1       26.363360
## TotalCharges      18.900404  1        4.347459

MonthlyCharges has a high VIF, we will remove this variable and check multicorrelation again.

log_model1 <- glm(Churn ~ . -MonthlyCharges,  
               data = train_data, 
               family = 'binomial')
vif(log_model1)
##                       GVIF Df GVIF^(1/(2*Df))
## gender            1.003824  1        1.001910
## SeniorCitizen     1.139908  1        1.067665
## Partner           1.357992  1        1.165329
## Dependents        1.279486  1        1.131144
## tenure           14.674639  1        3.830749
## PhoneService      1.476016  1        1.214914
## MultipleLines     1.493616  1        1.222136
## InternetService   2.829376  2        1.296948
## OnlineSecurity    1.139530  1        1.067488
## OnlineBackup      1.258083  1        1.121643
## DeviceProtection  1.299197  1        1.139823
## TechSupport       1.195608  1        1.093438
## StreamingTV       1.504036  1        1.226391
## StreamingMovies   1.507044  1        1.227617
## Contract          1.581324  2        1.121386
## PaperlessBilling  1.134336  1        1.065052
## PaymentMethod     1.437782  3        1.062386
## TotalCharges     18.860403  1        4.342857

Multicollinearity is dealt with ✅

Stepwise Log Model

step_log_model <- step(log_model1, direction = 'both', trace = FALSE)
summary(step_log_model)
## 
## Call:
## glm(formula = Churn ~ SeniorCitizen + Dependents + tenure + PhoneService + 
##     MultipleLines + InternetService + OnlineSecurity + TechSupport + 
##     StreamingMovies + Contract + PaperlessBilling + PaymentMethod + 
##     TotalCharges, family = "binomial", data = train_data)
## 
## Coefficients:
##                                        Estimate Std. Error z value Pr(>|z|)    
## (Intercept)                          -8.613e-01  2.807e-01  -3.069 0.002151 ** 
## SeniorCitizen1                        1.739e-01  1.123e-01   1.548 0.121606    
## DependentsYes                        -1.912e-01  1.084e-01  -1.764 0.077673 .  
## tenure                               -5.160e-02  7.888e-03  -6.542 6.09e-11 ***
## PhoneServiceYes                      -4.480e-01  1.781e-01  -2.515 0.011910 *  
## MultipleLinesYes                      3.153e-01  1.062e-01   2.968 0.003000 ** 
## InternetServiceDSL                    7.238e-01  1.813e-01   3.992 6.56e-05 ***
## InternetServiceFiber optic            1.467e+00  1.895e-01   7.743 9.75e-15 ***
## OnlineSecurityYes                    -3.879e-01  1.128e-01  -3.438 0.000586 ***
## TechSupportYes                       -3.631e-01  1.140e-01  -3.186 0.001440 ** 
## StreamingMoviesYes                    2.699e-01  1.039e-01   2.598 0.009377 ** 
## ContractOne year                     -5.783e-01  1.415e-01  -4.087 4.36e-05 ***
## ContractTwo year                     -1.289e+00  2.333e-01  -5.526 3.28e-08 ***
## PaperlessBillingYes                   3.610e-01  9.891e-02   3.650 0.000262 ***
## PaymentMethodCredit card (automatic) -1.835e-01  1.528e-01  -1.201 0.229813    
## PaymentMethodElectronic check         3.848e-01  1.264e-01   3.044 0.002334 ** 
## PaymentMethodMailed check            -4.015e-02  1.555e-01  -0.258 0.796204    
## TotalCharges                          2.191e-04  8.757e-05   2.502 0.012340 *  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## (Dispersion parameter for binomial family taken to be 1)
## 
##     Null deviance: 4564.3  on 3939  degrees of freedom
## Residual deviance: 3302.8  on 3922  degrees of freedom
## AIC: 3338.8
## 
## Number of Fisher Scoring iterations: 6

Predictions

log_preds <- predict(step_log_model, newdata = test_data, type = 'response')
log_preds_class <- ifelse(log_preds >= 0.5, 'Yes', 'No')
confusionMatrix(as.factor(log_preds_class), test_data$Churn, positive = 'Yes')
## Confusion Matrix and Statistics
## 
##           Reference
## Prediction   No  Yes
##        No  1391  251
##        Yes  157  309
##                                           
##                Accuracy : 0.8065          
##                  95% CI : (0.7889, 0.8231)
##     No Information Rate : 0.7343          
##     P-Value [Acc > NIR] : 5.869e-15       
##                                           
##                   Kappa : 0.4759          
##                                           
##  Mcnemar's Test P-Value : 4.141e-06       
##                                           
##             Sensitivity : 0.5518          
##             Specificity : 0.8986          
##          Pos Pred Value : 0.6631          
##          Neg Pred Value : 0.8471          
##              Prevalence : 0.2657          
##          Detection Rate : 0.1466          
##    Detection Prevalence : 0.2211          
##       Balanced Accuracy : 0.7252          
##                                           
##        'Positive' Class : Yes             
## 

In this scenario, we are obviously prioritizing Sensitivity.

Predicting no but the customer churns would result in one less customer and loss of money.

Predicting yes but the customer stayed would result in a small cost of offering an incentive.

Due to this, we will find a better threshold to find an optimal trade-off.

roc_obj <- roc(test_data$Churn, log_preds)
## Setting levels: control = No, case = Yes
## Setting direction: controls < cases
auc(roc_obj)
## Area under the curve: 0.8552

Our model has a good discriminative power. It can distinguish between churn and non-churn about 85.5% of the time.

Threshold Adjusting

Since we are adjusting the threshold, we need to utilize our validation set because adjusting the threshold on the test set would mean that we are tailoring our model to the ‘unseen’ data.

First we make a set of predictions on the validation set

log_preds_val <- predict(step_log_model, newdata = validation_data, type = 'response')
log_preds_val_class <- ifelse(log_preds_val >= 0.5, 'Yes', 'No')
roc_obj <- roc(validation_data$Churn, log_preds_val)
## Setting levels: control = No, case = Yes
## Setting direction: controls < cases
coords(roc_obj, 'best', ret = 'threshold')
##   threshold
## 1 0.2812345

Predictions with new Threshold

log_preds_adj_threshold <- predict(step_log_model, newdata = test_data, type = 'response')
log_preds_class_adj_threshold <- ifelse(log_preds_adj_threshold >= 0.2812345, 'Yes', 'No')
confusionMatrix(as.factor(log_preds_class_adj_threshold), test_data$Churn, positive = 'Yes')
## Confusion Matrix and Statistics
## 
##           Reference
## Prediction   No  Yes
##        No  1180  117
##        Yes  368  443
##                                           
##                Accuracy : 0.7699          
##                  95% CI : (0.7514, 0.7877)
##     No Information Rate : 0.7343          
##     P-Value [Acc > NIR] : 9.736e-05       
##                                           
##                   Kappa : 0.4841          
##                                           
##  Mcnemar's Test P-Value : < 2.2e-16       
##                                           
##             Sensitivity : 0.7911          
##             Specificity : 0.7623          
##          Pos Pred Value : 0.5462          
##          Neg Pred Value : 0.9098          
##              Prevalence : 0.2657          
##          Detection Rate : 0.2102          
##    Detection Prevalence : 0.3847          
##       Balanced Accuracy : 0.7767          
##                                           
##        'Positive' Class : Yes             
## 

With this new threshold, we trade off some specificity, but increases our sensitivity by a solid margin.

Without any information on the expenses that a retention strategy would incur per customer, it’s difficult to quantify if a higher accuracy model or a more balanced sensitivity-specificity model would result in lower losses.

Based on the average MonthlyCharges of $68.80, we would like to believe that our model with the adjusted threshold would result in higher profits for the company. Unless the cost of acting on non-churners is really high, Model 2 is smarter business.

Decision Trees

tree_model <- rpart(Churn ~ . -MonthlyCharges, data = train_data, method = 'class')
#we use method = 'class' since our y is a factor

rattle::fancyRpartPlot(tree_model, sub = " ", cex = 0.7)

From our visualization of the tree_model, we can sort of expect the importance of variables to be kind of similar to the order in which they split the data.

Contract, InternetService, tenure…..

Variable Importance

tree_model$variable.importance
##         Contract           tenure     TotalCharges    PaymentMethod 
##      240.1290137      186.2089718      155.6253216       98.7238207 
##  InternetService          Partner      TechSupport    MultipleLines 
##       80.7666367       55.9678500       52.0848871       43.4189550 
## PaperlessBilling     PhoneService     OnlineBackup      StreamingTV 
##       19.2306993       17.1598166        5.8554507        5.5037241 
##  StreamingMovies   OnlineSecurity       Dependents 
##        0.5248016        0.2998866        0.1499433

Contract, tenure, TotalCharges, PaymentMethod, and InternetService in that order, are our most important variables in our Decision Tree.

With this information, we can refine our feature set in other models like Random Forests.

Predictions

tree_model_preds <- predict(tree_model, newdata = test_data, type = 'class')
confusionMatrix(tree_model_preds, test_data$Churn, positive = 'Yes')
## Confusion Matrix and Statistics
## 
##           Reference
## Prediction   No  Yes
##        No  1419  310
##        Yes  129  250
##                                           
##                Accuracy : 0.7917          
##                  95% CI : (0.7738, 0.8089)
##     No Information Rate : 0.7343          
##     P-Value [Acc > NIR] : 5.572e-10       
##                                           
##                   Kappa : 0.4049          
##                                           
##  Mcnemar's Test P-Value : < 2.2e-16       
##                                           
##             Sensitivity : 0.4464          
##             Specificity : 0.9167          
##          Pos Pred Value : 0.6596          
##          Neg Pred Value : 0.8207          
##              Prevalence : 0.2657          
##          Detection Rate : 0.1186          
##    Detection Prevalence : 0.1798          
##       Balanced Accuracy : 0.6815          
##                                           
##        'Positive' Class : Yes             
## 

Our Decision Tree model is similar to our original Logistic Regression. It is only a little more conservative, and less accurate It is more likely to say ‘No churn’ unless it’s pretty confident.

Random Forests

Simple Model

For this simple model, we will use just some standard parameters. We will use this as a benchmark for our Fine-tuned model with a hyper grid.

We will also use our best 8 predictors based on the importance that was shown in our Decision Tree model.

set.seed(42)
rf_model <- rfsrc(Churn ~ Contract + tenure + TotalCharges + PaymentMethod + InternetService + 
                    Partner + TechSupport + MultipleLines, 
                        data = train_data, 
                        mtry = 2, 
                        nodesize = 6, 
                        ntree = 100, 
                        importance = TRUE, 
                        positive = 'Yes')
rf_model
##                          Sample size: 3940
##            Frequency of class labels: 2892, 1048
##                      Number of trees: 100
##            Forest terminal node size: 6
##        Average no. of terminal nodes: 251.01
## No. of variables tried at each split: 2
##               Total no. of variables: 8
##        Resampling used to grow trees: swor
##     Resample size used to grow trees: 2490
##                             Analysis: RF-C
##                               Family: class
##                       Splitting rule: gini *random*
##        Number of random split points: 10
##                     Imbalanced ratio: 2.7595
##                    (OOB) Brier score: 0.1404841
##         (OOB) Normalized Brier score: 0.56193639
##                            (OOB) AUC: 0.82901469
##                       (OOB) Log-loss: 0.43345896
##                         (OOB) PR-AUC: 0.64354269
##                         (OOB) G-mean: 0.66917998
##    (OOB) Requested performance error: 0.20659898, 0.09923928, 0.5028626
## 
## Confusion matrix:
## 
##           predicted
##   observed   No Yes class.error
##        No  2605 287      0.0992
##        Yes  527 521      0.5029
## 
##       (OOB) Misclassification rate: 0.206599

Variable Importance

rf_model$importance
##                          all           No        Yes
## Contract        0.0457941443 -0.180654830 0.96125501
## tenure          0.0787458358  0.192121994 0.26560311
## TotalCharges    0.0513797918  0.153772789 0.09493236
## PaymentMethod   0.0204048856  0.002067849 0.20049922
## InternetService 0.0836473778  0.031393711 0.75868076
## Partner         0.0003622145 -0.007707438 0.02490029
## TechSupport     0.0215487268 -0.009023342 0.24277784
## MultipleLines   0.0050322416 -0.007143479 0.07055083
importance_df <- data.frame(
  Variable = rownames(rf_model$importance), 
  All = rf_model$importance[, 1], 
  No = rf_model$importance[, 2], 
  Yes = rf_model$importance[, 3]
)

p1 <- ggplot(importance_df, aes(x = reorder(Variable, All), y = All)) + 
  geom_col(fill = 'red') + 
  coord_flip() +
  labs(title = 'All', 
       x = 'Variables', 
       y = 'Importance') +
  theme_minimal()

p2 <- ggplot(importance_df, aes(x = reorder(Variable, No), y = No)) + 
  geom_col(fill = 'blue') + 
  coord_flip() +
  labs(title = 'No', 
       x = 'Variables', 
       y = 'Importance') +
  theme_minimal()

p3 <- ggplot(importance_df, aes(x = reorder(Variable, Yes), y = Yes)) + 
  geom_col(fill = 'green') + 
  coord_flip() +
  labs(title = 'Yes', 
       x = 'Variables', 
       y = 'Importance') +
  theme_minimal()

grid.arrange(p1, p2, p3, nrow = 3)

Based on our plots, we can see that certain variables have a higher importance specifically for predicting ChurnYes, but lower importance for predicting ChurnNo.

For example, for ChurnYes, Contract has the highest importance, while for ChurnNo it has a negative and lowest importance.

PDP plots

plot.variable(rf_model, partial = TRUE, plots.per.page = 1)

Based on our PDP plots, we can see that as tenure increases, so does the probability of ChurnNo. We already had an idea of this based on our logistic regression coefficient.

TotalCharges is a different story. It reveals a clear relationship with customer churn, as customers with higher TotalCharges have a higher probability of staying. This makes sense since this variable is lowly correlated with tenure. We also see a bit of ups and downs, but after peaking we see diminishing returns.

It is also possible to appreciate how all of our categorical variables and their levels affect the probability of not churning.

Interactions

find.interaction(rf_model, method = 'vimp', importance = 'permute')
## Pairing InternetService with tenure 
## Pairing InternetService with TotalCharges 
## Pairing InternetService with Contract 
## Pairing InternetService with TechSupport 
## Pairing InternetService with PaymentMethod 
## Pairing InternetService with MultipleLines 
## Pairing InternetService with Partner 
## Pairing tenure with TotalCharges 
## Pairing tenure with Contract 
## Pairing tenure with TechSupport 
## Pairing tenure with PaymentMethod 
## Pairing tenure with MultipleLines 
## Pairing tenure with Partner 
## Pairing TotalCharges with Contract 
## Pairing TotalCharges with TechSupport 
## Pairing TotalCharges with PaymentMethod 
## Pairing TotalCharges with MultipleLines 
## Pairing TotalCharges with Partner 
## Pairing Contract with TechSupport 
## Pairing Contract with PaymentMethod 
## Pairing Contract with MultipleLines 
## Pairing Contract with Partner 
## Pairing TechSupport with PaymentMethod 
## Pairing TechSupport with MultipleLines 
## Pairing TechSupport with Partner 
## Pairing PaymentMethod with MultipleLines 
## Pairing PaymentMethod with Partner 
## Pairing MultipleLines with Partner 
## 
##                               Method: vimp
##                     No. of variables: 8
##            Variables sorted by VIMP?: TRUE
##    No. of variables used for pairing: 8
##     Total no. of paired interactions: 28
##             Monte Carlo replications: 1
##     Type of noising up used for VIMP: permute
## 
##                                Var 1   Var 2 Paired Additive Difference
## InternetService:tenure        0.0312  0.0354 0.0591   0.0666    -0.0075
## InternetService:TotalCharges  0.0312  0.0169 0.0505   0.0481     0.0023
## InternetService:Contract      0.0312  0.0157 0.0461   0.0469    -0.0008
## InternetService:TechSupport   0.0312  0.0041 0.0369   0.0353     0.0015
## InternetService:PaymentMethod 0.0312  0.0037 0.0427   0.0350     0.0077
## InternetService:MultipleLines 0.0312  0.0000 0.0381   0.0312     0.0069
## InternetService:Partner       0.0312  0.0000 0.0307   0.0312    -0.0006
## tenure:TotalCharges           0.0338  0.0178 0.0441   0.0516    -0.0075
## tenure:Contract               0.0338  0.0154 0.0527   0.0491     0.0036
## tenure:TechSupport            0.0338  0.0049 0.0387   0.0387     0.0000
## tenure:PaymentMethod          0.0338  0.0065 0.0416   0.0402     0.0014
## tenure:MultipleLines          0.0338  0.0007 0.0316   0.0344    -0.0028
## tenure:Partner                0.0338 -0.0015 0.0331   0.0323     0.0008
## TotalCharges:Contract         0.0186  0.0172 0.0369   0.0358     0.0011
## TotalCharges:TechSupport      0.0186  0.0037 0.0238   0.0223     0.0015
## TotalCharges:PaymentMethod    0.0186  0.0052 0.0263   0.0238     0.0025
## TotalCharges:MultipleLines    0.0186 -0.0002 0.0220   0.0184     0.0035
## TotalCharges:Partner          0.0186  0.0018 0.0169   0.0204    -0.0035
## Contract:TechSupport          0.0163  0.0043 0.0220   0.0206     0.0014
## Contract:PaymentMethod        0.0163  0.0055 0.0227   0.0218     0.0009
## Contract:MultipleLines        0.0163  0.0021 0.0185   0.0184     0.0001
## Contract:Partner              0.0163 -0.0019 0.0162   0.0144     0.0018
## TechSupport:PaymentMethod     0.0038  0.0034 0.0077   0.0072     0.0005
## TechSupport:MultipleLines     0.0038  0.0005 0.0053   0.0043     0.0010
## TechSupport:Partner           0.0038 -0.0004 0.0045   0.0034     0.0012
## PaymentMethod:MultipleLines   0.0058  0.0009 0.0081   0.0067     0.0014
## PaymentMethod:Partner         0.0058 -0.0001 0.0055   0.0056    -0.0001
## MultipleLines:Partner         0.0017  0.0018 0.0002   0.0035    -0.0034

Variables don’t show a large difference between ‘Paired’ and ‘Additive’, therefore these interactions don’t indicate an association worth pursuing.

Predictions

rf_model_preds <- predict(rf_model, newdata = test_data)
confusionMatrix(rf_model_preds$class, as.factor(test_data$Churn), positive = 'Yes')
## Confusion Matrix and Statistics
## 
##           Reference
## Prediction   No  Yes
##        No  1403  284
##        Yes  145  276
##                                           
##                Accuracy : 0.7965          
##                  95% CI : (0.7787, 0.8135)
##     No Information Rate : 0.7343          
##     P-Value [Acc > NIR] : 1.872e-11       
##                                           
##                   Kappa : 0.4335          
##                                           
##  Mcnemar's Test P-Value : 2.688e-11       
##                                           
##             Sensitivity : 0.4929          
##             Specificity : 0.9063          
##          Pos Pred Value : 0.6556          
##          Neg Pred Value : 0.8317          
##              Prevalence : 0.2657          
##          Detection Rate : 0.1309          
##    Detection Prevalence : 0.1997          
##       Balanced Accuracy : 0.6996          
##                                           
##        'Positive' Class : Yes             
## 

Hyper Grid

set.seed(42)

mtry.values <- seq(1, 6, 1)
nodesize.values <- seq(2, 8, 1)
ntree.values <- seq(5, 60, 5)

hyper_grid <- expand.grid(mtry = mtry.values, 
                          nodesize = nodesize.values, 
                          ntree = ntree.values)

results <- data.frame()
for(i in 1:nrow(hyper_grid)) {
  params <- hyper_grid[i, ]
  
  set.seed(42)
  model <- rfsrc(Churn ~ Contract + tenure + TotalCharges + PaymentMethod + InternetService + 
                    Partner + TechSupport + MultipleLines,   
                 data = train_data, 
                 ntree = params$ntree,
                 mtry = params$mtry,
                 nodesize = params$nodesize,
                 importance = TRUE)
  
  #store results
  results <- rbind(results, data.frame(
    mtry = params$mtry, 
    nodesize = params$nodesize, 
    ntree = params$ntree, 
    oob_err = model$err.rate[model$ntree]
  ))
}
best_params <- results[which.min(results$oob_err), ]
print(best_params)
##     mtry nodesize ntree   oob_err
## 482    2        5    60 0.2010152

Model using Hyper Grid

set.seed(42)
rf_model_hyper <- rfsrc(Churn ~ Contract + tenure + TotalCharges + PaymentMethod + InternetService + 
                    Partner + TechSupport + MultipleLines, 
                        data = train_data, 
                        mtry = best_params$mtry, 
                        nodesize = best_params$nodesize, 
                        ntree = best_params$ntree, 
                        importance = TRUE)
rf_model_hyper
##                          Sample size: 3940
##            Frequency of class labels: 2892, 1048
##                      Number of trees: 60
##            Forest terminal node size: 5
##        Average no. of terminal nodes: 277.4667
## No. of variables tried at each split: 2
##               Total no. of variables: 8
##        Resampling used to grow trees: swor
##     Resample size used to grow trees: 2490
##                             Analysis: RF-C
##                               Family: class
##                       Splitting rule: gini *random*
##        Number of random split points: 10
##                     Imbalanced ratio: 2.7595
##                    (OOB) Brier score: 0.14091491
##         (OOB) Normalized Brier score: 0.56365962
##                            (OOB) AUC: 0.82793776
##                       (OOB) Log-loss: 0.43600511
##                         (OOB) PR-AUC: 0.63964738
##                         (OOB) G-mean: 0.67199975
##    (OOB) Requested performance error: 0.20101523, 0.09163209, 0.5028626
## 
## Confusion matrix:
## 
##           predicted
##   observed   No Yes class.error
##        No  2627 265      0.0916
##        Yes  527 521      0.5029
## 
##       (OOB) Misclassification rate: 0.2010152

Predictions

rf_model_hyper_preds <- predict(rf_model_hyper, newdata = test_data)
confusionMatrix(rf_model_hyper_preds$class, as.factor(test_data$Churn), positive = 'Yes')
## Confusion Matrix and Statistics
## 
##           Reference
## Prediction   No  Yes
##        No  1403  296
##        Yes  145  264
##                                          
##                Accuracy : 0.7908         
##                  95% CI : (0.7728, 0.808)
##     No Information Rate : 0.7343         
##     P-Value [Acc > NIR] : 1.062e-09      
##                                          
##                   Kappa : 0.4133         
##                                          
##  Mcnemar's Test P-Value : 9.141e-13      
##                                          
##             Sensitivity : 0.4714         
##             Specificity : 0.9063         
##          Pos Pred Value : 0.6455         
##          Neg Pred Value : 0.8258         
##              Prevalence : 0.2657         
##          Detection Rate : 0.1252         
##    Detection Prevalence : 0.1940         
##       Balanced Accuracy : 0.6889         
##                                          
##        'Positive' Class : Yes            
## 

XGBoost Model

Variable Selection (RFE)

Using random forest again, we use variable importance to get an idea for most important variables to include in our XGBoost.

control <- rfeControl(functions = rfFuncs, method = 'cv', number = 5)

set.seed(42)
rfe_result <- rfe(x = train_data |>
                    select(-Churn), 
                  y = train_data$Churn, 
                  sizes = c(5, 10, 15), 
                  rfeControl = control)

#best variables
rfe_result$optVariables
##  [1] "tenure"           "MonthlyCharges"   "TotalCharges"     "InternetService" 
##  [5] "Contract"         "OnlineSecurity"   "TechSupport"      "PaymentMethod"   
##  [9] "PaperlessBilling" "MultipleLines"    "OnlineBackup"     "StreamingMovies" 
## [13] "StreamingTV"      "Dependents"       "Partner"

XGBoost recognizes these variables as the most important in that order. We know MonthlyCharges and TotalCharges are correlated. Since we have solid computational power, we will use all the features available to us, we will see feature importance of the models, and see the results. Since XGBoost will automatically only use relevant variables, and we are trying to maximize performance of our model, we won’t that it’ll take longer to fit.

Convert data to XGBoost Format

#Target variable needs to be numeric
train_data$label <- ifelse(train_data$Churn == 'Yes', 1, 0)
test_data$label <- ifelse(test_data$Churn == 'Yes', 1, 0)

# features <- c('tenure', 'MonthlyCharges', 'InternetService', 'Contract',
#               'OnlineSecurity', 'TechSupport', 'PaymentMethod')

features <- c('tenure', 'MonthlyCharges', 'TotalCharges', 'InternetService', 'Contract',
              'OnlineSecurity', 'TechSupport', 'PaymentMethod', 'PaperlessBilling',
              'MultipleLines', 'OnlineBackup', 'StreamingMovies', 'StreamingTV',
              'Dependents', 'Partner')

#model matrices
train_matrix <- model.matrix(~ . -1, data = train_data[, features])
test_matrix <- model.matrix(~ . -1, data = test_data[, features])

dtrain <- xgb.DMatrix(data = train_matrix, label = train_data$label)
dtest <- xgb.DMatrix(data = test_matrix, label = test_data$label)

Model training

set.seed(42)
xgb_model <- xgboost(data = dtrain, 
                     nrounds = 100, 
                     objective = 'binary:logistic', 
                     eval_metric = 'auc', 
                     verbose = 0)

Predictions

xgboost_pred_probs <- predict(xgb_model, newdata = dtest)
xgboost_pred_labels <- ifelse(xgboost_pred_probs >= 0.5, 1, 0)

confusionMatrix(as.factor(xgboost_pred_labels), as.factor(test_data$label), positive = '1')
## Confusion Matrix and Statistics
## 
##           Reference
## Prediction    0    1
##          0 1361  261
##          1  187  299
##                                           
##                Accuracy : 0.7875          
##                  95% CI : (0.7694, 0.8048)
##     No Information Rate : 0.7343          
##     P-Value [Acc > NIR] : 9.284e-09       
##                                           
##                   Kappa : 0.4313          
##                                           
##  Mcnemar's Test P-Value : 0.0005628       
##                                           
##             Sensitivity : 0.5339          
##             Specificity : 0.8792          
##          Pos Pred Value : 0.6152          
##          Neg Pred Value : 0.8391          
##              Prevalence : 0.2657          
##          Detection Rate : 0.1418          
##    Detection Prevalence : 0.2306          
##       Balanced Accuracy : 0.7066          
##                                           
##        'Positive' Class : 1               
## 

Complicated XGBoost

# Model matrix (for caret, return as data.frame)
train_matrix <- as.data.frame(model.matrix(~ . -1, data = train_data[, features]))
train_matrix$label <- train_data$label  # Add the label column

# Define cross-validation control
train_control <- trainControl(
  method = "cv",
  number = 5,
  verboseIter = TRUE,
  classProbs = TRUE,
  summaryFunction = twoClassSummary
)



# Define grid of hyperparameters
xgb_grid <- expand.grid(
  nrounds = c(150, 200),
  max_depth = c(2, 4),
  eta = c(0.01, 0.05, 0.1),
  gamma = c(0, 1),
  colsample_bytree = c(0.6, 0.8),
  min_child_weight = c(1, 2),
  subsample = c(0.6, 0.8)
)

# Convert label back to factor with levels required for twoClassSummary
train_matrix$label <- factor(ifelse(train_matrix$label == 1, "Yes", "No"), levels = c("No", "Yes"))
# Train the XGBoost model with tuning
set.seed(42)
xgb_tuned <- train(
  label ~ ., 
  data = train_matrix,
  method = "xgbTree",
  trControl = train_control,
  tuneGrid = xgb_grid,
  metric = "ROC"
)
## + Fold1: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:33:07] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:08] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold1: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:33:08] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:08] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold1: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:33:08] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:08] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold1: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:33:08] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:08] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold1: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:33:08] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:08] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold1: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:33:09] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:09] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold1: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:33:09] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:09] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold1: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:33:09] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:09] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold1: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:33:10] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:10] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold1: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:33:10] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:10] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold1: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:33:10] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:10] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold1: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:33:10] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:10] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold1: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:33:11] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:11] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold1: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:33:11] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:11] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold1: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:33:11] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:11] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold1: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:33:11] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:11] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold1: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:33:12] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:12] 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.6, nrounds=200 
## + Fold1: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:33:12] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:12] 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.8, nrounds=200 
## + Fold1: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:33:13] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:13] 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=2, subsample=0.6, nrounds=200 
## + Fold1: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:33:13] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:13] 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=2, subsample=0.8, nrounds=200 
## + Fold1: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:33:14] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:14] 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.6, nrounds=200 
## + Fold1: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:33:14] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:14] 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.8, nrounds=200 
## + Fold1: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:33:15] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:15] 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=2, subsample=0.6, nrounds=200 
## + Fold1: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:33:15] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:15] 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=2, subsample=0.8, nrounds=200 
## + Fold1: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:33:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:16] 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.6, nrounds=200 
## + Fold1: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:33:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:16] 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.8, nrounds=200 
## + Fold1: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:33:17] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:17] 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=2, subsample=0.6, nrounds=200 
## + Fold1: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:33:17] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:17] 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=2, subsample=0.8, nrounds=200 
## + Fold1: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:33:18] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:18] 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.6, nrounds=200 
## + Fold1: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:33:18] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:18] 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.8, nrounds=200 
## + Fold1: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:33:19] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:19] 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=2, subsample=0.6, nrounds=200 
## + Fold1: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:33:19] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:19] 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=2, subsample=0.8, nrounds=200 
## + Fold1: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:33:20] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:20] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold1: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:33:20] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:20] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold1: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:33:20] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:20] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold1: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:33:20] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:20] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold1: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:33:21] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:21] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold1: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:33:21] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:21] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold1: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:33:21] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:21] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold1: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:33:22] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:22] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold1: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:33:22] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:22] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold1: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:33:22] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:22] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold1: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:33:22] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:22] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold1: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:33:23] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:23] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold1: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:33:23] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:23] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold1: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:33:23] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:23] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold1: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:33:23] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:23] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold1: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:33:24] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:24] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold1: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:33:24] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:24] 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.6, nrounds=200 
## + Fold1: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:33:25] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33: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=1, subsample=0.8, nrounds=200 
## + Fold1: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:33:25] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33: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=2, subsample=0.6, nrounds=200 
## + Fold1: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:33:25] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33: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=2, subsample=0.8, nrounds=200 
## + Fold1: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:33:26] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:26] 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.6, nrounds=200 
## + Fold1: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:33:26] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33: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.8, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold1: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:33:27] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33: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.8, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold1: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:33:28] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:28] 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=2, subsample=0.8, nrounds=200 
## + Fold1: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:33:28] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:28] 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.6, nrounds=200 
## + Fold1: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:33:28] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:28] 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.8, nrounds=200 
## + Fold1: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:33:29] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33: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=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold1: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:33:29] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33: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=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold1: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:33:30] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:30] 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.6, nrounds=200 
## + Fold1: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:33:30] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:30] 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.8, nrounds=200 
## + Fold1: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:33:31] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33: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=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold1: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:33:31] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33: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=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold1: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:33:32] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:32] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold1: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:33:32] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:32] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold1: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:33:32] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:32] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold1: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:33:32] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:32] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold1: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:33:33] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:33] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold1: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:33:33] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:33] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold1: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:33:33] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:33] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold1: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:33:33] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:33] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold1: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:33:34] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:34] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold1: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:33:34] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:34] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold1: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:33:34] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:34] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold1: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:33:34] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:34] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold1: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:33:35] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:35] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold1: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:33:35] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:35] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold1: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:33:35] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:35] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold1: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:33:35] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:35] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold1: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold1: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:33:36] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:36] 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.6, nrounds=200 
## + Fold1: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:33:36] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:36] 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.8, nrounds=200 
## + Fold1: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:33:37] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:37] 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=2, subsample=0.6, nrounds=200 
## + Fold1: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:33:37] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:37] 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=2, subsample=0.8, nrounds=200 
## + Fold1: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:33:38] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:38] 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.6, nrounds=200 
## + Fold1: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:33:38] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:38] 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.8, nrounds=200 
## + Fold1: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:33:39] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:39] 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=2, subsample=0.6, nrounds=200 
## + Fold1: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:33:39] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:39] 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=2, subsample=0.8, nrounds=200 
## + Fold1: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:33:40] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:40] 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.6, nrounds=200 
## + Fold1: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:33:40] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:40] 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.8, nrounds=200 
## + Fold1: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:33:41] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:41] 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=2, subsample=0.6, nrounds=200 
## + Fold1: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:33:41] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:41] 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=2, subsample=0.8, nrounds=200 
## + Fold1: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:33:41] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:41] 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.6, nrounds=200 
## + Fold1: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:33:42] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:42] 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.8, nrounds=200 
## + Fold1: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:33:43] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:43] 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=2, subsample=0.6, nrounds=200 
## + Fold1: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:33:43] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:43] 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=2, subsample=0.8, nrounds=200 
## + Fold2: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:33:43] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:43] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold2: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:33:44] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:44] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold2: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:33:44] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:44] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold2: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:33:44] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:44] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold2: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:33:44] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:44] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold2: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:33:45] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:45] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold2: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:33:45] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:45] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold2: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:33:45] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:45] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold2: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:33:45] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:45] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold2: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:33:46] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:46] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold2: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:33:46] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:46] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold2: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:33:46] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:46] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold2: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:33:46] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:46] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold2: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:33:47] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:47] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold2: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:33:47] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:47] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold2: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:33:47] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:47] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold2: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:33:48] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:48] 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.6, nrounds=200 
## + Fold2: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:33:48] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:48] 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.8, nrounds=200 
## + Fold2: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:33:49] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:49] 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=2, subsample=0.6, nrounds=200 
## + Fold2: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:33:49] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:49] 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=2, subsample=0.8, nrounds=200 
## + Fold2: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:33:50] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:50] 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.6, nrounds=200 
## + Fold2: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:33:50] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:50] 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.8, nrounds=200 
## + Fold2: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:33:51] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:51] 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=2, subsample=0.6, nrounds=200 
## + Fold2: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:33:51] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:51] 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=2, subsample=0.8, nrounds=200 
## + Fold2: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:33:52] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:52] 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.6, nrounds=200 
## + Fold2: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:33:52] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:52] 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.8, nrounds=200 
## + Fold2: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:33:53] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:53] 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=2, subsample=0.6, nrounds=200 
## + Fold2: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:33:53] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:53] 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=2, subsample=0.8, nrounds=200 
## + Fold2: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:33:54] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:54] 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.6, nrounds=200 
## + Fold2: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:33:54] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:54] 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.8, nrounds=200 
## + Fold2: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:33:55] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:55] 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=2, subsample=0.6, nrounds=200 
## + Fold2: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:33:55] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:55] 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=2, subsample=0.8, nrounds=200 
## + Fold2: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:33:56] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:56] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold2: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:33:56] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:56] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold2: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:33:56] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:56] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold2: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:33:56] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:56] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold2: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:33:57] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:57] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold2: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:33:57] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:57] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold2: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:33:57] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:57] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold2: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:33:58] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:58] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold2: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:33:58] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:58] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold2: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:33:58] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:58] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold2: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:33:58] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:58] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold2: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:33:59] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:59] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold2: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:33:59] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:59] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold2: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:33:59] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:59] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold2: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:33:59] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:33:59] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold2: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:34:00] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:00] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold2: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:34:00] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:00] 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.6, nrounds=200 
## + Fold2: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:34:01] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:01] 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.8, nrounds=200 
## + Fold2: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:34:01] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:01] 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=2, subsample=0.6, nrounds=200 
## + Fold2: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:34:02] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34: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=2, subsample=0.8, nrounds=200 
## + Fold2: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:34:03] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:03] 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.6, nrounds=200 
## + Fold2: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:34:03] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:03] 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.8, nrounds=200 
## + Fold2: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:34:04] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34: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.8, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold2: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:34:04] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34: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.8, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold2: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:34:05] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:05] 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.6, nrounds=200 
## + Fold2: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:34:05] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:05] 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.8, nrounds=200 
## + Fold2: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:34:05] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:05] 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=2, subsample=0.6, nrounds=200 
## + Fold2: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:34:06] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34: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=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold2: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:34:07] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34: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=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold2: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:34:07] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34: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=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold2: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:34:08] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:08] 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=2, subsample=0.6, nrounds=200 
## + Fold2: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:34:08] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:08] 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=2, subsample=0.8, nrounds=200 
## + Fold2: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:34:08] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:08] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold2: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:34:09] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:09] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold2: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:34:09] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:09] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold2: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:34:09] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:09] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold2: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:34:09] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:09] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold2: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:34:10] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:10] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold2: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:34:10] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:10] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold2: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:34:11] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:11] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold2: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:34:12] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:12] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold2: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:34:12] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:12] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold2: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:34:12] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:12] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold2: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:34:12] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:12] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold2: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:34:13] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:13] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold2: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:34:13] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:13] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold2: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:34:14] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:14] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold2: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:34:14] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:14] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold2: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold2: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:34:15] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:15] 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.6, nrounds=200 
## + Fold2: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:34:15] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:15] 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.8, nrounds=200 
## + Fold2: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:34:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:16] 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=2, subsample=0.6, nrounds=200 
## + Fold2: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:34:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:16] 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=2, subsample=0.8, nrounds=200 
## + Fold2: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:34:17] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:17] 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.6, nrounds=200 
## + Fold2: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:34:18] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:18] 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.8, nrounds=200 
## + Fold2: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:34:18] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:18] 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=2, subsample=0.6, nrounds=200 
## + Fold2: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:34:19] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:19] 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=2, subsample=0.8, nrounds=200 
## + Fold2: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:34:20] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:20] 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.6, nrounds=200 
## + Fold2: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:34:20] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:20] 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.8, nrounds=200 
## + Fold2: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:34:21] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:21] 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=2, subsample=0.6, nrounds=200 
## + Fold2: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:34:21] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:21] 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=2, subsample=0.8, nrounds=200 
## + Fold2: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:34:22] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:22] 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.6, nrounds=200 
## + Fold2: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:34:22] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:22] 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.8, nrounds=200 
## + Fold2: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:34:23] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:23] 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=2, subsample=0.6, nrounds=200 
## + Fold2: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:34:23] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:23] 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=2, subsample=0.8, nrounds=200 
## + Fold3: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:34:24] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:24] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold3: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:34:24] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:24] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold3: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:34:24] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:24] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold3: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:34:24] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:24] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold3: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:34:24] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:24] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold3: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:34:25] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:25] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold3: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:34:25] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:25] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold3: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:34:25] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:25] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold3: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:34:26] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:26] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold3: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:34:26] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:26] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold3: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:34:26] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:26] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold3: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:34:26] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:26] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold3: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:34:27] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:27] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold3: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:34:27] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:27] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold3: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:34:27] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:27] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold3: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:34:27] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:27] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold3: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:34:28] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34: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=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold3: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:34:28] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34: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=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold3: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:34:29] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:29] 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=2, subsample=0.6, nrounds=200 
## + Fold3: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:34:29] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:29] 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=2, subsample=0.8, nrounds=200 
## + Fold3: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:34:30] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34: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=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold3: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:34:30] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34: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=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold3: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:34:31] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:31] 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=2, subsample=0.6, nrounds=200 
## + Fold3: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:34:31] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:31] 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=2, subsample=0.8, nrounds=200 
## + Fold3: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:34:32] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34: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.6, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold3: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:34:32] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34: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.6, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold3: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:34:33] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:33] 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=2, subsample=0.6, nrounds=200 
## + Fold3: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:34:33] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:33] 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=2, subsample=0.8, nrounds=200 
## + Fold3: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:34:34] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34: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=1, subsample=0.6, nrounds=200 
## + Fold3: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:34:34] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34: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=1, subsample=0.8, nrounds=200 
## + Fold3: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:34:35] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:35] 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=2, subsample=0.6, nrounds=200 
## + Fold3: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:34:35] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:35] 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=2, subsample=0.8, nrounds=200 
## + Fold3: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:34:36] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:36] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold3: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:34:36] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:36] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold3: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:34:36] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:36] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold3: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:34:37] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:37] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold3: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:34:37] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:37] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold3: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:34:37] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:37] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold3: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:34:38] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:38] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold3: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:34:38] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:38] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold3: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:34:38] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:38] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold3: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:34:38] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:38] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold3: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:34:39] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:39] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold3: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:34:39] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:39] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold3: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:34:39] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:39] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold3: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:34:40] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:40] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold3: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:34:40] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:40] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold3: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:34:40] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:40] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold3: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:34:41] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:41] 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.6, nrounds=200 
## + Fold3: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:34:41] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:41] 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.8, nrounds=200 
## + Fold3: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:34:42] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:42] 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=2, subsample=0.6, nrounds=200 
## + Fold3: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:34:42] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:42] 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=2, subsample=0.8, nrounds=200 
## + Fold3: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:34:43] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:43] 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.6, nrounds=200 
## + Fold3: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:34:43] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:43] 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.8, nrounds=200 
## + Fold3: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:34:44] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:44] 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=2, subsample=0.6, nrounds=200 
## + Fold3: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:34:44] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:44] 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=2, subsample=0.8, nrounds=200 
## + Fold3: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:34:45] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:45] 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.6, nrounds=200 
## + Fold3: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:34:45] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:45] 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.8, nrounds=200 
## + Fold3: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:34:46] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:46] 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=2, subsample=0.6, nrounds=200 
## + Fold3: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:34:46] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:46] 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=2, subsample=0.8, nrounds=200 
## + Fold3: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:34:47] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:47] 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.6, nrounds=200 
## + Fold3: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:34:47] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:47] 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.8, nrounds=200 
## + Fold3: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:34:48] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:48] 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=2, subsample=0.6, nrounds=200 
## + Fold3: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:34:48] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:48] 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=2, subsample=0.8, nrounds=200 
## + Fold3: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:34:48] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:48] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold3: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:34:49] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:49] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold3: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:34:49] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:49] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold3: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:34:49] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:49] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold3: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:34:50] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:50] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold3: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:34:50] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:50] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold3: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:34:50] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:50] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold3: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:34:50] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:50] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold3: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:34:51] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:51] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold3: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:34:51] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:51] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold3: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:34:51] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:51] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold3: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:34:51] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:51] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold3: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:34:52] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:52] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold3: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:34:52] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:52] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold3: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:34:52] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:52] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold3: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:34:52] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:52] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold3: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold3: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:34:53] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34: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=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold3: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:34:54] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:54] 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.8, nrounds=200 
## + Fold3: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:34:54] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:54] 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=2, subsample=0.6, nrounds=200 
## + Fold3: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:34:55] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34: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=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold3: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:34:55] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34: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=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold3: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:34:56] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:56] 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.8, nrounds=200 
## + Fold3: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:34:56] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:56] 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=2, subsample=0.6, nrounds=200 
## + Fold3: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:34:57] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:57] 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=2, subsample=0.8, nrounds=200 
## + Fold3: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:34:57] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:57] 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.6, nrounds=200 
## + Fold3: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:34:58] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:58] 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.8, nrounds=200 
## + Fold3: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:34:58] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:58] 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=2, subsample=0.6, nrounds=200 
## + Fold3: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:34:59] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:59] 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=2, subsample=0.8, nrounds=200 
## + Fold3: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:34:59] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:34:59] 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.6, nrounds=200 
## + Fold3: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:35:00] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:00] 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.8, nrounds=200 
## + Fold3: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:35:00] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:00] 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=2, subsample=0.6, nrounds=200 
## + Fold3: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:35:01] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:01] 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=2, subsample=0.8, nrounds=200 
## + Fold4: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:35:01] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:01] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold4: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:35:01] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:01] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold4: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:35:01] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:01] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold4: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:35:02] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:02] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold4: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:35:02] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:02] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold4: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:35:02] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:02] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold4: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:35:03] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:03] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold4: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:35:03] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:03] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold4: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:35:03] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:03] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold4: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:35:03] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:03] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold4: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:35:04] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:04] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold4: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:35:04] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:04] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold4: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:35:04] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:04] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold4: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:35:04] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:04] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold4: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:35:05] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:05] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold4: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:35:05] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:05] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold4: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:35:05] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:05] 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.6, nrounds=200 
## + Fold4: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:35:06] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:06] 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.8, nrounds=200 
## + Fold4: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:35:06] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:06] 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=2, subsample=0.6, nrounds=200 
## + Fold4: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:35:07] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:07] 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=2, subsample=0.8, nrounds=200 
## + Fold4: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:35:07] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:07] 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.6, nrounds=200 
## + Fold4: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:35:08] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:08] 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.8, nrounds=200 
## + Fold4: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:35:08] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:08] 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=2, subsample=0.6, nrounds=200 
## + Fold4: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:35:09] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:09] 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=2, subsample=0.8, nrounds=200 
## + Fold4: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:35:09] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:09] 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.6, nrounds=200 
## + Fold4: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:35:10] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35: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=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold4: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:35:10] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35: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=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold4: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:35:11] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:11] 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=2, subsample=0.8, nrounds=200 
## + Fold4: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:35:11] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:11] 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.6, nrounds=200 
## + Fold4: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:35:12] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35: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=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold4: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:35:12] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35: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=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold4: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:35:13] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:13] 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=2, subsample=0.8, nrounds=200 
## + Fold4: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:35:13] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:13] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold4: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:35:13] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:13] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold4: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:35:14] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:14] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold4: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:35:14] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:14] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold4: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:35:14] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:14] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold4: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:35:14] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:14] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold4: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:35:15] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:15] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold4: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:35:15] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:15] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold4: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:35:15] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:15] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold4: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:35:15] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:15] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold4: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:35:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold4: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:35:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold4: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:35:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold4: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:35:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:16] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold4: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:35:17] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:17] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold4: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:35:17] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:17] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold4: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:35:18] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35: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=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold4: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:35:18] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35: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=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold4: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:35:18] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35: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=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold4: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:35:19] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:19] 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=2, subsample=0.8, nrounds=200 
## + Fold4: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:35:19] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:19] 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.6, nrounds=200 
## + Fold4: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:35:20] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:20] 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.8, nrounds=200 
## + Fold4: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:35:20] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:20] 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=2, subsample=0.6, nrounds=200 
## + Fold4: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:35:21] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:21] 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=2, subsample=0.8, nrounds=200 
## + Fold4: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:35:21] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:21] 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.6, nrounds=200 
## + Fold4: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:35:22] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:22] 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.8, nrounds=200 
## + Fold4: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:35:22] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:22] 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=2, subsample=0.6, nrounds=200 
## + Fold4: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:35:23] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:23] 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=2, subsample=0.8, nrounds=200 
## + Fold4: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:35:23] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:23] 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.6, nrounds=200 
## + Fold4: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:35:24] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:24] 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.8, nrounds=200 
## + Fold4: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:35:24] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:24] 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=2, subsample=0.6, nrounds=200 
## + Fold4: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:35:25] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:25] 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=2, subsample=0.8, nrounds=200 
## + Fold4: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:35:25] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:25] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold4: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:35:25] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:25] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold4: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:35:25] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:25] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold4: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:35:26] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:26] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold4: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:35:26] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:26] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold4: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:35:26] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:26] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold4: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:35:27] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:27] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold4: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:35:27] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:27] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold4: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:35:27] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:27] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold4: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:35:27] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:27] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold4: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:35:28] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:28] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold4: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:35:28] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:28] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold4: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:35:28] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:28] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold4: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:35:28] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:28] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold4: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:35:29] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:29] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold4: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:35:29] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:29] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold4: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold4: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:35:29] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35: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.6, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold4: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:35:30] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:30] 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.8, nrounds=200 
## + Fold4: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:35:30] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:30] 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=2, subsample=0.6, nrounds=200 
## + Fold4: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:35:31] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35: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=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold4: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:35:31] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35: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=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold4: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:35:32] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35: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=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold4: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:35:32] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35: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=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold4: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:35:33] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:33] 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=2, subsample=0.8, nrounds=200 
## + Fold4: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:35:33] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:33] 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.6, nrounds=200 
## + Fold4: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:35:34] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35: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=1, subsample=0.8, nrounds=200 
## + Fold4: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:35:34] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35: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=2, subsample=0.6, nrounds=200 
## + Fold4: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:35:35] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:35] 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=2, subsample=0.8, nrounds=200 
## + Fold4: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:35:36] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35: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.8, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold4: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:35:36] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35: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.8, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold4: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:35:37] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35: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=2, subsample=0.6, nrounds=200 
## + Fold4: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:35:37] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35: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=2, subsample=0.8, nrounds=200 
## + Fold5: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:35:38] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:38] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold5: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:35:38] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:38] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold5: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:35:38] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:38] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold5: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:35:38] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:38] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold5: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:35:39] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:39] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold5: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:35:39] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:39] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold5: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:35:39] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:39] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold5: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:35:40] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:40] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold5: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:35:40] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:40] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold5: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:35:40] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:40] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold5: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:35:40] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:40] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold5: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:35:41] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:41] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold5: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:35:41] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:41] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold5: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:35:41] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:41] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold5: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:35:41] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:41] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold5: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:35:42] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:42] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.01, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold5: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:35:42] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35: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.6, nrounds=200 
## + Fold5: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:35:43] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35: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.8, nrounds=200 
## + Fold5: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:35:43] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35: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=2, subsample=0.6, nrounds=200 
## + Fold5: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:35:43] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35: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=2, subsample=0.8, nrounds=200 
## + Fold5: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:35:44] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:44] 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.6, nrounds=200 
## + Fold5: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:35:45] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35: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.8, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold5: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:35:45] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35: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.8, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold5: eta=0.01, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:35:46] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:46] 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=2, subsample=0.8, nrounds=200 
## + Fold5: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:35:46] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:46] 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.6, nrounds=200 
## + Fold5: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:35:47] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35: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=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold5: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:35:47] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35: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=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold5: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:35:47] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35: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=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold5: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:35:48] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:48] 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.6, nrounds=200 
## + Fold5: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:35:48] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:48] 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.8, nrounds=200 
## + Fold5: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:35:49] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35: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=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold5: eta=0.01, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:35:50] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:50] 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=2, subsample=0.8, nrounds=200 
## + Fold5: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:35:50] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:50] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold5: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:35:50] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:50] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold5: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:35:50] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:50] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold5: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:35:51] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:51] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold5: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:35:51] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:51] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold5: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:35:51] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:51] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold5: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:35:51] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:51] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold5: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:35:52] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:52] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold5: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:35:52] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:52] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold5: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:35:52] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:52] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold5: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:35:52] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:52] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold5: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:35:53] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:53] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold5: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:35:53] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:53] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold5: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:35:53] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:53] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold5: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:35:53] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:53] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold5: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:35:54] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:54] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.05, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold5: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:35:54] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:54] 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.6, nrounds=200 
## + Fold5: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:35:55] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35: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.6, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold5: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:35:55] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35: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.6, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold5: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:35:55] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35: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.6, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold5: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:35:56] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:56] 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.6, nrounds=200 
## + Fold5: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:35:57] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:57] 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.8, nrounds=200 
## + Fold5: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:35:57] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:57] 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=2, subsample=0.6, nrounds=200 
## + Fold5: eta=0.05, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:35:58] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:58] 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=2, subsample=0.8, nrounds=200 
## + Fold5: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:35:58] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:58] 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.6, nrounds=200 
## + Fold5: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:35:58] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:58] 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.8, nrounds=200 
## + Fold5: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:35:59] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:59] 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=2, subsample=0.6, nrounds=200 
## + Fold5: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:35:59] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:35:59] 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=2, subsample=0.8, nrounds=200 
## + Fold5: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:36:00] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:36:00] 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.6, nrounds=200 
## + Fold5: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:36:00] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:36:00] 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.8, nrounds=200 
## + Fold5: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:36:01] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:36:01] 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=2, subsample=0.6, nrounds=200 
## + Fold5: eta=0.05, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:36:01] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:36:01] 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=2, subsample=0.8, nrounds=200 
## + Fold5: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:36:02] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:36:02] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold5: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:36:02] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:36:02] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold5: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:36:02] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:36:02] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold5: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:36:02] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:36:02] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold5: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:36:03] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:36:03] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold5: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:36:03] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:36:03] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold5: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:36:03] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:36:03] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold5: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:36:03] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:36:03] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=2, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold5: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:36:04] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:36:04] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold5: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:36:04] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:36:04] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold5: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:36:04] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:36:04] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold5: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:36:04] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:36:04] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold5: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:36:05] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:36:05] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## + Fold5: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:36:05] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:36:05] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## + Fold5: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:36:05] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:36:05] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold5: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:36:05] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:36:05] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## - Fold5: eta=0.10, max_depth=2, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold5: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:36:06] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:36:06] 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.6, nrounds=200 
## + Fold5: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:36:06] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:36:06] 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.8, nrounds=200 
## + Fold5: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:36:07] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:36: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.6, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold5: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:36:07] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:36: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.6, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold5: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:36:08] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:36:08] 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.6, nrounds=200 
## + Fold5: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:36:08] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:36:08] 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.8, nrounds=200 
## + Fold5: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:36:09] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:36:09] 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=2, subsample=0.6, nrounds=200 
## + Fold5: eta=0.10, max_depth=4, gamma=0, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:36:09] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:36:09] 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=2, subsample=0.8, nrounds=200 
## + Fold5: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:36:10] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:36:10] 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.6, nrounds=200 
## + Fold5: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:36:10] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:36:10] 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.8, nrounds=200 
## + Fold5: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:36:11] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:36: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=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.6, nrounds=200 
## + Fold5: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:36:11] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:36: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=1, colsample_bytree=0.6, min_child_weight=2, subsample=0.8, nrounds=200 
## + Fold5: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.6, nrounds=200 
## [18:36:12] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:36:12] 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.6, nrounds=200 
## + Fold5: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=1, subsample=0.8, nrounds=200 
## [18:36:12] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:36:12] 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.8, nrounds=200 
## + Fold5: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.6, nrounds=200 
## [18:36:13] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:36:13] 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=2, subsample=0.6, nrounds=200 
## + Fold5: eta=0.10, max_depth=4, gamma=1, colsample_bytree=0.8, min_child_weight=2, subsample=0.8, nrounds=200 
## [18:36:13] WARNING: src/c_api/c_api.cc:935: `ntree_limit` is deprecated, use `iteration_range` instead.
## [18:36:13] 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=2, subsample=0.8, nrounds=200 
## Aggregating results
## Selecting tuning parameters
## Fitting nrounds = 200, max_depth = 2, eta = 0.05, gamma = 1, colsample_bytree = 0.6, min_child_weight = 1, subsample = 0.6 on full training set
xgb_tuned$bestTune
##    nrounds max_depth  eta gamma colsample_bytree min_child_weight subsample
## 82     200         2 0.05     1              0.6                1       0.6
# Preprocess test data the same way
test_matrix <- as.data.frame(model.matrix(~ . -1, data = test_data[, features]))

# Predict class probabilities and labels
xgb_probs <- predict(xgb_tuned, newdata = test_matrix, type = "prob")[, "Yes"]
xgb_labels <- ifelse(xgb_probs >= 0.5, 1, 0)

# Evaluate
confusionMatrix(
  as.factor(xgb_labels), 
  as.factor(test_data$label), 
  positive = "1"
)
## Confusion Matrix and Statistics
## 
##           Reference
## Prediction    0    1
##          0 1399  266
##          1  149  294
##                                           
##                Accuracy : 0.8031          
##                  95% CI : (0.7855, 0.8199)
##     No Information Rate : 0.7343          
##     P-Value [Acc > NIR] : 9.978e-14       
##                                           
##                   Kappa : 0.4594          
##                                           
##  Mcnemar's Test P-Value : 1.239e-08       
##                                           
##             Sensitivity : 0.5250          
##             Specificity : 0.9037          
##          Pos Pred Value : 0.6637          
##          Neg Pred Value : 0.8402          
##              Prevalence : 0.2657          
##          Detection Rate : 0.1395          
##    Detection Prevalence : 0.2102          
##       Balanced Accuracy : 0.7144          
##                                           
##        'Positive' Class : 1               
## 

Accuracy of Models

Logistic Model:

  • Accuracy = 0.8065

  • Sensitivity = 0.5518

  • Specificity = 0.8986

Logistic Model with adjusted threshold:

  • Accuracy = 0.7699

  • Sensitivity = 0.7911

  • Specificity = 0.7623

Decision Tree:

  • Accuracy = 0.7917

  • Sensitivity = 0.4469

  • Specificity = 0.9167

Random Forest:

  • Accuracy = 0.7965

  • Sensitivity = 0.4929

  • Specificity = 0.9063

Random Forest with Hyper Grid Params:

  • Accuracy = 0.7908

  • Sensitivity = 0.4714

  • Specificity = 0.9063

XGBoost:

  • Accuracy = 0.7894

  • Sensitivity = 0.5214

  • Specificity = 0.8863

XGBoost with Hyped Grid

  • Accuracy = 0.8031

  • Sensitivity = 0.5250

  • Specificity = 0.9037

With Logistic Regression as our best model, we analyze the predictive power on that section of outliers we saw earlier.

#get rownames (or original indices) of test_data
test_row_ids <- as.numeric(rownames(test_data))

#find which outlier indices are in test_data
outlier_test_ids <- intersect(outlier_indices, test_row_ids)

#convert to row positions within test_data
relative_rows <- match(outlier_test_ids, test_row_ids)

#subset test_data properly
outliers_in_test_data <- test_data[relative_rows, ]

#subset predictions to outlier rows in test data
log_preds_class_outliers <- log_preds_class[relative_rows]

confusionMatrix(as.factor(log_preds_class_outliers), 
                outliers_in_test_data$Churn,
                positive = 'Yes')
## Warning in confusionMatrix.default(as.factor(log_preds_class_outliers), :
## Levels are not in the same order for reference and data. Refactoring data to
## match.
## Confusion Matrix and Statistics
## 
##           Reference
## Prediction No Yes
##        No   0  27
##        Yes  0   0
##                                      
##                Accuracy : 0          
##                  95% CI : (0, 0.1277)
##     No Information Rate : 1          
##     P-Value [Acc > NIR] : 1          
##                                      
##                   Kappa : 0          
##                                      
##  Mcnemar's Test P-Value : 5.624e-07  
##                                      
##             Sensitivity :  0         
##             Specificity : NA         
##          Pos Pred Value : NA         
##          Neg Pred Value : NA         
##              Prevalence :  1         
##          Detection Rate :  0         
##    Detection Prevalence :  0         
##       Balanced Accuracy : NA         
##                                      
##        'Positive' Class : Yes        
##