From ba30364cfdc47fbf2a0f0804471104ba607ba7a2 Mon Sep 17 00:00:00 2001 From: bjaeger Date: Sat, 30 Sep 2023 13:17:45 -0400 Subject: [PATCH] about to fix pd backend api --- R/RcppExports.R | 4 +- R/orsf.R | 8 + R/orsf_pd.R | 279 +- R/orsf_predict.R | 4 + R/orsf_vi.R | 4 + orsf-output.txt | 50001 ++++++++++++++++++++++++++++++++++++++++- scratch.R | 14 +- src/Data.h | 26 + src/Forest.cpp | 81 +- src/Forest.h | 25 +- src/RcppExports.cpp | 12 +- src/Tree.cpp | 14 +- src/TreeSurvival.cpp | 1 - src/globals.h | 6 + src/orsf_oop.cpp | 21 +- 15 files changed, 50353 insertions(+), 147 deletions(-) diff --git a/R/RcppExports.R b/R/RcppExports.R index 7dc29a10..d2d5b145 100644 --- a/R/RcppExports.R +++ b/R/RcppExports.R @@ -13,7 +13,7 @@ compute_cstat_exported_uvec <- function(y, w, g, pred_is_risklike) { .Call(`_aorsf_compute_cstat_exported_uvec`, y, w, g, pred_is_risklike) } -orsf_cpp <- function(x, y, w, tree_type_R, tree_seeds, loaded_forest, lincomb_R_function, oobag_R_function, n_tree, mtry, vi_type_R, vi_max_pvalue, leaf_min_events, leaf_min_obs, split_rule_R, split_min_events, split_min_obs, split_min_stat, split_max_cuts, split_max_retry, lincomb_type_R, lincomb_eps, lincomb_iter_max, lincomb_scale, lincomb_alpha, lincomb_df_target, lincomb_ties_method, pred_mode, pred_type_R, pred_horizon, pred_aggregate, oobag, oobag_eval_type_R, oobag_eval_every, n_thread, write_forest, run_forest, verbosity) { - .Call(`_aorsf_orsf_cpp`, x, y, w, tree_type_R, tree_seeds, loaded_forest, lincomb_R_function, oobag_R_function, n_tree, mtry, vi_type_R, vi_max_pvalue, leaf_min_events, leaf_min_obs, split_rule_R, split_min_events, split_min_obs, split_min_stat, split_max_cuts, split_max_retry, lincomb_type_R, lincomb_eps, lincomb_iter_max, lincomb_scale, lincomb_alpha, lincomb_df_target, lincomb_ties_method, pred_mode, pred_type_R, pred_horizon, pred_aggregate, oobag, oobag_eval_type_R, oobag_eval_every, n_thread, write_forest, run_forest, verbosity) +orsf_cpp <- function(x, y, w, tree_type_R, tree_seeds, loaded_forest, lincomb_R_function, oobag_R_function, n_tree, mtry, vi_type_R, vi_max_pvalue, leaf_min_events, leaf_min_obs, split_rule_R, split_min_events, split_min_obs, split_min_stat, split_max_cuts, split_max_retry, lincomb_type_R, lincomb_eps, lincomb_iter_max, lincomb_scale, lincomb_alpha, lincomb_df_target, lincomb_ties_method, pred_mode, pred_type_R, pred_horizon, pred_aggregate, oobag, oobag_eval_type_R, oobag_eval_every, pd_type_R, pd_vals, pd_cols, pd_probs, n_thread, write_forest, run_forest, verbosity) { + .Call(`_aorsf_orsf_cpp`, x, y, w, tree_type_R, tree_seeds, loaded_forest, lincomb_R_function, oobag_R_function, n_tree, mtry, vi_type_R, vi_max_pvalue, leaf_min_events, leaf_min_obs, split_rule_R, split_min_events, split_min_obs, split_min_stat, split_max_cuts, split_max_retry, lincomb_type_R, lincomb_eps, lincomb_iter_max, lincomb_scale, lincomb_alpha, lincomb_df_target, lincomb_ties_method, pred_mode, pred_type_R, pred_horizon, pred_aggregate, oobag, oobag_eval_type_R, oobag_eval_every, pd_type_R, pd_vals, pd_cols, pd_probs, n_thread, write_forest, run_forest, verbosity) } diff --git a/R/orsf.R b/R/orsf.R index 8219876b..6e3c9089 100644 --- a/R/orsf.R +++ b/R/orsf.R @@ -758,6 +758,10 @@ orsf <- function(data, 'cstat' = 1, 'user' = 2), oobag_eval_every = oobag_eval_every, + pd_type_R = 0, + pd_vals = matrix(0, ncol=1, nrow=1), + pd_cols = matrix(1L, ncol=1, nrow=1), + pd_probs = c(0), n_thread = n_thread, write_forest = TRUE, run_forest = !no_fit, @@ -1129,6 +1133,10 @@ orsf_train_ <- function(object, 'cstat' = 1, 'user' = 2), oobag_eval_every = oobag_eval_every, + pd_type_R = 0, + pd_vals = matrix(0, ncol=1, nrow=1), + pd_cols = matrix(1L, ncol=1, nrow=1), + pd_probs = c(0), n_thread = get_n_thread(object), write_forest = TRUE, run_forest = TRUE, diff --git a/R/orsf_pd.R b/R/orsf_pd.R index d5606b75..c7614e12 100644 --- a/R/orsf_pd.R +++ b/R/orsf_pd.R @@ -86,6 +86,7 @@ orsf_pd_oob <- function(object, prob_values = c(0.025, 0.50, 0.975), prob_labels = c('lwr', 'medn', 'upr'), boundary_checks = TRUE, + n_thread = 1, ...){ check_dots(list(...), orsf_pd_oob) @@ -99,6 +100,7 @@ orsf_pd_oob <- function(object, prob_values = prob_values, prob_labels = prob_labels, boundary_checks = boundary_checks, + n_thread = n_thread, oobag = TRUE, type_output = 'smry') @@ -114,6 +116,7 @@ orsf_pd_inb <- function(object, prob_values = c(0.025, 0.50, 0.975), prob_labels = c('lwr', 'medn', 'upr'), boundary_checks = TRUE, + n_thread = 1, ...){ check_dots(list(...), orsf_pd_inb) @@ -132,6 +135,7 @@ orsf_pd_inb <- function(object, prob_values = prob_values, prob_labels = prob_labels, boundary_checks = boundary_checks, + n_thread = n_thread, oobag = FALSE, type_output = 'smry') @@ -149,6 +153,7 @@ orsf_pd_new <- function(object, prob_values = c(0.025, 0.50, 0.975), prob_labels = c('lwr', 'medn', 'upr'), boundary_checks = TRUE, + n_thread = 1, ...){ check_dots(list(...), orsf_pd_new) @@ -163,6 +168,7 @@ orsf_pd_new <- function(object, prob_values = prob_values, prob_labels = prob_labels, boundary_checks = boundary_checks, + n_thread = n_thread, oobag = FALSE, type_output = 'smry') @@ -192,6 +198,7 @@ orsf_ice_oob <- function(object, pred_type = 'risk', expand_grid = TRUE, boundary_checks = TRUE, + n_thread = 1, ...){ check_dots(list(...), orsf_ice_oob) @@ -203,6 +210,7 @@ orsf_ice_oob <- function(object, pred_type = pred_type, expand_grid = expand_grid, boundary_checks = boundary_checks, + n_thread = n_thread, oobag = TRUE, type_output = 'ice') @@ -216,6 +224,7 @@ orsf_ice_inb <- function(object, pred_type = 'risk', expand_grid = TRUE, boundary_checks = TRUE, + n_thread = 1, ...){ check_dots(list(...), orsf_ice_oob) @@ -232,6 +241,7 @@ orsf_ice_inb <- function(object, pred_type = pred_type, expand_grid = expand_grid, boundary_checks = boundary_checks, + n_thread = n_thread, oobag = FALSE, type_output = 'ice') @@ -247,6 +257,7 @@ orsf_ice_new <- function(object, na_action = 'fail', expand_grid = TRUE, boundary_checks = TRUE, + n_thread = 1, ...){ check_dots(list(...), orsf_ice_new) @@ -259,6 +270,7 @@ orsf_ice_new <- function(object, na_action = na_action, expand_grid = expand_grid, boundary_checks = boundary_checks, + n_thread = n_thread, oobag = FALSE, type_output = 'ice') @@ -290,9 +302,10 @@ orsf_pred_dependence <- function(object, expand_grid, prob_values = NULL, prob_labels = NULL, + boundary_checks, + n_thread, oobag, - type_output, - boundary_checks){ + type_output){ pred_horizon <- infer_pred_horizon(object, pred_horizon) @@ -310,12 +323,12 @@ orsf_pred_dependence <- function(object, pred_horizon = pred_horizon, na_action = na_action) - if(pred_type == 'mort') stop( - "mortality predictions aren't supported in partial dependence functions", - " yet. Sorry for the inconvenience - we plan on including this option", - " in a future update.", - call. = FALSE - ) + # if(pred_type == 'mort') stop( + # "mortality predictions aren't supported in partial dependence functions", + # " yet. Sorry for the inconvenience - we plan on including this option", + # " in a future update.", + # call. = FALSE + # ) if(oobag && is.null(object$data)) stop("no data were found in object. ", @@ -345,7 +358,6 @@ orsf_pred_dependence <- function(object, x_new <- prep_x_from_orsf(object, data = pd_data[cc, ]) - # the values in pred_spec need to be centered & scaled to match x_new, # which is also centered and scaled means <- get_means(object) @@ -357,50 +369,17 @@ orsf_pred_dependence <- function(object, if(is.data.frame(pred_spec)) type_input <- 'grid' - pd_fun_structure <- switch(type_input, - 'grid' = pd_grid, - 'loop' = pd_loop) - - pd_fun_predict <- switch(paste(oobag, type_output, sep = "_"), - "TRUE_ice" = pd_oob_ice, - "TRUE_smry" = pd_oob_smry, - "FALSE_ice" = pd_new_ice, - "FALSE_smry" = pd_new_smry) - - pred_type_cpp <- switch( - pred_type, - "risk" = "R", - "surv" = "S", - "chf" = "H", - "mort" = "M" - ) - - out_list <- lapply( - - X = pred_horizon, - - FUN = function(.pred_horizon){ - - pd_fun_structure(object, - x_new, - pred_spec, - .pred_horizon, - pd_fun_predict, - type_output, - prob_values, - prob_labels, - oobag, - pred_type_cpp) - - } + pd_fun <- switch(type_input, 'grid' = pd_grid, 'loop' = pd_loop) - ) + pred_type_R <- switch(pred_type, + "risk" = 1, "surv" = 2, + "chf" = 3, "mort" = 4) - names(out_list) <- as.character(pred_horizon) + browser() - out <- rbindlist(l = out_list, - fill = TRUE, - idcol = 'pred_horizon') + out <- pd_fun(object, x_new, pred_spec, pred_horizon, + type_output, prob_values, prob_labels, + n_thread, oobag, pred_type_R) out[, pred_horizon := as.numeric(pred_horizon)] @@ -452,12 +431,12 @@ pd_grid <- function(object, x_new, pred_spec, pred_horizon, - pd_fun_predict, type_output, prob_values, prob_labels, + n_thread, oobag, - pred_type_cpp){ + pred_type_R){ if(!is.data.frame(pred_spec)) pred_spec <- expand.grid(pred_spec, stringsAsFactors = TRUE) @@ -488,36 +467,109 @@ pd_grid <- function(object, x_cols <- match(names(pred_spec_new), colnames(x_new)) - pd_vals <- pd_fun_predict(forest = object$forest, - x_new_ = x_new, - x_cols_ = x_cols-1, - x_vals_ = as_matrix(pred_spec_new), - probs_ = prob_values, - time_dbl = pred_horizon, - pred_type = pred_type_cpp) - + orsf_out <- orsf_cpp(x = x_new, + y = matrix(1, ncol=2), + w = rep(1, nrow(x_new)), + tree_type_R = get_tree_type(object), + tree_seeds = get_tree_seeds(object), + loaded_forest = object$forest, + n_tree = get_n_tree(object), + mtry = get_mtry(object), + vi_type_R = 0, + vi_max_pvalue = get_vi_max_pvalue(object), + lincomb_R_function = get_f_beta(object), + oobag_R_function = get_f_oobag_eval(object), + leaf_min_events = get_leaf_min_events(object), + leaf_min_obs = get_leaf_min_obs(object), + split_rule_R = switch(get_split_rule(object), + "logrank" = 1, + "cstat" = 2), + split_min_events = get_split_min_events(object), + split_min_obs = get_split_min_obs(object), + split_min_stat = get_split_min_stat(object), + split_max_cuts = get_n_split(object), + split_max_retry = get_n_retry(object), + lincomb_type_R = switch(get_orsf_type(object), + 'fast' = 1, + 'cph' = 1, + 'random' = 2, + 'net' = 3, + 'custom' = 4), + lincomb_eps = get_cph_eps(object), + lincomb_iter_max = get_cph_iter_max(object), + lincomb_scale = get_cph_do_scale(object), + lincomb_alpha = get_net_alpha(object), + lincomb_df_target = get_net_df_target(object), + lincomb_ties_method = switch( + tolower(get_cph_method(object)), + 'breslow' = 0, + 'efron' = 1 + ), + pred_type_R = pred_type_R, + pred_mode = FALSE, + pred_aggregate = TRUE, + pred_horizon = pred_horizon, + oobag = oobag, + oobag_eval_type_R = 0, + oobag_eval_every = get_n_tree(object), + pd_type_R = switch(type_output, + "smry" = 1L, + "ice" = 2L), + pd_vals = as.matrix(pred_spec_new), + pd_cols = x_cols-1L, + pd_probs = prob_values, + n_thread = n_thread, + write_forest = FALSE, + run_forest = TRUE, + verbosity = 0) + + pd_vals <- orsf_out$pd_values if(type_output == 'smry'){ - rownames(pd_vals) <- c('mean', prob_labels) - output <- cbind(pred_spec, t(pd_vals)) - .names <- names(output) + pd_vals <- lapply(pd_vals, function(x){ + m <- matrix(x, nrow=length(pred_horizon), byrow = T) + rownames(m) <- pred_horizon + colnames(m) <- c('mean', prob_labels) + data.table(m, keep.rownames = 'pred_horizon') + }) - } - if(type_output == 'ice'){ + } else if(type_output == 'ice'){ - colnames(pd_vals) <- c('id_variable', 'pred') - pred_spec$id_variable <- seq(nrow(pred_spec)) - output <- merge(pred_spec, pd_vals, by = 'id_variable') - output$id_row <- rep(seq(nrow(x_new)), pred_horizon = nrow(pred_spec)) - ids <- c('id_variable', 'id_row') - .names <- c(ids, setdiff(names(output), ids)) + for(i in seq_along(pd_vals)){ + + pd_vals[[i]] <- matrix(pd_vals[[i]], + nrow = nrow(x_new), + ncol = length(pred_horizon)) + + colnames(pd_vals[[i]]) <- pred_horizon + + pd_vals[[i]] <- melt(as.data.table(pd_vals[[i]]), + measure.vars = seq(length(pred_horizon)), + variable.name = 'pred_horizon', + variable.factor = FALSE) + + } + + } + + pd_vals <- rbindlist(pd_vals, idcol = 'id_variable') + pred_spec$id_variable <- seq(nrow(pred_spec)) + + output <- merge(as.data.table(pred_spec), pd_vals, by = 'id_variable') + ids <- c('id_variable') + if(type_output == 'ice'){ + ids <- c(ids, 'id_row') + output[, id_row:= seq(.N), by = .(id_variable, pred_horizon)] } - as.data.table(output[, .names]) + .names <- c(ids, setdiff(names(output), ids)) + setcolorder(output, neworder = .names) + + output } @@ -540,12 +592,12 @@ pd_loop <- function(object, x_new, pred_spec, pred_horizon, - pd_fun_predict, type_output, prob_values, prob_labels, + n_thread, oobag, - pred_type_cpp){ + pred_type_R){ fi <- get_fctr_info(object) @@ -563,10 +615,8 @@ pd_loop <- function(object, if(pd_name %in% fi$cols) { pd_bind$level <- as.character(pred_spec[[i]]) + pd_new <- ref_code(pd_new, fi = fi, names_x_data = pd_name) - pd_new <- ref_code(pd_new, - fi = fi, - names_x_data = pd_name) } else { pd_bind$value <- pred_spec[[i]] @@ -577,23 +627,70 @@ pd_loop <- function(object, x_vals <- x_new[, x_cols] - - pd_vals <- pd_fun_predict(forest = object$forest, - x_new_ = x_new, - x_cols_ = x_cols-1, - x_vals_ = as.matrix(pd_new), - probs_ = prob_values, - time_dbl = pred_horizon, - pred_type = pred_type_cpp) - - - # pd_fun_predict modifies x_new by reference, so reset it. - x_new[, x_cols] <- x_vals + orsf_out <- orsf_cpp(x = x_new, + y = matrix(1, ncol=2), + w = rep(1, nrow(x_new)), + tree_type_R = get_tree_type(object), + tree_seeds = get_tree_seeds(object), + loaded_forest = object$forest, + n_tree = get_n_tree(object), + mtry = get_mtry(object), + vi_type_R = 0, + vi_max_pvalue = get_vi_max_pvalue(object), + lincomb_R_function = get_f_beta(object), + oobag_R_function = get_f_oobag_eval(object), + leaf_min_events = get_leaf_min_events(object), + leaf_min_obs = get_leaf_min_obs(object), + split_rule_R = switch(get_split_rule(object), + "logrank" = 1, + "cstat" = 2), + split_min_events = get_split_min_events(object), + split_min_obs = get_split_min_obs(object), + split_min_stat = get_split_min_stat(object), + split_max_cuts = get_n_split(object), + split_max_retry = get_n_retry(object), + lincomb_type_R = switch(get_orsf_type(object), + 'fast' = 1, + 'cph' = 1, + 'random' = 2, + 'net' = 3, + 'custom' = 4), + lincomb_eps = get_cph_eps(object), + lincomb_iter_max = get_cph_iter_max(object), + lincomb_scale = get_cph_do_scale(object), + lincomb_alpha = get_net_alpha(object), + lincomb_df_target = get_net_df_target(object), + lincomb_ties_method = switch( + tolower(get_cph_method(object)), + 'breslow' = 0, + 'efron' = 1 + ), + pred_type_R = 1, + pred_mode = TRUE, + pred_aggregate = TRUE, + pred_horizon = pred_horizon, + oobag = FALSE, + oobag_eval_type_R = 0, + oobag_eval_every = get_n_tree(object), + pd_type_R = 1, + pd_vals = as.matrix(pd_new), + pd_cols = x_cols-1L, + pd_probs = prob_values, + n_thread = n_thread, + write_forest = FALSE, + run_forest = TRUE, + verbosity = 0) + + pd_vals <- orsf_out$pd_values if(type_output == 'smry'){ - rownames(pd_vals) <- c('mean', prob_labels) - output[[i]] <- cbind(pd_bind, t(pd_vals)) + output[[i]] <- lapply(pd_vals, function(x){ + m <- matrix(x, nrow=length(pred_horizon), byrow = T) + rownames(m) <- pred_horizon + colnames(m) <- c('mean', prob_labels) + data.table(m, keep.rownames = 'pred_horizon') + }) } diff --git a/R/orsf_predict.R b/R/orsf_predict.R index 597d5323..5ecfa2e6 100644 --- a/R/orsf_predict.R +++ b/R/orsf_predict.R @@ -212,6 +212,10 @@ predict.orsf_fit <- function(object, oobag = FALSE, oobag_eval_type_R = 0, oobag_eval_every = get_n_tree(object), + pd_type_R = 0, + pd_vals = matrix(0, ncol=1, nrow=1), + pd_cols = matrix(1L, ncol=1, nrow=1), + pd_probs = c(0), n_thread = n_thread, write_forest = FALSE, run_forest = TRUE, diff --git a/R/orsf_vi.R b/R/orsf_vi.R index 48296edb..588a18b0 100644 --- a/R/orsf_vi.R +++ b/R/orsf_vi.R @@ -347,6 +347,10 @@ orsf_vi_oobag_ <- function(object, 'cstat' = 1, 'user' = 2), oobag_eval_every = get_n_tree(object), + pd_type_R = 0, + pd_vals = matrix(0, ncol=1, nrow=1), + pd_cols = matrix(1L, ncol=1, nrow=1), + pd_probs = c(0), n_thread = n_thread, write_forest = FALSE, run_forest = TRUE, diff --git a/orsf-output.txt b/orsf-output.txt index 1d41de3a..cf674887 100644 --- a/orsf-output.txt +++ b/orsf-output.txt @@ -3,4 +3,50003 @@ N observations total: 276 N columns total: 18 ----------------------------------------------- -Called from: orsf_vi_oobag_(object, type_vi, oobag_fun, n_thread, verbose_progress) +------------ Growing tree 0 -------------- + +- N obs inbag: 276 +- N row inbag: 176 +- max nodes: 221 +- max leaves: 111 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 5 11 12 17 8 + + + -- linear combo weights (showing up to 5) + + -0.1728 0.6490 0.0973 0.5518 1.8993 + + + -- cutpoint (score) + --- 0.0633776 (0.626764), N = 210 moving right + --- 0.542377 (0.692298), N = 157 moving right + --- 0.793609 (0.728298), N = 132 moving right + --- 4.19107 (0.645468), N = 29 moving right + --- 8.89887 (0.559762), N = 10 moving right + + -- best stat: 0.728298, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 14 15 2 1 12 + + + -- linear combo weights (showing up to 5) + + 0.4715 -0.2312 -0.2531 0.3180 0.2413 + + + -- cutpoint (score) + --- -1.35425 (0.506099), N = 268 moving right + --- -1.00364 (0.549951), N = 239 moving right + --- -0.696911 (0.587501), N = 206 moving right + --- -0.0084199 (0.630701), N = 89 moving right + --- 0.0164788 (0.647263), N = 83 moving right + + -- best stat: 0.647263, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 1 16 8 3 6 + + + -- linear combo weights (showing up to 5) + + 0.2925 0.5530 1.9470 6.4495 0.1508 + + + -- cutpoint (score) + --- -1.55241 (0.553582), N = 240 moving right + --- -1.24429 (0.63784), N = 189 moving right + --- 0.125477 (0.766215), N = 66 moving right + --- 0.650189 (0.729053), N = 53 moving right + --- 4.44114 (0.620645), N = 21 moving right + + -- best stat: 0.766215, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 3.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 3.0000e+00 + 1.4000e+02 1.0000e+00 3.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.7000e+01 9.8551e-01 1.4532e-02 + 1.1000e+02 9.8188e-01 1.8209e-02 + 1.3100e+02 9.7101e-01 2.9279e-02 + 1.4000e+02 9.6014e-01 4.0473e-02 + + +------------ Growing tree 1 -------------- + +- N obs inbag: 276 +- N row inbag: 183 +- max nodes: 191 +- max leaves: 96 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 16 8 11 15 1 + + + -- linear combo weights (showing up to 5) + + 0.3634 1.6006 0.6899 -0.1448 0.5812 + + + -- cutpoint (score) + --- -0.809193 (0.743664), N = 128 moving right + --- -0.51338 (0.766672), N = 113 moving right + --- 0.139177 (0.786433), N = 78 moving right + --- 1.53763 (0.70115), N = 40 moving right + --- 1.75609 (0.698625), N = 37 moving right + + -- best stat: 0.786433, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 10 15 6 14 4 + + + -- linear combo weights (showing up to 5) + + -0.6544 -0.3663 0.7392 0.3114 0.6561 + + + -- cutpoint (score) + --- -1.04805 (0.534639), N = 248 moving right + --- -0.116617 (0.631766), N = 173 moving right + --- 0.259743 (0.693424), N = 126 moving right + --- 0.736355 (0.69924), N = 91 moving right + --- 1.16021 (0.705204), N = 56 moving right + + -- best stat: 0.705204, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 11 7 4 6 8 + + + -- linear combo weights (showing up to 5) + + 0.5597 8.7210 0.3050 0.9665 1.1989 + + + -- cutpoint (score) + --- -1.12522 (0.547926), N = 253 moving right + --- -0.969457 (0.588997), N = 235 moving right + --- -0.746868 (0.667976), N = 193 moving right + --- 0.914555 (0.740969), N = 58 moving right + --- 2.38452 (0.66407), N = 31 moving right + + -- best stat: 0.740969, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.1000e+01 9.8913e-01 1.0909e-02 + 1.1000e+02 9.8551e-01 1.4572e-02 + 1.3100e+02 9.8188e-01 1.8249e-02 + + +------------ Growing tree 2 -------------- + +- N obs inbag: 276 +- N row inbag: 180 +- max nodes: 223 +- max leaves: 112 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 4 7 12 11 5 + + + -- linear combo weights (showing up to 5) + + 0.6999 5.2771 -0.0027 0.7344 0.2407 + + + -- cutpoint (score) + --- -0.571545 (0.561338), N = 244 moving right + --- -0.404844 (0.603741), N = 224 moving right + --- -0.403979 (0.607831), N = 221 moving right + --- 0.220441 (0.702489), N = 162 moving right + --- 1.42339 (0.681806), N = 54 moving right + + -- best stat: 0.702489, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 10 13 1 0 17 + + + -- linear combo weights (showing up to 5) + + -0.5573 0.6082 0.4316 -0.1411 0.6657 + + + -- cutpoint (score) + --- 1.09637 (0.619488), N = 205 moving right + --- 1.35616 (0.65805), N = 182 moving right + --- 1.80093 (0.694308), N = 141 moving right + --- 2.73813 (0.674816), N = 75 moving right + --- 4.37012 (0.587802), N = 18 moving right + + -- best stat: 0.694308, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 3 15 10 9 7 + + + -- linear combo weights (showing up to 5) + + 8.6528 -0.1085 -0.5179 0.3727 1.9583 + + + -- cutpoint (score) + --- -0.727443 (0.56587), N = 245 moving right + --- -0.320913 (0.64455), N = 186 moving right + --- -0.286118 (0.648564), N = 180 moving right + --- -0.0839571 (0.671685), N = 148 moving right + --- 0.154953 (0.699839), N = 107 moving right + + -- best stat: 0.699839, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 3.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 3.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 4.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.8913e-01 1.0870e-02 + 5.1000e+01 9.8188e-01 1.8196e-02 + 7.1000e+01 9.7826e-01 2.1886e-02 + 1.1000e+02 9.6739e-01 3.2997e-02 + 1.3100e+02 9.6014e-01 4.0487e-02 + + +------------ Growing tree 3 -------------- + +- N obs inbag: 276 +- N row inbag: 183 +- max nodes: 215 +- max leaves: 108 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 5 15 14 3 16 + + + -- linear combo weights (showing up to 5) + + 1.5696 -0.1365 0.5067 10.9953 0.2896 + + + -- cutpoint (score) + --- -0.334336 (0.619977), N = 208 moving right + --- -0.269932 (0.634439), N = 196 moving right + --- -0.242301 (0.635194), N = 194 moving right + --- 1.12211 (0.674581), N = 76 moving right + --- 11.5385 (0.572941), N = 11 moving right + + -- best stat: 0.674581, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 16 0 10 1 5 + + + -- linear combo weights (showing up to 5) + + 0.5984 -0.3501 -0.7175 0.3394 1.4672 + + + -- cutpoint (score) + --- -0.648535 (0.621058), N = 195 moving right + --- -0.313275 (0.692184), N = 156 moving right + --- 0.403859 (0.72072), N = 103 moving right + --- 1.03673 (0.700241), N = 66 moving right + --- 1.15915 (0.6961), N = 64 moving right + + -- best stat: 0.72072, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 5 11 2 7 10 + + + -- linear combo weights (showing up to 5) + + 1.0566 1.0459 -1.0342 6.7354 -0.5043 + + + -- cutpoint (score) + --- -1.69204 (0.618794), N = 203 moving right + --- -1.65011 (0.63554), N = 194 moving right + --- -0.318106 (0.765349), N = 94 moving right + --- 0.440427 (0.720618), N = 56 moving right + --- 1.16793 (0.691347), N = 39 moving right + + -- best stat: 0.765349, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.7000e+01 9.8913e-01 1.0909e-02 + 1.1000e+02 9.8188e-01 1.8235e-02 + 1.3100e+02 9.7464e-01 2.5615e-02 + + +------------ Growing tree 4 -------------- + +- N obs inbag: 276 +- N row inbag: 174 +- max nodes: 237 +- max leaves: 119 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 11 8 16 15 12 + + + -- linear combo weights (showing up to 5) + + 0.9424 1.2595 0.4228 -0.1425 -0.0317 + + + -- cutpoint (score) + --- -1.56121 (0.578621), N = 241 moving right + --- -1.48773 (0.601466), N = 231 moving right + --- -1.17138 (0.684644), N = 185 moving right + --- 0.888778 (0.703417), N = 65 moving right + --- 1.65486 (0.645412), N = 37 moving right + + -- best stat: 0.703417, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 10 5 7 3 15 + + + -- linear combo weights (showing up to 5) + + -0.2052 0.8500 8.0901 4.0107 -0.0557 + + + -- cutpoint (score) + --- -0.401471 (0.500659), N = 271 moving right + --- -0.0855714 (0.619754), N = 195 moving right + --- -0.0527609 (0.644093), N = 184 moving right + --- 0.142662 (0.660635), N = 117 moving right + --- 9.29084 (0.570825), N = 14 moving right + + -- best stat: 0.660635, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 13 10 5 2 6 + + + -- linear combo weights (showing up to 5) + + 0.5681 -0.5513 1.0503 -0.8453 0.6270 + + + -- cutpoint (score) + --- -2.15764 (0.520848), N = 265 moving right + --- -1.74204 (0.553914), N = 251 moving right + --- -0.927467 (0.67615), N = 191 moving right + --- -0.893648 (0.687747), N = 185 moving right + --- -0.797912 (0.687127), N = 179 moving right + + -- best stat: 0.687747, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + 3.0400e+02 1.0000e+00 4.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 7.7000e+01 9.9638e-01 3.6232e-03 + 1.1000e+02 9.9275e-01 7.2596e-03 + 1.3100e+02 9.8551e-01 1.4559e-02 + 1.7900e+02 9.7826e-01 2.1912e-02 + 1.9800e+02 9.7464e-01 2.5615e-02 + + +------------ Growing tree 5 -------------- + +- N obs inbag: 276 +- N row inbag: 172 +- max nodes: 211 +- max leaves: 106 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 13 15 4 6 12 + + + -- linear combo weights (showing up to 5) + + 0.5493 -0.1577 1.2256 1.4185 0.0383 + + + -- cutpoint (score) + --- -0.295861 (0.602675), N = 217 moving right + --- -0.26266 (0.605977), N = 216 moving right + --- 0.470285 (0.674014), N = 146 moving right + --- 0.946335 (0.711744), N = 112 moving right + --- 1.1288 (0.729726), N = 85 moving right + + -- best stat: 0.729726, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 8 12 4 3 1 + + + -- linear combo weights (showing up to 5) + + 2.3378 0.0312 0.3236 3.4180 0.3213 + + + -- cutpoint (score) + --- -0.836964 (0.710103), N = 154 moving right + --- -0.643029 (0.744637), N = 134 moving right + --- -0.0193194 (0.772272), N = 90 moving right + --- 1.18956 (0.721418), N = 60 moving right + --- 4.53294 (0.621751), N = 24 moving right + + -- best stat: 0.772272, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 14 6 5 16 7 + + + -- linear combo weights (showing up to 5) + + 0.1883 0.9643 0.2945 0.3738 16.4346 + + + -- cutpoint (score) + --- -0.377641 (0.552494), N = 246 moving right + --- -0.321667 (0.591655), N = 227 moving right + --- 0.152074 (0.704425), N = 105 moving right + --- 0.318113 (0.68312), N = 75 moving right + --- 1.19052 (0.622255), N = 33 moving right + + -- best stat: 0.704425, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 4.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + 3.3400e+02 1.0000e+00 1.0000e+00 + 3.4800e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.8551e-01 1.4559e-02 + 1.3100e+02 9.7101e-01 2.9265e-02 + 1.7900e+02 9.6377e-01 3.6728e-02 + + +------------ Growing tree 6 -------------- + +- N obs inbag: 276 +- N row inbag: 169 +- max nodes: 229 +- max leaves: 115 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 7 17 12 6 16 + + + -- linear combo weights (showing up to 5) + + 7.0646 0.4500 0.0648 1.0795 0.4063 + + + -- cutpoint (score) + --- 0.615486 (0.570094), N = 242 moving right + --- 1.41932 (0.701384), N = 133 moving right + --- 1.48675 (0.707543), N = 117 moving right + --- 1.57088 (0.713323), N = 109 moving right + --- 2.0304 (0.662147), N = 67 moving right + + -- best stat: 0.713323, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 4 3 8 0 5 + + + -- linear combo weights (showing up to 5) + + 0.1273 4.6380 1.4565 -0.2109 0.6830 + + + -- cutpoint (score) + --- -0.675415 (0.683205), N = 182 moving right + --- 0.0526431 (0.725062), N = 107 moving right + --- 0.306533 (0.729862), N = 92 moving right + --- 1.38279 (0.659547), N = 46 moving right + --- 8.04336 (0.533637), N = 6 moving right + + -- best stat: 0.729862, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 6 3 13 8 15 + + + -- linear combo weights (showing up to 5) + + 1.4594 4.4279 0.0234 1.5610 -0.0653 + + + -- cutpoint (score) + --- -0.89583 (0.584933), N = 222 moving right + --- -0.740127 (0.668607), N = 172 moving right + --- -0.0503273 (0.722182), N = 110 moving right + --- 0.538709 (0.702924), N = 79 moving right + --- 0.604699 (0.696564), N = 73 moving right + + -- best stat: 0.722182, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 3.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 4.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.1000e+01 9.8188e-01 1.8208e-02 + 1.1000e+02 9.7826e-01 2.1898e-02 + 1.4000e+02 9.7464e-01 2.5602e-02 + + +------------ Growing tree 7 -------------- + +- N obs inbag: 276 +- N row inbag: 175 +- max nodes: 205 +- max leaves: 103 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 8 2 17 7 12 + + + -- linear combo weights (showing up to 5) + + 1.8706 -1.0753 0.2433 7.6455 0.1741 + + + -- cutpoint (score) + --- -1.8191 (0.534697), N = 255 moving right + --- -1.48063 (0.631591), N = 204 moving right + --- -1.24738 (0.711989), N = 163 moving right + --- -0.619971 (0.799899), N = 111 moving right + --- 0.56899 (0.749379), N = 66 moving right + + -- best stat: 0.799899, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 0 4 5 2 11 + + + -- linear combo weights (showing up to 5) + + 0.1431 0.5162 0.6976 -0.3648 1.0675 + + + -- cutpoint (score) + --- -0.910018 (0.601145), N = 213 moving right + --- 0.212722 (0.729348), N = 110 moving right + --- 0.265038 (0.70877), N = 100 moving right + --- 0.537402 (0.691537), N = 74 moving right + --- 0.549496 (0.696777), N = 71 moving right + + -- best stat: 0.729348, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 5 16 17 4 9 + + + -- linear combo weights (showing up to 5) + + 0.6296 0.4457 0.5482 0.2123 0.7121 + + + -- cutpoint (score) + --- 0.694248 (0.56224), N = 246 moving right + --- 1.2021 (0.649455), N = 189 moving right + --- 2.123 (0.728191), N = 115 moving right + --- 2.16793 (0.733199), N = 102 moving right + --- 2.29842 (0.721731), N = 95 moving right + + -- best stat: 0.733199, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 3.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 3.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.3400e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9275e-01 7.2464e-03 + 7.1000e+01 9.8913e-01 1.0896e-02 + 1.4000e+02 9.7826e-01 2.1885e-02 + 1.8600e+02 9.7464e-01 2.5589e-02 + 1.9100e+02 9.7101e-01 2.9306e-02 + + +------------ Growing tree 8 -------------- + +- N obs inbag: 276 +- N row inbag: 174 +- max nodes: 195 +- max leaves: 98 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 6 8 10 4 14 + + + -- linear combo weights (showing up to 5) + + 0.3840 1.4714 -0.6031 0.1492 0.0631 + + + -- cutpoint (score) + --- -1.57313 (0.514768), N = 258 moving right + --- -1.57019 (0.520264), N = 255 moving right + --- -0.338871 (0.716823), N = 127 moving right + --- 0.531566 (0.680518), N = 60 moving right + --- 0.54257 (0.676452), N = 59 moving right + + -- best stat: 0.716823, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 6 16 3 11 9 + + + -- linear combo weights (showing up to 5) + + -0.1411 0.6264 8.6308 0.8146 0.2100 + + + -- cutpoint (score) + --- -1.15383 (0.559584), N = 238 moving right + --- -0.78745 (0.637891), N = 194 moving right + --- -0.599703 (0.702324), N = 162 moving right + --- -0.536374 (0.720554), N = 154 moving right + --- 0.782636 (0.732194), N = 65 moving right + + -- best stat: 0.732194, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 3 17 2 12 7 + + + -- linear combo weights (showing up to 5) + + 9.4131 0.4623 -1.2912 0.1780 4.3712 + + + -- cutpoint (score) + --- -0.369568 (0.603083), N = 223 moving right + --- -0.326835 (0.593253), N = 221 moving right + --- -0.0178523 (0.621113), N = 202 moving right + --- -0.00287891 (0.643387), N = 190 moving right + --- 1.72479 (0.624196), N = 33 moving right + + -- best stat: 0.643387, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 3.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.7000e+01 9.9275e-01 7.2596e-03 + 1.1000e+02 9.8913e-01 1.0909e-02 + 1.4000e+02 9.8188e-01 1.8235e-02 + 1.7900e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 9 -------------- + +- N obs inbag: 276 +- N row inbag: 169 +- max nodes: 243 +- max leaves: 122 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 14 11 16 9 15 + + + -- linear combo weights (showing up to 5) + + 0.2575 1.0257 1.0247 0.1915 0.0453 + + + -- cutpoint (score) + --- -1.55313 (0.55522), N = 242 moving right + --- 0.121693 (0.764362), N = 97 moving right + --- 0.19601 (0.739544), N = 91 moving right + --- 0.647938 (0.728496), N = 74 moving right + --- 1.67872 (0.632832), N = 39 moving right + + -- best stat: 0.764362, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 13 5 7 15 0 + + + -- linear combo weights (showing up to 5) + + 0.2702 0.8126 12.3577 0.0638 -0.0707 + + + -- cutpoint (score) + --- -0.236559 (0.56031), N = 223 moving right + --- 0.186016 (0.63666), N = 110 moving right + --- 0.333412 (0.629123), N = 93 moving right + --- 0.469259 (0.658302), N = 77 moving right + --- 12.924 (0.557311), N = 9 moving right + + -- best stat: 0.658302, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 12 8 15 3 4 + + + -- linear combo weights (showing up to 5) + + 0.1567 1.7551 0.0109 5.6711 0.1573 + + + -- cutpoint (score) + --- -1.03873 (0.588147), N = 230 moving right + --- -1.02991 (0.603358), N = 223 moving right + --- -1.0098 (0.615511), N = 215 moving right + --- 0.483785 (0.688999), N = 61 moving right + --- 4.89236 (0.59809), N = 19 moving right + + -- best stat: 0.688999, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 3.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + 3.3400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.9275e-01 7.2596e-03 + 1.4000e+02 9.8913e-01 1.0909e-02 + 1.7900e+02 9.8188e-01 1.8235e-02 + 1.8600e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 10 -------------- + +- N obs inbag: 276 +- N row inbag: 174 +- max nodes: 235 +- max leaves: 118 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 13 1 12 9 2 + + + -- linear combo weights (showing up to 5) + + 0.7386 0.5279 0.0515 0.1480 -0.0678 + + + -- cutpoint (score) + --- -0.822258 (0.576182), N = 234 moving right + --- -0.536695 (0.664455), N = 178 moving right + --- 0.147411 (0.683161), N = 104 moving right + --- 0.413265 (0.663563), N = 73 moving right + --- 0.79116 (0.600081), N = 45 moving right + + -- best stat: 0.683161, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 17 9 13 14 10 + + + -- linear combo weights (showing up to 5) + + 0.4692 0.0180 0.6402 0.3782 -0.7598 + + + -- cutpoint (score) + --- 1.16616 (0.716738), N = 131 moving right + --- 1.50975 (0.704971), N = 111 moving right + --- 1.92804 (0.660296), N = 71 moving right + --- 2.03224 (0.658146), N = 60 moving right + --- 3.33269 (0.612741), N = 23 moving right + + -- best stat: 0.716738, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 2 6 4 15 8 + + + -- linear combo weights (showing up to 5) + + -0.3272 1.1970 0.4627 -0.0633 1.8368 + + + -- cutpoint (score) + --- -1.34629 (0.587929), N = 227 moving right + --- -0.950182 (0.655102), N = 178 moving right + --- -0.909367 (0.658957), N = 176 moving right + --- 0.547474 (0.692717), N = 61 moving right + --- 1.92079 (0.600325), N = 30 moving right + + -- best stat: 0.692717, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 3.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.8913e-01 1.0870e-02 + 7.1000e+01 9.8551e-01 1.4533e-02 + 1.4000e+02 9.8188e-01 1.8209e-02 + 1.8600e+02 9.7826e-01 2.1899e-02 + 1.9800e+02 9.7464e-01 2.5603e-02 + + +------------ Growing tree 11 -------------- + +- N obs inbag: 276 +- N row inbag: 174 +- max nodes: 243 +- max leaves: 122 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 14 3 6 8 9 + + + -- linear combo weights (showing up to 5) + + -0.2602 4.4554 -0.0835 1.8522 0.0888 + + + -- cutpoint (score) + --- -0.929322 (0.613807), N = 195 moving right + --- -0.843609 (0.669756), N = 168 moving right + --- -0.819948 (0.686745), N = 160 moving right + --- -0.759643 (0.717248), N = 140 moving right + --- 2.9977 (0.641994), N = 30 moving right + + -- best stat: 0.717248, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 10 16 17 1 2 + + + -- linear combo weights (showing up to 5) + + -0.6945 0.2949 0.6471 0.3546 -0.1916 + + + -- cutpoint (score) + --- 0.107888 (0.541025), N = 255 moving right + --- 0.877192 (0.641724), N = 199 moving right + --- 2.15002 (0.72163), N = 91 moving right + --- 2.73015 (0.701765), N = 61 moving right + --- 3.04286 (0.692807), N = 48 moving right + + -- best stat: 0.72163, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 13 5 3 2 16 + + + -- linear combo weights (showing up to 5) + + 0.5650 0.7837 5.5795 -0.2430 0.2664 + + + -- cutpoint (score) + --- -0.782752 (0.601104), N = 220 moving right + --- -0.356838 (0.655122), N = 179 moving right + --- -0.101535 (0.683019), N = 142 moving right + --- 0.527807 (0.651859), N = 62 moving right + --- 1.17591 (0.618286), N = 29 moving right + + -- best stat: 0.683019, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + 3.3400e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.9275e-01 7.2596e-03 + 7.7000e+01 9.8913e-01 1.0909e-02 + 1.3100e+02 9.8188e-01 1.8235e-02 + 1.9100e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 12 -------------- + +- N obs inbag: 276 +- N row inbag: 177 +- max nodes: 195 +- max leaves: 98 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 15 3 6 8 9 + + + -- linear combo weights (showing up to 5) + + -0.1870 17.2654 -0.0744 1.5829 -0.0362 + + + -- cutpoint (score) + --- -0.793595 (0.658176), N = 179 moving right + --- -0.771735 (0.656928), N = 177 moving right + --- -0.666194 (0.715247), N = 146 moving right + --- -0.127167 (0.771555), N = 88 moving right + --- 0.20565 (0.723244), N = 60 moving right + + -- best stat: 0.771555, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 3 10 8 4 14 + + + -- linear combo weights (showing up to 5) + + 17.1026 -0.4462 1.3392 0.5202 0.0798 + + + -- cutpoint (score) + --- -1.0353 (0.549466), N = 246 moving right + --- -0.812965 (0.608987), N = 221 moving right + --- -0.677157 (0.653738), N = 192 moving right + --- -0.532128 (0.684897), N = 176 moving right + --- 0.76854 (0.748139), N = 56 moving right + + -- best stat: 0.748139, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 14 4 15 13 16 + + + -- linear combo weights (showing up to 5) + + 0.5042 0.6065 -0.1345 0.5205 0.8378 + + + -- cutpoint (score) + --- -1.1197 (0.568027), N = 237 moving right + --- -0.790468 (0.628149), N = 211 moving right + --- 0.364668 (0.749896), N = 119 moving right + --- 0.382215 (0.737645), N = 117 moving right + --- 0.926787 (0.734478), N = 76 moving right + + -- best stat: 0.749896, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.1000e+01 9.8551e-01 1.4559e-02 + 7.7000e+01 9.7826e-01 2.1912e-02 + 1.1000e+02 9.7464e-01 2.5616e-02 + + +------------ Growing tree 13 -------------- + +- N obs inbag: 276 +- N row inbag: 172 +- max nodes: 225 +- max leaves: 113 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 0 15 6 9 7 + + + -- linear combo weights (showing up to 5) + + 0.0219 -0.1606 2.0807 0.4418 16.0532 + + + -- cutpoint (score) + --- 0.0598248 (0.68723), N = 119 moving right + --- 0.255481 (0.68498), N = 75 moving right + --- 1.11562 (0.655572), N = 45 moving right + --- 1.72544 (0.626543), N = 38 moving right + --- 1.73307 (0.629706), N = 37 moving right + + -- best stat: 0.68723, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 0 13 10 2 15 + + + -- linear combo weights (showing up to 5) + + -0.1041 0.3582 -0.6897 -0.4612 -0.0843 + + + -- cutpoint (score) + --- -0.665722 (0.651272), N = 169 moving right + --- -0.0391143 (0.616562), N = 79 moving right + --- 0.299017 (0.593971), N = 35 moving right + --- 0.523078 (0.591164), N = 31 moving right + --- 1.11075 (0.55358), N = 13 moving right + + -- best stat: 0.651272, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 12 14 13 10 17 + + + -- linear combo weights (showing up to 5) + + 0.0234 0.4126 0.2296 -0.6279 0.5880 + + + -- cutpoint (score) + --- 1.12086 (0.606737), N = 203 moving right + --- 1.44229 (0.672348), N = 177 moving right + --- 1.59596 (0.696453), N = 162 moving right + --- 1.94182 (0.668137), N = 121 moving right + --- 3.0725 (0.611772), N = 34 moving right + + -- best stat: 0.696453, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 3.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 3.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + 3.8800e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.7000e+01 9.9275e-01 7.2596e-03 + 1.4000e+02 9.8188e-01 1.8208e-02 + 1.7900e+02 9.7464e-01 2.5589e-02 + 1.8600e+02 9.7101e-01 2.9306e-02 + + +------------ Growing tree 14 -------------- + +- N obs inbag: 276 +- N row inbag: 169 +- max nodes: 215 +- max leaves: 108 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 6 9 16 0 11 + + + -- linear combo weights (showing up to 5) + + 1.7906 0.1268 0.9435 0.3026 1.1052 + + + -- cutpoint (score) + --- -1.18452 (0.592207), N = 214 moving right + --- -0.63848 (0.678821), N = 168 moving right + --- -0.00329135 (0.745526), N = 121 moving right + --- 0.107908 (0.742573), N = 113 moving right + --- 4.23605 (0.556416), N = 7 moving right + + -- best stat: 0.745526, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 8 17 4 14 12 + + + -- linear combo weights (showing up to 5) + + 1.5818 0.5831 -0.0077 -0.1987 0.3899 + + + -- cutpoint (score) + --- 0.309107 (0.567936), N = 239 moving right + --- 0.364191 (0.575966), N = 236 moving right + --- 0.868382 (0.688484), N = 180 moving right + --- 0.932338 (0.719376), N = 166 moving right + --- 1.60594 (0.759328), N = 111 moving right + + -- best stat: 0.759328, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 0 12 2 11 1 + + + -- linear combo weights (showing up to 5) + + 0.3657 0.3100 0.0608 1.1982 0.4339 + + + -- cutpoint (score) + --- -0.746351 (0.617327), N = 224 moving right + --- -0.418502 (0.679111), N = 183 moving right + --- -0.127306 (0.730248), N = 133 moving right + --- 1.4096 (0.707185), N = 50 moving right + --- 2.04015 (0.605695), N = 30 moving right + + -- best stat: 0.730248, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 3.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 3.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.1000e+01 9.7826e-01 2.1885e-02 + 7.7000e+01 9.7464e-01 2.5589e-02 + 1.1000e+02 9.7101e-01 2.9306e-02 + + +------------ Growing tree 15 -------------- + +- N obs inbag: 276 +- N row inbag: 168 +- max nodes: 215 +- max leaves: 108 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 14 5 1 12 2 + + + -- linear combo weights (showing up to 5) + + 0.4110 1.2865 0.4575 0.3270 -2.0506 + + + -- cutpoint (score) + --- -2.28365 (0.62663), N = 195 moving right + --- -1.80056 (0.732981), N = 142 moving right + --- -1.23659 (0.73188), N = 107 moving right + --- -0.444395 (0.672354), N = 68 moving right + --- 0.175458 (0.558975), N = 24 moving right + + -- best stat: 0.732981, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 13 4 0 1 5 + + + -- linear combo weights (showing up to 5) + + 0.2116 1.1143 0.0154 0.6234 0.8043 + + + -- cutpoint (score) + --- 0.00630003 (0.626799), N = 204 moving right + --- 0.0997701 (0.646931), N = 196 moving right + --- 0.624655 (0.698201), N = 151 moving right + --- 0.839515 (0.706964), N = 135 moving right + --- 1.28077 (0.720745), N = 91 moving right + + -- best stat: 0.720745, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 6 7 14 4 17 + + + -- linear combo weights (showing up to 5) + + -0.0724 9.8963 0.5469 0.9964 0.1208 + + + -- cutpoint (score) + --- -0.277538 (0.522989), N = 260 moving right + --- 0.677438 (0.666765), N = 161 moving right + --- 1.24178 (0.719285), N = 103 moving right + --- 1.25062 (0.716025), N = 101 moving right + --- 1.36744 (0.712616), N = 80 moving right + + -- best stat: 0.719285, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 3.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 3.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + 3.3400e+02 1.0000e+00 2.0000e+00 + 4.0000e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9275e-01 7.2464e-03 + 7.7000e+01 9.8188e-01 1.8195e-02 + 1.7900e+02 9.7826e-01 2.1885e-02 + 1.8600e+02 9.7101e-01 2.9293e-02 + 1.9100e+02 9.6014e-01 4.0487e-02 + + +------------ Growing tree 16 -------------- + +- N obs inbag: 276 +- N row inbag: 171 +- max nodes: 195 +- max leaves: 98 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 2 4 3 11 15 + + + -- linear combo weights (showing up to 5) + + 0.2974 1.5373 8.6419 0.8081 0.0894 + + + -- cutpoint (score) + --- -0.368845 (0.544374), N = 254 moving right + --- 0.076787 (0.698195), N = 170 moving right + --- 1.21853 (0.750966), N = 120 moving right + --- 3.15298 (0.653973), N = 31 moving right + --- 10.7534 (0.543202), N = 8 moving right + + -- best stat: 0.750966, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 1 8 7 3 2 + + + -- linear combo weights (showing up to 5) + + 0.4811 1.6791 18.6178 1.8044 -0.1808 + + + -- cutpoint (score) + --- -1.00209 (0.684503), N = 160 moving right + --- -0.546644 (0.80135), N = 98 moving right + --- -0.498375 (0.798203), N = 90 moving right + --- -0.201349 (0.791629), N = 81 moving right + --- 0.562552 (0.701124), N = 48 moving right + + -- best stat: 0.80135, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 13 5 1 6 0 + + + -- linear combo weights (showing up to 5) + + 0.6818 2.0128 0.8714 2.2981 -0.1680 + + + -- cutpoint (score) + --- -0.520682 (0.661481), N = 180 moving right + --- 0.100741 (0.716183), N = 124 moving right + --- 0.42974 (0.726121), N = 99 moving right + --- 2.47556 (0.676106), N = 44 moving right + --- 3.38838 (0.636831), N = 27 moving right + + -- best stat: 0.726121, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 3.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.1000e+01 9.8913e-01 1.0909e-02 + 7.7000e+01 9.7826e-01 2.1898e-02 + 1.1000e+02 9.7464e-01 2.5602e-02 + + +------------ Growing tree 17 -------------- + +- N obs inbag: 276 +- N row inbag: 185 +- max nodes: 215 +- max leaves: 108 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 14 7 4 5 8 + + + -- linear combo weights (showing up to 5) + + 0.0199 9.1073 0.1528 -0.1533 1.8710 + + + -- cutpoint (score) + --- -1.21408 (0.509092), N = 271 moving right + --- -1.0951 (0.586082), N = 231 moving right + --- -0.977122 (0.640833), N = 196 moving right + --- -0.953255 (0.662009), N = 187 moving right + --- -0.69583 (0.724199), N = 125 moving right + + -- best stat: 0.724199, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 8 3 16 2 10 + + + -- linear combo weights (showing up to 5) + + 1.5745 7.6250 0.4103 -0.7854 -0.3749 + + + -- cutpoint (score) + --- -2.23602 (0.534736), N = 250 moving right + --- -0.51574 (0.750098), N = 72 moving right + --- 0.0371589 (0.739845), N = 56 moving right + --- 0.66462 (0.662324), N = 33 moving right + --- 4.41954 (0.605625), N = 17 moving right + + -- best stat: 0.750098, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 9 0 17 10 7 + + + -- linear combo weights (showing up to 5) + + 0.5357 -0.3079 0.5483 -0.4198 10.0012 + + + -- cutpoint (score) + --- 0.627693 (0.554534), N = 246 moving right + --- 1.34423 (0.656282), N = 136 moving right + --- 1.92232 (0.676671), N = 69 moving right + --- 2.09518 (0.669389), N = 57 moving right + --- 2.4055 (0.657797), N = 39 moving right + + -- best stat: 0.676671, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.7000e+01 9.8913e-01 1.0909e-02 + 1.1000e+02 9.8188e-01 1.8235e-02 + 1.3100e+02 9.7464e-01 2.5615e-02 + + +------------ Growing tree 18 -------------- + +- N obs inbag: 276 +- N row inbag: 167 +- max nodes: 211 +- max leaves: 106 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 16 7 11 15 6 + + + -- linear combo weights (showing up to 5) + + 0.3195 7.7377 0.5859 -0.0065 1.7219 + + + -- cutpoint (score) + --- -0.422439 (0.650047), N = 195 moving right + --- -0.207374 (0.697278), N = 151 moving right + --- 1.68672 (0.714635), N = 44 moving right + --- 2.28271 (0.671452), N = 32 moving right + --- 8.89221 (0.557585), N = 8 moving right + + -- best stat: 0.714635, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 6 16 1 13 17 + + + -- linear combo weights (showing up to 5) + + 1.2001 0.5045 0.6255 0.5089 0.5031 + + + -- cutpoint (score) + --- 0.645634 (0.614286), N = 210 moving right + --- 0.951446 (0.663541), N = 180 moving right + --- 1.32752 (0.711494), N = 136 moving right + --- 3.78713 (0.61517), N = 20 moving right + --- 3.92164 (0.595998), N = 18 moving right + + -- best stat: 0.711494, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 16 15 14 6 8 + + + -- linear combo weights (showing up to 5) + + 0.3750 -0.2605 0.2325 1.3320 1.6583 + + + -- cutpoint (score) + --- -1.56733 (0.517846), N = 261 moving right + --- -1.13107 (0.589507), N = 215 moving right + --- -1.03935 (0.630107), N = 191 moving right + --- -0.888621 (0.672708), N = 171 moving right + --- -0.788825 (0.694207), N = 161 moving right + + -- best stat: 0.694207, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 7.1000e+01 9.8551e-01 1.4546e-02 + 7.7000e+01 9.8188e-01 1.8222e-02 + 1.1000e+02 9.7826e-01 2.1912e-02 + 1.3100e+02 9.7464e-01 2.5616e-02 + + +------------ Growing tree 19 -------------- + +- N obs inbag: 276 +- N row inbag: 182 +- max nodes: 231 +- max leaves: 116 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 6 10 7 2 3 + + + -- linear combo weights (showing up to 5) + + 1.4883 -0.4421 2.4055 -1.0580 1.7375 + + + -- cutpoint (score) + --- -1.36732 (0.545004), N = 228 moving right + --- -1.3564 (0.548446), N = 226 moving right + --- -0.832142 (0.662394), N = 109 moving right + --- -0.733844 (0.655432), N = 99 moving right + --- -0.307884 (0.654479), N = 58 moving right + + -- best stat: 0.662394, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 11 1 6 17 8 + + + -- linear combo weights (showing up to 5) + + 0.7881 0.3391 0.5060 0.2071 1.0954 + + + -- cutpoint (score) + --- -0.567303 (0.631471), N = 203 moving right + --- -0.387182 (0.674861), N = 177 moving right + --- -0.185086 (0.691645), N = 164 moving right + --- 0.0444879 (0.726205), N = 143 moving right + --- 2.94326 (0.632813), N = 31 moving right + + -- best stat: 0.726205, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 0 2 3 14 16 + + + -- linear combo weights (showing up to 5) + + -0.2703 -0.3753 2.3873 0.2096 0.2699 + + + -- cutpoint (score) + --- -0.697775 (0.588238), N = 203 moving right + --- -0.420046 (0.664592), N = 99 moving right + --- -0.40232 (0.656443), N = 97 moving right + --- -0.385182 (0.655899), N = 91 moving right + --- -0.346063 (0.635069), N = 76 moving right + + -- best stat: 0.664592, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 3.3400e+02 1.0000e+00 1.0000e+00 + 3.4800e+02 1.0000e+00 2.0000e+00 + 4.6000e+02 1.0000e+00 2.0000e+00 + 5.1500e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.9275e-01 7.2596e-03 + 1.7900e+02 9.8913e-01 1.0909e-02 + 1.9800e+02 9.8551e-01 1.4572e-02 + 2.1600e+02 9.8188e-01 1.8249e-02 + + +------------ Growing tree 20 -------------- + +- N obs inbag: 276 +- N row inbag: 179 +- max nodes: 217 +- max leaves: 109 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 0 1 11 13 7 + + + -- linear combo weights (showing up to 5) + + -0.4100 0.7402 0.7225 0.4001 3.3953 + + + -- cutpoint (score) + --- -1.06913 (0.570119), N = 228 moving right + --- -0.683008 (0.654331), N = 182 moving right + --- -0.578501 (0.685171), N = 164 moving right + --- 1.03906 (0.640474), N = 46 moving right + --- 2.57684 (0.625974), N = 23 moving right + + -- best stat: 0.685171, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 17 15 8 5 3 + + + -- linear combo weights (showing up to 5) + + 0.4445 0.0749 2.2000 0.3519 4.1184 + + + -- cutpoint (score) + --- 0.0116657 (0.627581), N = 215 moving right + --- 0.584651 (0.702326), N = 158 moving right + --- 0.838823 (0.732524), N = 128 moving right + --- 0.876991 (0.743489), N = 124 moving right + --- 1.44469 (0.734665), N = 80 moving right + + -- best stat: 0.743489, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 12 2 3 14 6 + + + -- linear combo weights (showing up to 5) + + 0.0935 -0.1215 7.5119 0.1059 0.3082 + + + -- cutpoint (score) + --- -0.121001 (0.613617), N = 136 moving right + --- -0.0455764 (0.609376), N = 97 moving right + --- 0.0615231 (0.592564), N = 67 moving right + --- 0.374512 (0.597404), N = 26 moving right + --- 0.585667 (0.609848), N = 20 moving right + + -- best stat: 0.613617, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 3.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 3.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 4.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.8913e-01 1.0870e-02 + 7.7000e+01 9.8551e-01 1.4533e-02 + 1.3100e+02 9.7464e-01 2.5562e-02 + 1.4000e+02 9.6739e-01 3.2997e-02 + 1.8600e+02 9.6377e-01 3.6742e-02 + + +------------ Growing tree 21 -------------- + +- N obs inbag: 276 +- N row inbag: 167 +- max nodes: 241 +- max leaves: 121 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 15 8 17 7 6 + + + -- linear combo weights (showing up to 5) + + -0.1374 1.2822 0.2816 6.2098 1.0973 + + + -- cutpoint (score) + --- 0.624703 (0.728475), N = 130 moving right + --- 0.801259 (0.740387), N = 114 moving right + --- 1.82713 (0.693208), N = 54 moving right + --- 1.96466 (0.684933), N = 49 moving right + --- 1.98664 (0.687303), N = 47 moving right + + -- best stat: 0.740387, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 0 9 2 5 17 + + + -- linear combo weights (showing up to 5) + + 0.1816 0.5004 -0.8429 0.8471 0.4999 + + + -- cutpoint (score) + --- 0.350675 (0.598096), N = 213 moving right + --- 0.620075 (0.643517), N = 180 moving right + --- 1.56522 (0.66873), N = 81 moving right + --- 1.88453 (0.58081), N = 40 moving right + --- 1.91006 (0.574435), N = 39 moving right + + -- best stat: 0.66873, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 17 12 15 4 13 + + + -- linear combo weights (showing up to 5) + + 0.3517 0.1931 -0.2318 0.6480 0.4481 + + + -- cutpoint (score) + --- 0.256878 (0.54916), N = 254 moving right + --- 0.420149 (0.571207), N = 243 moving right + --- 0.443463 (0.579502), N = 240 moving right + --- 0.458372 (0.585979), N = 237 moving right + --- 1.15491 (0.688774), N = 176 moving right + + -- best stat: 0.688774, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.1000e+01 9.8551e-01 1.4559e-02 + 1.1000e+02 9.7826e-01 2.1912e-02 + 1.4000e+02 9.7464e-01 2.5615e-02 + + +------------ Growing tree 22 -------------- + +- N obs inbag: 276 +- N row inbag: 185 +- max nodes: 229 +- max leaves: 115 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 12 1 9 0 5 + + + -- linear combo weights (showing up to 5) + + -0.0373 0.7042 0.3777 -0.5334 0.8743 + + + -- cutpoint (score) + --- -0.888279 (0.586494), N = 233 moving right + --- -0.878108 (0.591895), N = 230 moving right + --- 0.68571 (0.668095), N = 67 moving right + --- 1.66315 (0.535067), N = 16 moving right + --- 1.87408 (0.50497), N = 8 moving right + + -- best stat: 0.668095, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 8 6 13 2 1 + + + -- linear combo weights (showing up to 5) + + 1.7427 0.5759 0.1104 -0.7261 0.6125 + + + -- cutpoint (score) + --- -1.80595 (0.598254), N = 216 moving right + --- -1.57916 (0.651129), N = 192 moving right + --- -1.45462 (0.693202), N = 165 moving right + --- -1.08734 (0.746135), N = 122 moving right + --- 2.5555 (0.596161), N = 18 moving right + + -- best stat: 0.746135, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 12 8 16 7 6 + + + -- linear combo weights (showing up to 5) + + 0.0294 1.5813 0.2080 8.1812 0.7375 + + + -- cutpoint (score) + --- -1.04916 (0.541075), N = 248 moving right + --- -0.951703 (0.58757), N = 217 moving right + --- -0.84183 (0.683691), N = 172 moving right + --- -0.821876 (0.686196), N = 164 moving right + --- 0.432891 (0.695844), N = 62 moving right + + -- best stat: 0.695844, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 7.7000e+01 9.8913e-01 1.0896e-02 + 1.1000e+02 9.8551e-01 1.4559e-02 + 1.3100e+02 9.8188e-01 1.8235e-02 + 1.4000e+02 9.7464e-01 2.5616e-02 + + +------------ Growing tree 23 -------------- + +- N obs inbag: 276 +- N row inbag: 184 +- max nodes: 243 +- max leaves: 122 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 7 10 14 2 4 + + + -- linear combo weights (showing up to 5) + + 6.4635 -0.4514 0.2543 -1.4639 0.7532 + + + -- cutpoint (score) + --- -1.88168 (0.546727), N = 242 moving right + --- -1.86273 (0.540255), N = 241 moving right + --- -1.10945 (0.660855), N = 164 moving right + --- 0.158827 (0.648382), N = 40 moving right + --- 0.624607 (0.6106), N = 29 moving right + + -- best stat: 0.660855, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 6 8 14 11 7 + + + -- linear combo weights (showing up to 5) + + 0.8730 1.4286 -0.1047 0.3852 5.7778 + + + -- cutpoint (score) + --- -1.03618 (0.586309), N = 228 moving right + --- -0.838319 (0.664745), N = 185 moving right + --- 0.490851 (0.716145), N = 78 moving right + --- 0.842218 (0.7262), N = 65 moving right + --- 0.989232 (0.690218), N = 50 moving right + + -- best stat: 0.7262, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 4 2 12 9 8 + + + -- linear combo weights (showing up to 5) + + 0.5545 -1.0857 0.0078 -0.1842 1.6810 + + + -- cutpoint (score) + --- -2.07494 (0.523891), N = 264 moving right + --- -2.00489 (0.561145), N = 246 moving right + --- -1.88111 (0.624527), N = 212 moving right + --- -0.985074 (0.758164), N = 112 moving right + --- -0.973144 (0.7602), N = 111 moving right + + -- best stat: 0.7602, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9275e-01 7.2464e-03 + 7.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.8551e-01 1.4559e-02 + 1.1000e+02 9.8188e-01 1.8235e-02 + 1.3100e+02 9.7464e-01 2.5616e-02 + + +------------ Growing tree 24 -------------- + +- N obs inbag: 276 +- N row inbag: 173 +- max nodes: 213 +- max leaves: 107 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 16 3 8 6 10 + + + -- linear combo weights (showing up to 5) + + 0.1749 9.5080 1.3799 0.2854 -0.5514 + + + -- cutpoint (score) + --- -1.33313 (0.550738), N = 240 moving right + --- -1.15358 (0.578712), N = 225 moving right + --- 0.20822 (0.760398), N = 87 moving right + --- 0.353881 (0.757855), N = 75 moving right + --- 0.946243 (0.730989), N = 55 moving right + + -- best stat: 0.760398, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 7 17 5 16 13 + + + -- linear combo weights (showing up to 5) + + 11.2230 0.3635 0.6144 0.2046 0.4827 + + + -- cutpoint (score) + --- 0.729318 (0.638228), N = 203 moving right + --- 1.02674 (0.678281), N = 162 moving right + --- 1.37786 (0.729573), N = 115 moving right + --- 1.38116 (0.727071), N = 114 moving right + --- 3.07211 (0.641509), N = 26 moving right + + -- best stat: 0.729573, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 16 4 11 17 3 + + + -- linear combo weights (showing up to 5) + + 0.1914 0.0441 0.9005 0.2786 10.1218 + + + -- cutpoint (score) + --- -0.263652 (0.533039), N = 260 moving right + --- 0.156813 (0.631399), N = 210 moving right + --- 0.765616 (0.7355), N = 109 moving right + --- 0.796944 (0.738351), N = 107 moving right + --- 0.834159 (0.738413), N = 102 moving right + + -- best stat: 0.738413, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 3.0000e+00 + 1.9100e+02 1.0000e+00 3.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.7000e+01 9.8913e-01 1.0909e-02 + 1.1000e+02 9.8551e-01 1.4572e-02 + 1.3100e+02 9.8188e-01 1.8249e-02 + + +------------ Growing tree 25 -------------- + +- N obs inbag: 276 +- N row inbag: 168 +- max nodes: 227 +- max leaves: 114 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 6 3 11 10 4 + + + -- linear combo weights (showing up to 5) + + 0.1149 8.3609 0.4766 -0.1950 0.7152 + + + -- cutpoint (score) + --- 0.236131 (0.699266), N = 153 moving right + --- 0.624664 (0.723852), N = 110 moving right + --- 0.664305 (0.725505), N = 99 moving right + --- 0.67924 (0.734251), N = 95 moving right + --- 1.69557 (0.677482), N = 35 moving right + + -- best stat: 0.734251, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 16 9 5 6 14 + + + -- linear combo weights (showing up to 5) + + 0.5693 0.3690 0.4565 0.5681 0.1996 + + + -- cutpoint (score) + --- -0.481004 (0.56874), N = 236 moving right + --- 0.198193 (0.736972), N = 111 moving right + --- 0.888134 (0.628048), N = 56 moving right + --- 0.911624 (0.6243), N = 53 moving right + --- 1.2271 (0.604611), N = 42 moving right + + -- best stat: 0.736972, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 6 8 15 10 16 + + + -- linear combo weights (showing up to 5) + + -0.1707 1.2925 -0.1194 -0.5615 0.4144 + + + -- cutpoint (score) + --- -1.30818 (0.574382), N = 231 moving right + --- -0.999415 (0.617549), N = 202 moving right + --- -0.992792 (0.620813), N = 201 moving right + --- -0.975081 (0.628471), N = 194 moving right + --- 0.690833 (0.704486), N = 60 moving right + + -- best stat: 0.704486, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 3.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 4.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.1000e+01 9.8913e-01 1.0909e-02 + 7.7000e+01 9.7826e-01 2.1898e-02 + 1.1000e+02 9.7101e-01 2.9306e-02 + + +------------ Growing tree 26 -------------- + +- N obs inbag: 276 +- N row inbag: 179 +- max nodes: 225 +- max leaves: 113 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 1 9 6 5 14 + + + -- linear combo weights (showing up to 5) + + 0.4355 0.4416 0.5517 0.9052 0.1086 + + + -- cutpoint (score) + --- -0.201784 (0.592306), N = 215 moving right + --- -0.0571045 (0.646461), N = 180 moving right + --- 0.208769 (0.708717), N = 134 moving right + --- 0.31887 (0.723851), N = 124 moving right + --- 1.14716 (0.58632), N = 35 moving right + + -- best stat: 0.723851, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 12 9 15 5 13 + + + -- linear combo weights (showing up to 5) + + -0.0574 0.2239 -0.1874 1.1739 0.3588 + + + -- cutpoint (score) + --- -0.699161 (0.514482), N = 266 moving right + --- 0.0083787 (0.641186), N = 169 moving right + --- 0.167568 (0.651085), N = 135 moving right + --- 0.619768 (0.625716), N = 89 moving right + --- 1.23335 (0.61159), N = 38 moving right + + -- best stat: 0.651085, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 1 0 2 15 6 + + + -- linear combo weights (showing up to 5) + + 0.4294 0.1655 -0.1127 -0.2078 0.6108 + + + -- cutpoint (score) + --- -0.769982 (0.507844), N = 258 moving right + --- -0.452568 (0.564943), N = 222 moving right + --- -0.363205 (0.554451), N = 214 moving right + --- 0.121093 (0.628739), N = 127 moving right + --- 0.558758 (0.652073), N = 49 moving right + + -- best stat: 0.652073, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.8551e-01 1.4559e-02 + 1.1000e+02 9.8188e-01 1.8235e-02 + 1.3100e+02 9.7464e-01 2.5615e-02 + + +------------ Growing tree 27 -------------- + +- N obs inbag: 276 +- N row inbag: 177 +- max nodes: 209 +- max leaves: 105 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 17 3 12 9 0 + + + -- linear combo weights (showing up to 5) + + 0.6449 11.5187 0.4685 0.1528 -0.2846 + + + -- cutpoint (score) + --- 1.02013 (0.578233), N = 236 moving right + --- 1.30718 (0.606662), N = 218 moving right + --- 1.59354 (0.654445), N = 177 moving right + --- 2.15638 (0.711389), N = 89 moving right + --- 2.39782 (0.675842), N = 57 moving right + + -- best stat: 0.711389, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 3 12 13 8 15 + + + -- linear combo weights (showing up to 5) + + 8.9450 0.4074 -0.0003 1.6815 -0.3240 + + + -- cutpoint (score) + --- -0.279535 (0.755752), N = 114 moving right + --- 0.012533 (0.758419), N = 95 moving right + --- 0.243154 (0.720571), N = 74 moving right + --- 0.426058 (0.713604), N = 67 moving right + --- 2.1537 (0.656337), N = 25 moving right + + -- best stat: 0.758419, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 11 9 12 5 4 + + + -- linear combo weights (showing up to 5) + + 1.1210 0.0098 0.3435 1.2102 0.5538 + + + -- cutpoint (score) + --- 0.363854 (0.703948), N = 134 moving right + --- 1.26867 (0.722055), N = 74 moving right + --- 1.65487 (0.665993), N = 55 moving right + --- 2.62668 (0.579287), N = 28 moving right + --- 2.73637 (0.568169), N = 25 moving right + + -- best stat: 0.722055, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 5.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 3.0000e+00 + 3.2100e+02 1.0000e+00 3.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.1000e+01 9.7464e-01 2.5508e-02 + 1.1000e+02 9.7101e-01 2.9225e-02 + 1.3100e+02 9.6739e-01 3.2957e-02 + + +------------ Growing tree 28 -------------- + +- N obs inbag: 276 +- N row inbag: 175 +- max nodes: 249 +- max leaves: 125 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 8 6 10 17 9 + + + -- linear combo weights (showing up to 5) + + 2.0163 0.0361 -0.6916 0.5217 -0.6546 + + + -- cutpoint (score) + --- 1.46659 (0.741081), N = 111 moving right + --- 3.05573 (0.693498), N = 50 moving right + --- 3.44978 (0.669335), N = 43 moving right + --- 4.7072 (0.625474), N = 30 moving right + --- 5.31512 (0.602071), N = 24 moving right + + -- best stat: 0.741081, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 17 11 14 5 7 + + + -- linear combo weights (showing up to 5) + + 0.4872 0.8276 0.0449 -0.0061 6.5695 + + + -- cutpoint (score) + --- 0.355626 (0.554144), N = 252 moving right + --- 0.674799 (0.608975), N = 225 moving right + --- 0.788778 (0.630372), N = 214 moving right + --- 2.31671 (0.724021), N = 69 moving right + --- 2.66122 (0.688365), N = 53 moving right + + -- best stat: 0.724021, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 10 0 3 12 1 + + + -- linear combo weights (showing up to 5) + + -0.4898 -0.0892 5.2967 0.2206 0.3924 + + + -- cutpoint (score) + --- -0.206027 (0.669588), N = 158 moving right + --- -0.0732357 (0.687209), N = 134 moving right + --- 0.564618 (0.666046), N = 72 moving right + --- 0.913446 (0.656396), N = 50 moving right + --- 6.49276 (0.589222), N = 19 moving right + + -- best stat: 0.687209, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 3.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.8551e-01 1.4559e-02 + 1.1000e+02 9.8188e-01 1.8235e-02 + 1.3100e+02 9.7826e-01 2.1926e-02 + + +------------ Growing tree 29 -------------- + +- N obs inbag: 276 +- N row inbag: 167 +- max nodes: 195 +- max leaves: 98 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 7 6 2 15 13 + + + -- linear combo weights (showing up to 5) + + 11.4175 1.9883 -1.0372 -0.0007 0.3149 + + + -- cutpoint (score) + --- -1.1845 (0.640895), N = 186 moving right + --- -1.02183 (0.685769), N = 149 moving right + --- -0.874406 (0.696237), N = 115 moving right + --- 0.0258397 (0.695177), N = 64 moving right + --- 1.62913 (0.644009), N = 23 moving right + + -- best stat: 0.696237, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 14 16 3 9 4 + + + -- linear combo weights (showing up to 5) + + 0.0421 0.5800 9.3068 0.3787 0.5853 + + + -- cutpoint (score) + --- -0.0977583 (0.686829), N = 155 moving right + --- -0.0923002 (0.687933), N = 154 moving right + --- 0.206282 (0.739102), N = 110 moving right + --- 0.496979 (0.750342), N = 78 moving right + --- 1.02695 (0.690539), N = 48 moving right + + -- best stat: 0.750342, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 16 3 10 1 4 + + + -- linear combo weights (showing up to 5) + + 0.4377 8.1864 -0.5339 0.4839 0.4318 + + + -- cutpoint (score) + --- -0.889017 (0.593061), N = 222 moving right + --- -0.560742 (0.634601), N = 192 moving right + --- -0.269515 (0.687845), N = 151 moving right + --- 9.65336 (0.609889), N = 18 moving right + --- 10.0814 (0.590698), N = 15 moving right + + -- best stat: 0.687845, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 3.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8551e-01 1.4532e-02 + 7.7000e+01 9.8188e-01 1.8209e-02 + 1.1000e+02 9.7464e-01 2.5589e-02 + 1.4000e+02 9.6739e-01 3.3024e-02 + + +------------ Growing tree 30 -------------- + +- N obs inbag: 276 +- N row inbag: 172 +- max nodes: 225 +- max leaves: 113 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 11 16 8 1 14 + + + -- linear combo weights (showing up to 5) + + 0.8055 0.2930 1.3955 0.3867 -0.1383 + + + -- cutpoint (score) + --- -1.42184 (0.592467), N = 224 moving right + --- -0.563741 (0.721946), N = 142 moving right + --- -0.562637 (0.728459), N = 138 moving right + --- -0.320676 (0.749916), N = 113 moving right + --- 0.618636 (0.731115), N = 72 moving right + + -- best stat: 0.749916, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 12 8 13 14 7 + + + -- linear combo weights (showing up to 5) + + 0.1187 1.4712 0.0592 -0.0574 1.8864 + + + -- cutpoint (score) + --- -1.05165 (0.517937), N = 266 moving right + --- -1.00189 (0.533998), N = 259 moving right + --- -0.645378 (0.693238), N = 150 moving right + --- -0.000411439 (0.70736), N = 87 moving right + --- 3.27707 (0.59487), N = 20 moving right + + -- best stat: 0.70736, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 4 7 8 13 14 + + + -- linear combo weights (showing up to 5) + + 0.4930 1.8407 1.3660 0.0880 -0.0100 + + + -- cutpoint (score) + --- -0.890586 (0.553811), N = 249 moving right + --- 0.157802 (0.711049), N = 108 moving right + --- 0.503835 (0.714), N = 87 moving right + --- 0.640558 (0.686641), N = 74 moving right + --- 2.91787 (0.60094), N = 25 moving right + + -- best stat: 0.714, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 3.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 7.1000e+01 9.9638e-01 3.6232e-03 + 7.7000e+01 9.8551e-01 1.4532e-02 + 1.1000e+02 9.8188e-01 1.8209e-02 + 1.3100e+02 9.7826e-01 2.1899e-02 + 1.4000e+02 9.7464e-01 2.5602e-02 + + +------------ Growing tree 31 -------------- + +- N obs inbag: 276 +- N row inbag: 181 +- max nodes: 219 +- max leaves: 110 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 5 8 0 7 13 + + + -- linear combo weights (showing up to 5) + + 0.2491 1.5671 -0.2524 4.2675 -0.1019 + + + -- cutpoint (score) + --- -1.05514 (0.578819), N = 230 moving right + --- -0.964414 (0.598558), N = 219 moving right + --- -0.640368 (0.726686), N = 135 moving right + --- 0.0390418 (0.740448), N = 78 moving right + --- 2.44502 (0.633748), N = 29 moving right + + -- best stat: 0.740448, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 1 10 12 16 15 + + + -- linear combo weights (showing up to 5) + + 0.3196 -0.6376 0.1247 0.5478 -0.1605 + + + -- cutpoint (score) + --- -1.37342 (0.529113), N = 249 moving right + --- -0.976697 (0.563309), N = 219 moving right + --- 0.656275 (0.666792), N = 56 moving right + --- 1.50504 (0.62775), N = 30 moving right + --- 2.61916 (0.529589), N = 6 moving right + + -- best stat: 0.666792, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 10 6 1 0 4 + + + -- linear combo weights (showing up to 5) + + -0.5533 0.5708 0.3683 0.0154 0.7185 + + + -- cutpoint (score) + --- -1.4176 (0.494678), N = 269 moving right + --- 0.148341 (0.683216), N = 145 moving right + --- 1.50357 (0.594011), N = 31 moving right + --- 1.52978 (0.597585), N = 30 moving right + --- 1.83726 (0.559854), N = 14 moving right + + -- best stat: 0.683216, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 3.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + 3.3400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 7.7000e+01 9.9275e-01 7.2464e-03 + 1.1000e+02 9.8551e-01 1.4546e-02 + 1.4000e+02 9.8188e-01 1.8222e-02 + 1.7900e+02 9.7826e-01 2.1912e-02 + 1.9800e+02 9.7101e-01 2.9320e-02 + + +------------ Growing tree 32 -------------- + +- N obs inbag: 276 +- N row inbag: 174 +- max nodes: 203 +- max leaves: 102 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 13 7 1 8 15 + + + -- linear combo weights (showing up to 5) + + 0.2542 3.2532 0.5806 1.3815 -0.0469 + + + -- cutpoint (score) + --- -1.1689 (0.591713), N = 223 moving right + --- 0.158798 (0.782389), N = 87 moving right + --- 0.568246 (0.727115), N = 59 moving right + --- 1.37252 (0.654629), N = 39 moving right + --- 1.77115 (0.639869), N = 31 moving right + + -- best stat: 0.782389, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 11 0 16 8 4 + + + -- linear combo weights (showing up to 5) + + 0.5113 0.0307 0.3722 1.2368 0.4367 + + + -- cutpoint (score) + --- -1.20521 (0.557354), N = 244 moving right + --- -0.977642 (0.636431), N = 206 moving right + --- -0.920355 (0.656403), N = 190 moving right + --- -0.209047 (0.739707), N = 113 moving right + --- 0.45228 (0.725714), N = 84 moving right + + -- best stat: 0.739707, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 1 14 12 17 10 + + + -- linear combo weights (showing up to 5) + + 0.2079 0.3646 0.0800 0.5706 -0.5830 + + + -- cutpoint (score) + --- 1.71652 (0.715816), N = 116 moving right + --- 2.04857 (0.681872), N = 86 moving right + --- 2.38742 (0.677864), N = 65 moving right + --- 3.40519 (0.571391), N = 12 moving right + --- 4.36046 (0.520848), N = 6 moving right + + -- best stat: 0.715816, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 4.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.8913e-01 1.0896e-02 + 1.1000e+02 9.8551e-01 1.4559e-02 + 1.4000e+02 9.8188e-01 1.8235e-02 + 1.7900e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 33 -------------- + +- N obs inbag: 276 +- N row inbag: 173 +- max nodes: 223 +- max leaves: 112 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 17 2 10 16 0 + + + -- linear combo weights (showing up to 5) + + 0.6277 -1.5981 -0.8348 0.4603 -0.4465 + + + -- cutpoint (score) + --- -0.611394 (0.651606), N = 199 moving right + --- 0.207512 (0.716528), N = 128 moving right + --- 0.285594 (0.725689), N = 122 moving right + --- 1.36556 (0.650402), N = 38 moving right + --- 2.84812 (0.558105), N = 14 moving right + + -- best stat: 0.725689, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 1 14 11 8 0 + + + -- linear combo weights (showing up to 5) + + 0.3193 -0.2614 1.1031 1.8675 0.0975 + + + -- cutpoint (score) + --- -1.80869 (0.599308), N = 226 moving right + --- -1.48634 (0.67681), N = 186 moving right + --- -1.30781 (0.722614), N = 160 moving right + --- 0.507969 (0.767816), N = 79 moving right + --- 2.29866 (0.66223), N = 34 moving right + + -- best stat: 0.767816, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 3 7 12 0 1 + + + -- linear combo weights (showing up to 5) + + 2.9061 12.4215 0.0681 -0.0803 0.3952 + + + -- cutpoint (score) + --- -0.603915 (0.545847), N = 243 moving right + --- -0.518761 (0.53673), N = 233 moving right + --- -0.0253463 (0.637134), N = 129 moving right + --- 0.129364 (0.612339), N = 86 moving right + --- 0.440183 (0.627242), N = 42 moving right + + -- best stat: 0.637134, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + 4.0000e+02 1.0000e+00 2.0000e+00 + 4.6000e+02 1.0000e+00 2.0000e+00 + 5.4900e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 7.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.8551e-01 1.4559e-02 + 1.3100e+02 9.8188e-01 1.8235e-02 + 2.1600e+02 9.7826e-01 2.1926e-02 + + +------------ Growing tree 34 -------------- + +- N obs inbag: 276 +- N row inbag: 173 +- max nodes: 225 +- max leaves: 113 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 17 1 8 11 13 + + + -- linear combo weights (showing up to 5) + + 0.2397 0.4351 1.3442 0.7823 0.0682 + + + -- cutpoint (score) + --- -0.201487 (0.720659), N = 148 moving right + --- 1.03718 (0.775415), N = 85 moving right + --- 2.74724 (0.641527), N = 32 moving right + --- 2.76204 (0.634316), N = 31 moving right + --- 4.78637 (0.572853), N = 15 moving right + + -- best stat: 0.775415, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 7 12 11 13 5 + + + -- linear combo weights (showing up to 5) + + 7.4054 -0.2370 1.2225 0.2374 0.1255 + + + -- cutpoint (score) + --- -0.355943 (0.703864), N = 152 moving right + --- -0.294288 (0.71924), N = 137 moving right + --- 0.149592 (0.728997), N = 92 moving right + --- 0.979258 (0.695448), N = 52 moving right + --- 4.91689 (0.612448), N = 22 moving right + + -- best stat: 0.728997, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 1 8 5 7 3 + + + -- linear combo weights (showing up to 5) + + 0.3962 1.2583 0.1407 5.6721 3.7000 + + + -- cutpoint (score) + --- -0.547331 (0.695059), N = 161 moving right + --- -0.535794 (0.69743), N = 160 moving right + --- -0.257788 (0.744412), N = 119 moving right + --- 0.707836 (0.682347), N = 53 moving right + --- 7.36915 (0.599833), N = 19 moving right + + -- best stat: 0.744412, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 3.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 3.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 3.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.8913e-01 1.0870e-02 + 5.1000e+01 9.8551e-01 1.4533e-02 + 1.3100e+02 9.7464e-01 2.5562e-02 + 1.4000e+02 9.7101e-01 2.9279e-02 + 1.7900e+02 9.6377e-01 3.6742e-02 + + +------------ Growing tree 35 -------------- + +- N obs inbag: 276 +- N row inbag: 174 +- max nodes: 215 +- max leaves: 108 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 5 8 3 15 14 + + + -- linear combo weights (showing up to 5) + + 0.9140 1.7827 6.1358 -0.0110 0.3031 + + + -- cutpoint (score) + --- -1.25978 (0.563597), N = 246 moving right + --- -0.984774 (0.642924), N = 197 moving right + --- 0.249726 (0.735016), N = 84 moving right + --- 0.900574 (0.676758), N = 46 moving right + --- 7.64959 (0.566133), N = 11 moving right + + -- best stat: 0.735016, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 6 13 12 17 4 + + + -- linear combo weights (showing up to 5) + + 1.3310 0.5030 0.2044 0.6591 -0.1411 + + + -- cutpoint (score) + --- 1.03689 (0.573886), N = 240 moving right + --- 1.30152 (0.620096), N = 216 moving right + --- 1.59714 (0.65708), N = 189 moving right + --- 1.87486 (0.685636), N = 152 moving right + --- 2.337 (0.679397), N = 99 moving right + + -- best stat: 0.685636, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 4 2 12 15 14 + + + -- linear combo weights (showing up to 5) + + 0.5955 -0.7351 0.1878 -0.0478 0.5878 + + + -- cutpoint (score) + --- -1.1881 (0.539132), N = 231 moving right + --- -1.0377 (0.5709), N = 215 moving right + --- -0.0932374 (0.605981), N = 75 moving right + --- 0.118121 (0.601236), N = 55 moving right + --- 0.52466 (0.563556), N = 22 moving right + + -- best stat: 0.605981, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 3.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 3.0000e+00 + 3.3400e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 7.1000e+01 9.9638e-01 3.6232e-03 + 7.7000e+01 9.9275e-01 7.2596e-03 + 1.3100e+02 9.8913e-01 1.0909e-02 + 1.4000e+02 9.8551e-01 1.4572e-02 + 1.8600e+02 9.8188e-01 1.8249e-02 + + +------------ Growing tree 36 -------------- + +- N obs inbag: 276 +- N row inbag: 176 +- max nodes: 205 +- max leaves: 103 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 16 11 14 7 3 + + + -- linear combo weights (showing up to 5) + + 0.2731 0.7525 0.1822 6.8783 7.5422 + + + -- cutpoint (score) + --- -0.882193 (0.529685), N = 258 moving right + --- -0.540765 (0.661316), N = 189 moving right + --- -0.344888 (0.726016), N = 142 moving right + --- -0.183405 (0.73417), N = 127 moving right + --- 0.201574 (0.713552), N = 79 moving right + + -- best stat: 0.73417, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 3 14 6 7 9 + + + -- linear combo weights (showing up to 5) + + 9.0018 0.1792 1.4029 7.3628 0.4518 + + + -- cutpoint (score) + --- -0.430212 (0.529324), N = 261 moving right + --- -0.181354 (0.622415), N = 174 moving right + --- 0.0583142 (0.683357), N = 119 moving right + --- 0.264055 (0.689451), N = 82 moving right + --- 0.334813 (0.692402), N = 74 moving right + + -- best stat: 0.692402, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 4 9 10 12 6 + + + -- linear combo weights (showing up to 5) + + 0.6671 0.2226 -0.5872 0.0552 0.6866 + + + -- cutpoint (score) + --- -0.557557 (0.561303), N = 235 moving right + --- -0.238135 (0.618699), N = 202 moving right + --- 0.319442 (0.664649), N = 124 moving right + --- 0.820711 (0.701384), N = 75 moving right + --- 2.29452 (0.519153), N = 5 moving right + + -- best stat: 0.701384, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 3.0000e+00 + 1.9800e+02 1.0000e+00 3.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 7.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.8188e-01 1.8222e-02 + 1.4000e+02 9.7826e-01 2.1912e-02 + 1.7900e+02 9.7464e-01 2.5616e-02 + + +------------ Growing tree 37 -------------- + +- N obs inbag: 276 +- N row inbag: 170 +- max nodes: 223 +- max leaves: 112 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 9 17 4 1 15 + + + -- linear combo weights (showing up to 5) + + 0.4022 0.4390 0.5295 0.6432 0.0188 + + + -- cutpoint (score) + --- 0.90874 (0.63625), N = 201 moving right + --- 0.915738 (0.640996), N = 198 moving right + --- 1.577 (0.72673), N = 137 moving right + --- 1.98415 (0.690221), N = 107 moving right + --- 2.12611 (0.683415), N = 91 moving right + + -- best stat: 0.72673, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 17 14 9 8 2 + + + -- linear combo weights (showing up to 5) + + 0.4464 0.1093 -0.5817 2.4015 -1.5326 + + + -- cutpoint (score) + --- -1.86174 (0.557198), N = 243 moving right + --- -1.80502 (0.587149), N = 226 moving right + --- -1.63444 (0.616601), N = 210 moving right + --- -0.778055 (0.718591), N = 129 moving right + --- 2.74273 (0.587253), N = 17 moving right + + -- best stat: 0.718591, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 4 15 16 7 2 + + + -- linear combo weights (showing up to 5) + + 0.8090 0.1988 0.4861 8.0599 -1.6384 + + + -- cutpoint (score) + --- -1.83576 (0.57158), N = 232 moving right + --- -1.66089 (0.621992), N = 196 moving right + --- -0.473663 (0.680293), N = 71 moving right + --- -0.227801 (0.67228), N = 60 moving right + --- 7.24753 (0.549621), N = 13 moving right + + -- best stat: 0.680293, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 3.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 4.0000e+00 + 1.9100e+02 1.0000e+00 3.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + 3.3400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.8913e-01 1.0870e-02 + 7.1000e+01 9.8551e-01 1.4533e-02 + 1.1000e+02 9.7826e-01 2.1886e-02 + 1.3100e+02 9.7101e-01 2.9293e-02 + 1.7900e+02 9.5652e-01 4.4218e-02 + + +------------ Growing tree 38 -------------- + +- N obs inbag: 276 +- N row inbag: 173 +- max nodes: 229 +- max leaves: 115 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 2 1 17 5 14 + + + -- linear combo weights (showing up to 5) + + -0.5751 0.5727 0.3193 1.2715 0.3042 + + + -- cutpoint (score) + --- 0.0441398 (0.610134), N = 224 moving right + --- 0.639926 (0.717548), N = 142 moving right + --- 1.35403 (0.715701), N = 87 moving right + --- 2.03185 (0.638313), N = 41 moving right + --- 2.94634 (0.534248), N = 10 moving right + + -- best stat: 0.717548, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 14 17 13 12 1 + + + -- linear combo weights (showing up to 5) + + 0.3274 0.3962 0.4774 0.0757 0.5534 + + + -- cutpoint (score) + --- 1.09789 (0.723598), N = 135 moving right + --- 1.94977 (0.678245), N = 66 moving right + --- 2.2747 (0.616915), N = 36 moving right + --- 2.41455 (0.580515), N = 26 moving right + --- 2.77877 (0.551606), N = 11 moving right + + -- best stat: 0.723598, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 15 17 13 1 10 + + + -- linear combo weights (showing up to 5) + + -0.0199 0.4180 0.4333 0.5046 -0.6431 + + + -- cutpoint (score) + --- 0.684514 (0.648544), N = 184 moving right + --- 1.48531 (0.736144), N = 99 moving right + --- 2.6258 (0.666186), N = 36 moving right + --- 3.72115 (0.546368), N = 8 moving right + --- 4.1134 (0.537842), N = 5 moving right + + -- best stat: 0.736144, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 3.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.8551e-01 1.4559e-02 + 1.3100e+02 9.8188e-01 1.8235e-02 + 1.4000e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 39 -------------- + +- N obs inbag: 276 +- N row inbag: 180 +- max nodes: 233 +- max leaves: 117 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 16 14 9 10 6 + + + -- linear combo weights (showing up to 5) + + 1.0416 0.1831 0.4418 -0.6724 0.2617 + + + -- cutpoint (score) + --- -0.379542 (0.671582), N = 149 moving right + --- -0.102399 (0.695847), N = 124 moving right + --- 0.0407556 (0.707611), N = 107 moving right + --- 0.172252 (0.714202), N = 98 moving right + --- 1.1063 (0.714146), N = 55 moving right + + -- best stat: 0.714202, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 11 3 6 15 17 + + + -- linear combo weights (showing up to 5) + + 0.6445 5.7911 0.5651 -0.1157 0.3579 + + + -- cutpoint (score) + --- 0.0176634 (0.522313), N = 265 moving right + --- 0.318597 (0.572536), N = 241 moving right + --- 0.895225 (0.696325), N = 152 moving right + --- 1.27708 (0.75706), N = 95 moving right + --- 1.84901 (0.710133), N = 53 moving right + + -- best stat: 0.75706, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 8 6 15 12 5 + + + -- linear combo weights (showing up to 5) + + 1.7394 0.2969 -0.2020 -0.0088 0.4890 + + + -- cutpoint (score) + --- -0.922948 (0.628337), N = 197 moving right + --- -0.857687 (0.638536), N = 189 moving right + --- -0.382893 (0.717515), N = 117 moving right + --- 2.56095 (0.613756), N = 25 moving right + --- 8.07837 (0.526198), N = 6 moving right + + -- best stat: 0.717515, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 3.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 7.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.8551e-01 1.4559e-02 + 1.1000e+02 9.8188e-01 1.8235e-02 + 1.4000e+02 9.7464e-01 2.5616e-02 + + +------------ Growing tree 40 -------------- + +- N obs inbag: 276 +- N row inbag: 181 +- max nodes: 205 +- max leaves: 103 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 8 1 4 11 2 + + + -- linear combo weights (showing up to 5) + + 1.4525 0.6505 0.6412 0.9108 0.0893 + + + -- cutpoint (score) + --- -1.66138 (0.560499), N = 245 moving right + --- -1.29298 (0.617412), N = 219 moving right + --- 0.376926 (0.785457), N = 99 moving right + --- 0.474462 (0.79502), N = 93 moving right + --- 0.782512 (0.80128), N = 83 moving right + + -- best stat: 0.80128, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 16 14 17 4 15 + + + -- linear combo weights (showing up to 5) + + 0.5761 0.4488 0.5661 0.8961 -0.0857 + + + -- cutpoint (score) + --- 0.329872 (0.537868), N = 259 moving right + --- 2.10449 (0.723519), N = 139 moving right + --- 2.1297 (0.725079), N = 137 moving right + --- 2.44451 (0.7391), N = 113 moving right + --- 3.64395 (0.626347), N = 34 moving right + + -- best stat: 0.7391, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 10 11 8 14 13 + + + -- linear combo weights (showing up to 5) + + -0.8313 0.9416 1.3352 -0.1886 0.0247 + + + -- cutpoint (score) + --- -1.7224 (0.593383), N = 230 moving right + --- -1.63737 (0.616906), N = 220 moving right + --- -0.37364 (0.753161), N = 122 moving right + --- -0.188618 (0.752715), N = 105 moving right + --- -0.10495 (0.757436), N = 102 moving right + + -- best stat: 0.757436, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 3.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 3.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.9275e-01 7.2596e-03 + 1.1000e+02 9.8913e-01 1.0909e-02 + 1.3100e+02 9.8551e-01 1.4572e-02 + 1.4000e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 41 -------------- + +- N obs inbag: 276 +- N row inbag: 177 +- max nodes: 223 +- max leaves: 112 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 3 13 1 9 15 + + + -- linear combo weights (showing up to 5) + + 4.5218 0.4624 0.5915 0.2460 -0.1821 + + + -- cutpoint (score) + --- -0.655619 (0.599273), N = 217 moving right + --- -0.0197518 (0.738372), N = 124 moving right + --- 0.651935 (0.674133), N = 58 moving right + --- 1.3736 (0.599393), N = 24 moving right + --- 3.44144 (0.585879), N = 20 moving right + + -- best stat: 0.738372, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 12 2 17 1 14 + + + -- linear combo weights (showing up to 5) + + 0.1478 -0.6169 0.5688 0.5465 0.3121 + + + -- cutpoint (score) + --- 0.0166463 (0.554657), N = 247 moving right + --- 1.20072 (0.698507), N = 131 moving right + --- 1.61679 (0.66493), N = 78 moving right + --- 2.71898 (0.543059), N = 15 moving right + --- 2.77514 (0.528247), N = 11 moving right + + -- best stat: 0.698507, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 11 8 2 1 15 + + + -- linear combo weights (showing up to 5) + + 0.6524 1.1930 -0.0843 0.6166 -0.1238 + + + -- cutpoint (score) + --- -1.32545 (0.615463), N = 215 moving right + --- -1.3032 (0.618577), N = 214 moving right + --- -1.11542 (0.656286), N = 194 moving right + --- -0.692744 (0.753663), N = 145 moving right + --- -0.137389 (0.788138), N = 100 moving right + + -- best stat: 0.788138, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 3.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 2.0000e+00 + 3.3400e+02 1.0000e+00 2.0000e+00 + 3.4800e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.7000e+01 9.9275e-01 7.2596e-03 + 1.1000e+02 9.8913e-01 1.0909e-02 + 1.3100e+02 9.8551e-01 1.4572e-02 + 1.7900e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 42 -------------- + +- N obs inbag: 276 +- N row inbag: 177 +- max nodes: 229 +- max leaves: 115 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 14 4 10 17 6 + + + -- linear combo weights (showing up to 5) + + 0.2651 0.6156 -0.8312 0.6500 0.9347 + + + -- cutpoint (score) + --- 0.943431 (0.571899), N = 240 moving right + --- 1.21794 (0.592697), N = 231 moving right + --- 1.37023 (0.6), N = 218 moving right + --- 3.37536 (0.682635), N = 60 moving right + --- 3.61055 (0.672495), N = 51 moving right + + -- best stat: 0.682635, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 3 8 16 12 6 + + + -- linear combo weights (showing up to 5) + + 11.3733 1.0684 0.3331 0.1613 0.4907 + + + -- cutpoint (score) + --- -0.958418 (0.553364), N = 249 moving right + --- -0.841801 (0.585672), N = 222 moving right + --- -0.693873 (0.660865), N = 177 moving right + --- 0.0338344 (0.747172), N = 93 moving right + --- 1.18525 (0.662909), N = 42 moving right + + -- best stat: 0.747172, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 17 10 14 15 11 + + + -- linear combo weights (showing up to 5) + + 0.4632 -0.5966 0.1231 -0.2086 1.4132 + + + -- cutpoint (score) + --- 0.884256 (0.724727), N = 143 moving right + --- 0.884512 (0.727644), N = 142 moving right + --- 1.11379 (0.738023), N = 134 moving right + --- 1.21079 (0.756876), N = 118 moving right + --- 4.80402 (0.561957), N = 12 moving right + + -- best stat: 0.756876, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8551e-01 1.4546e-02 + 7.1000e+01 9.8188e-01 1.8222e-02 + 1.3100e+02 9.7464e-01 2.5602e-02 + 1.4000e+02 9.7101e-01 2.9320e-02 + + +------------ Growing tree 43 -------------- + +- N obs inbag: 276 +- N row inbag: 171 +- max nodes: 243 +- max leaves: 122 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 12 17 10 13 0 + + + -- linear combo weights (showing up to 5) + + 0.0267 0.5819 -0.5318 0.5314 -0.2282 + + + -- cutpoint (score) + --- 0.17183 (0.531256), N = 256 moving right + --- 0.613402 (0.570705), N = 237 moving right + --- 0.982899 (0.631402), N = 196 moving right + --- 1.6623 (0.707837), N = 132 moving right + --- 2.20193 (0.638747), N = 72 moving right + + -- best stat: 0.707837, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 6 15 13 1 9 + + + -- linear combo weights (showing up to 5) + + 0.8132 -0.1425 0.6310 0.4406 0.1432 + + + -- cutpoint (score) + --- -0.374922 (0.6629), N = 177 moving right + --- 0.0503388 (0.687114), N = 118 moving right + --- 0.0992989 (0.685237), N = 115 moving right + --- 0.525181 (0.683946), N = 74 moving right + --- 1.34953 (0.579442), N = 25 moving right + + -- best stat: 0.687114, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 16 11 12 4 15 + + + -- linear combo weights (showing up to 5) + + 0.5760 1.0152 -0.0604 0.4916 0.0193 + + + -- cutpoint (score) + --- -1.02452 (0.562755), N = 242 moving right + --- -0.647998 (0.64589), N = 203 moving right + --- -0.139661 (0.702934), N = 146 moving right + --- 0.274542 (0.723819), N = 116 moving right + --- 2.2724 (0.578433), N = 22 moving right + + -- best stat: 0.723819, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + 3.2600e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 1.1000e+02 9.8188e-01 1.8222e-02 + 1.4000e+02 9.7826e-01 2.1912e-02 + 1.7900e+02 9.7464e-01 2.5616e-02 + + +------------ Growing tree 44 -------------- + +- N obs inbag: 276 +- N row inbag: 176 +- max nodes: 201 +- max leaves: 101 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 16 15 3 5 7 + + + -- linear combo weights (showing up to 5) + + 0.2201 -0.0789 5.9218 0.7619 5.5352 + + + -- cutpoint (score) + --- -0.263835 (0.514868), N = 253 moving right + --- -0.156213 (0.554894), N = 217 moving right + --- -0.0712623 (0.610379), N = 178 moving right + --- -0.0702956 (0.612371), N = 175 moving right + --- 0.161572 (0.668754), N = 101 moving right + + -- best stat: 0.668754, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 6 8 2 0 14 + + + -- linear combo weights (showing up to 5) + + -0.1357 2.5951 -0.1716 -0.0440 -0.1463 + + + -- cutpoint (score) + --- -1.75501 (0.535669), N = 252 moving right + --- -1.62759 (0.599912), N = 219 moving right + --- -1.46403 (0.669608), N = 183 moving right + --- -1.44903 (0.674995), N = 179 moving right + --- -0.86337 (0.751697), N = 96 moving right + + -- best stat: 0.751697, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 3 4 13 7 0 + + + -- linear combo weights (showing up to 5) + + 6.7680 0.6466 0.4994 5.6973 -0.0968 + + + -- cutpoint (score) + --- -0.573338 (0.539063), N = 254 moving right + --- -0.192114 (0.619991), N = 197 moving right + --- -0.036269 (0.652069), N = 178 moving right + --- 0.222474 (0.695927), N = 136 moving right + --- 0.319788 (0.704423), N = 119 moving right + + -- best stat: 0.704423, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.9275e-01 7.2596e-03 + 1.1000e+02 9.8913e-01 1.0909e-02 + 1.4000e+02 9.8551e-01 1.4572e-02 + 1.7900e+02 9.8188e-01 1.8249e-02 + + +------------ Growing tree 45 -------------- + +- N obs inbag: 276 +- N row inbag: 176 +- max nodes: 215 +- max leaves: 108 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 16 13 12 5 11 + + + -- linear combo weights (showing up to 5) + + 0.7466 0.3827 -0.0499 1.0753 0.6659 + + + -- cutpoint (score) + --- -0.844067 (0.612517), N = 211 moving right + --- -0.700472 (0.632486), N = 195 moving right + --- 0.108171 (0.711373), N = 134 moving right + --- 0.164431 (0.731905), N = 123 moving right + --- 0.311435 (0.712078), N = 114 moving right + + -- best stat: 0.731905, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 12 5 0 2 11 + + + -- linear combo weights (showing up to 5) + + 0.0406 1.2167 0.1031 0.1740 0.8155 + + + -- cutpoint (score) + --- -0.341832 (0.570142), N = 223 moving right + --- -0.195951 (0.610079), N = 188 moving right + --- 1.3605 (0.697328), N = 67 moving right + --- 2.49338 (0.537257), N = 13 moving right + --- 2.749 (0.515253), N = 10 moving right + + -- best stat: 0.697328, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 17 16 10 14 15 + + + -- linear combo weights (showing up to 5) + + 0.5363 0.7763 -0.4395 0.2726 -0.1465 + + + -- cutpoint (score) + --- 0.586052 (0.572016), N = 221 moving right + --- 1.05027 (0.644515), N = 177 moving right + --- 1.48655 (0.66938), N = 134 moving right + --- 1.51378 (0.667567), N = 133 moving right + --- 4.52206 (0.542557), N = 9 moving right + + -- best stat: 0.66938, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 2.0000e+00 + 3.4800e+02 1.0000e+00 1.0000e+00 + 3.8800e+02 1.0000e+00 2.0000e+00 + 4.0000e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 7.1000e+01 9.9638e-01 3.6232e-03 + 1.1000e+02 9.8913e-01 1.0896e-02 + 1.4000e+02 9.8551e-01 1.4559e-02 + 1.9800e+02 9.7826e-01 2.1912e-02 + 2.1600e+02 9.7464e-01 2.5616e-02 + + +------------ Growing tree 46 -------------- + +- N obs inbag: 276 +- N row inbag: 184 +- max nodes: 251 +- max leaves: 126 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 0 13 12 5 15 + + + -- linear combo weights (showing up to 5) + + 0.0306 0.3131 0.1726 1.2693 -0.0786 + + + -- cutpoint (score) + --- -0.0801014 (0.622082), N = 176 moving right + --- 0.133452 (0.646613), N = 127 moving right + --- 0.348012 (0.620483), N = 108 moving right + --- 0.417846 (0.615778), N = 105 moving right + --- 1.23114 (0.612995), N = 43 moving right + + -- best stat: 0.646613, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 8 2 6 12 13 + + + -- linear combo weights (showing up to 5) + + 1.5003 -0.6011 1.2968 0.0774 -0.0866 + + + -- cutpoint (score) + --- -1.33016 (0.645176), N = 191 moving right + --- -1.24972 (0.684092), N = 172 moving right + --- -0.608962 (0.727516), N = 99 moving right + --- -0.16454 (0.688851), N = 74 moving right + --- 6.32932 (0.522969), N = 5 moving right + + -- best stat: 0.727516, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 13 16 15 10 5 + + + -- linear combo weights (showing up to 5) + + 0.3779 0.6338 -0.0183 -0.8418 0.9784 + + + -- cutpoint (score) + --- -1.32502 (0.539527), N = 254 moving right + --- -0.736144 (0.601088), N = 208 moving right + --- 1.07903 (0.686589), N = 65 moving right + --- 1.88676 (0.662039), N = 41 moving right + --- 2.0946 (0.645176), N = 37 moving right + + -- best stat: 0.686589, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 3.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.9275e-01 7.2596e-03 + 7.7000e+01 9.8913e-01 1.0909e-02 + 1.1000e+02 9.8551e-01 1.4572e-02 + 1.7900e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 47 -------------- + +- N obs inbag: 276 +- N row inbag: 183 +- max nodes: 219 +- max leaves: 110 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 13 8 9 14 6 + + + -- linear combo weights (showing up to 5) + + 0.3256 1.8631 -0.7533 0.0064 0.9692 + + + -- cutpoint (score) + --- -1.0649 (0.570692), N = 229 moving right + --- -1.04482 (0.577576), N = 225 moving right + --- -0.338307 (0.740516), N = 130 moving right + --- 0.229057 (0.742624), N = 84 moving right + --- 1.21499 (0.65724), N = 35 moving right + + -- best stat: 0.742624, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 3 15 9 11 7 + + + -- linear combo weights (showing up to 5) + + 8.2149 -0.0199 0.0366 0.8779 5.1340 + + + -- cutpoint (score) + --- -0.681309 (0.571254), N = 243 moving right + --- -0.523028 (0.639075), N = 203 moving right + --- -0.516285 (0.643531), N = 201 moving right + --- -0.368748 (0.668901), N = 169 moving right + --- 1.15927 (0.664465), N = 39 moving right + + -- best stat: 0.668901, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 6 14 7 16 0 + + + -- linear combo weights (showing up to 5) + + 1.1320 0.4591 10.1724 0.2818 -0.3702 + + + -- cutpoint (score) + --- -0.431033 (0.63769), N = 194 moving right + --- 0.0766553 (0.704287), N = 80 moving right + --- 0.406285 (0.666533), N = 53 moving right + --- 1.13589 (0.628196), N = 29 moving right + --- 2.20368 (0.602906), N = 19 moving right + + -- best stat: 0.704287, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.1000e+01 9.8913e-01 1.0909e-02 + 1.3100e+02 9.8551e-01 1.4572e-02 + 1.4000e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 48 -------------- + +- N obs inbag: 276 +- N row inbag: 174 +- max nodes: 211 +- max leaves: 106 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 11 3 0 15 5 + + + -- linear combo weights (showing up to 5) + + 0.7183 5.4370 0.0721 -0.1076 0.8120 + + + -- cutpoint (score) + --- -0.546368 (0.571002), N = 240 moving right + --- -0.227991 (0.683089), N = 160 moving right + --- -0.0308541 (0.70199), N = 135 moving right + --- 0.560203 (0.743288), N = 97 moving right + --- 1.28747 (0.668918), N = 47 moving right + + -- best stat: 0.743288, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 11 4 8 6 1 + + + -- linear combo weights (showing up to 5) + + 0.3504 0.2931 1.4797 -0.1036 0.5513 + + + -- cutpoint (score) + --- -1.0629 (0.618756), N = 200 moving right + --- -1.01043 (0.643454), N = 188 moving right + --- -0.3506 (0.753431), N = 129 moving right + --- -0.164841 (0.753431), N = 115 moving right + --- 2.66362 (0.632693), N = 31 moving right + + -- best stat: 0.753431, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 0 17 12 3 7 + + + -- linear combo weights (showing up to 5) + + -0.0291 0.4765 0.1123 1.6455 11.4946 + + + -- cutpoint (score) + --- 1.30989 (0.61784), N = 203 moving right + --- 1.38351 (0.697899), N = 151 moving right + --- 1.40374 (0.723683), N = 136 moving right + --- 1.42238 (0.710961), N = 128 moving right + --- 1.92475 (0.614686), N = 33 moving right + + -- best stat: 0.723683, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 3.0000e+00 + 5.1000e+01 1.0000e+00 3.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 3.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.8913e-01 1.0870e-02 + 5.1000e+01 9.7826e-01 2.1859e-02 + 7.1000e+01 9.7464e-01 2.5562e-02 + 1.1000e+02 9.6739e-01 3.2997e-02 + 1.3100e+02 9.6377e-01 3.6743e-02 + + +------------ Growing tree 49 -------------- + +- N obs inbag: 276 +- N row inbag: 169 +- max nodes: 227 +- max leaves: 114 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 12 17 6 3 11 + + + -- linear combo weights (showing up to 5) + + 0.0883 0.4069 0.5822 6.5191 0.7754 + + + -- cutpoint (score) + --- 0.250323 (0.572309), N = 243 moving right + --- 0.472961 (0.606456), N = 220 moving right + --- 0.797173 (0.674279), N = 177 moving right + --- 1.02228 (0.698854), N = 146 moving right + --- 1.47219 (0.754357), N = 101 moving right + + -- best stat: 0.754357, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 0 4 1 6 7 + + + -- linear combo weights (showing up to 5) + + 0.0156 0.6561 0.5518 0.4138 6.8207 + + + -- cutpoint (score) + --- -0.375808 (0.568746), N = 229 moving right + --- 0.302954 (0.662088), N = 144 moving right + --- 0.339614 (0.656271), N = 139 moving right + --- 0.505215 (0.648738), N = 114 moving right + --- 1.32904 (0.619978), N = 34 moving right + + -- best stat: 0.662088, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 7 14 17 6 12 + + + -- linear combo weights (showing up to 5) + + 6.9895 0.2945 0.5696 0.6450 0.1853 + + + -- cutpoint (score) + --- 0.980124 (0.559002), N = 240 moving right + --- 1.06181 (0.576), N = 230 moving right + --- 1.44075 (0.632898), N = 195 moving right + --- 1.62957 (0.663741), N = 168 moving right + --- 1.77838 (0.681834), N = 151 moving right + + -- best stat: 0.681834, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 4.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 3.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + 3.2600e+02 1.0000e+00 2.0000e+00 + 3.3400e+02 1.0000e+00 2.0000e+00 + 3.4800e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 1.1000e+02 9.8188e-01 1.8169e-02 + 1.3100e+02 9.7464e-01 2.5549e-02 + 1.4000e+02 9.7101e-01 2.9266e-02 + 2.2300e+02 9.6739e-01 3.2998e-02 + + +------------ Growing tree 50 -------------- + +- N obs inbag: 276 +- N row inbag: 178 +- max nodes: 219 +- max leaves: 110 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 13 9 16 11 7 + + + -- linear combo weights (showing up to 5) + + 0.1817 0.3673 0.7147 0.7193 5.2958 + + + -- cutpoint (score) + --- -1.52759 (0.528653), N = 261 moving right + --- -1.28268 (0.568703), N = 238 moving right + --- -0.872669 (0.637364), N = 201 moving right + --- -0.49394 (0.714245), N = 145 moving right + --- -0.202434 (0.756425), N = 120 moving right + + -- best stat: 0.756425, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 13 10 1 0 8 + + + -- linear combo weights (showing up to 5) + + -0.0500 -0.6235 0.2349 -0.0325 1.9208 + + + -- cutpoint (score) + --- -1.46016 (0.618487), N = 216 moving right + --- -1.27764 (0.662923), N = 192 moving right + --- -1.01889 (0.728858), N = 152 moving right + --- 0.193089 (0.771224), N = 85 moving right + --- 3.33368 (0.639762), N = 24 moving right + + -- best stat: 0.771224, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 9 11 2 5 7 + + + -- linear combo weights (showing up to 5) + + 0.4147 0.9210 0.6221 0.0748 5.8369 + + + -- cutpoint (score) + --- 0.157975 (0.69957), N = 157 moving right + --- 0.437475 (0.728674), N = 126 moving right + --- 1.02592 (0.745214), N = 77 moving right + --- 4.19645 (0.614306), N = 22 moving right + --- 7.35641 (0.533593), N = 6 moving right + + -- best stat: 0.745214, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 3.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 3.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8551e-01 1.4532e-02 + 7.7000e+01 9.8188e-01 1.8209e-02 + 1.3100e+02 9.7826e-01 2.1899e-02 + 1.4000e+02 9.6739e-01 3.3010e-02 + + +------------ Growing tree 51 -------------- + +- N obs inbag: 276 +- N row inbag: 169 +- max nodes: 231 +- max leaves: 116 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 6 14 2 9 13 + + + -- linear combo weights (showing up to 5) + + 1.6086 0.1719 0.3637 0.7404 0.4507 + + + -- cutpoint (score) + --- -0.27924 (0.564497), N = 210 moving right + --- -0.224141 (0.571238), N = 207 moving right + --- -0.0580393 (0.626116), N = 171 moving right + --- 0.548736 (0.629681), N = 105 moving right + --- 1.55491 (0.615639), N = 31 moving right + + -- best stat: 0.629681, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 7 11 6 14 3 + + + -- linear combo weights (showing up to 5) + + 5.3124 0.4655 1.2615 0.2820 4.3025 + + + -- cutpoint (score) + --- -0.714234 (0.514385), N = 271 moving right + --- -0.172815 (0.664355), N = 159 moving right + --- 0.447975 (0.691171), N = 68 moving right + --- 0.57456 (0.674468), N = 63 moving right + --- 0.576156 (0.679062), N = 61 moving right + + -- best stat: 0.691171, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 11 16 12 0 1 + + + -- linear combo weights (showing up to 5) + + 0.7240 0.5318 0.1332 0.0888 0.2085 + + + -- cutpoint (score) + --- -0.491353 (0.669443), N = 164 moving right + --- -0.222734 (0.678332), N = 136 moving right + --- 1.15523 (0.648574), N = 46 moving right + --- 1.64056 (0.560289), N = 24 moving right + --- 1.76715 (0.562994), N = 22 moving right + + -- best stat: 0.678332, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 3.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.9275e-01 7.2596e-03 + 1.1000e+02 9.8913e-01 1.0909e-02 + 1.3100e+02 9.8551e-01 1.4572e-02 + 1.4000e+02 9.8188e-01 1.8249e-02 + + +------------ Growing tree 52 -------------- + +- N obs inbag: 276 +- N row inbag: 173 +- max nodes: 189 +- max leaves: 95 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 7 15 12 11 13 + + + -- linear combo weights (showing up to 5) + + 5.2007 0.0683 0.0908 0.5045 0.3190 + + + -- cutpoint (score) + --- -0.102083 (0.729811), N = 133 moving right + --- -0.0304747 (0.716336), N = 121 moving right + --- 0.166755 (0.718905), N = 97 moving right + --- 0.701717 (0.664353), N = 53 moving right + --- 0.845823 (0.632312), N = 40 moving right + + -- best stat: 0.729811, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 4 12 14 11 5 + + + -- linear combo weights (showing up to 5) + + 0.7840 -0.0279 0.4632 0.5622 1.1015 + + + -- cutpoint (score) + --- -0.210899 (0.65027), N = 191 moving right + --- 0.225847 (0.681546), N = 159 moving right + --- 0.457553 (0.720054), N = 142 moving right + --- 0.687814 (0.713452), N = 130 moving right + --- 0.976671 (0.7121), N = 111 moving right + + -- best stat: 0.720054, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 10 16 8 3 1 + + + -- linear combo weights (showing up to 5) + + -0.4651 0.1310 1.7158 5.7731 0.0479 + + + -- cutpoint (score) + --- -0.858036 (0.681501), N = 160 moving right + --- 0.380211 (0.763542), N = 64 moving right + --- 0.769571 (0.723907), N = 50 moving right + --- 1.68184 (0.675034), N = 37 moving right + --- 1.8476 (0.666471), N = 33 moving right + + -- best stat: 0.763542, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 3.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.7826e-01 2.1885e-02 + 1.1000e+02 9.7101e-01 2.9292e-02 + 1.8600e+02 9.6739e-01 3.3024e-02 + + +------------ Growing tree 53 -------------- + +- N obs inbag: 276 +- N row inbag: 179 +- max nodes: 201 +- max leaves: 101 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 5 14 10 8 17 + + + -- linear combo weights (showing up to 5) + + 1.0095 -0.0819 -0.2910 1.8069 0.3636 + + + -- cutpoint (score) + --- 0.160812 (0.660514), N = 180 moving right + --- 0.259537 (0.67946), N = 168 moving right + --- 0.404237 (0.707245), N = 154 moving right + --- 0.645568 (0.724303), N = 132 moving right + --- 3.0028 (0.644945), N = 29 moving right + + -- best stat: 0.724303, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 13 12 7 2 11 + + + -- linear combo weights (showing up to 5) + + 0.0569 -0.0661 5.0609 0.3967 1.0562 + + + -- cutpoint (score) + --- -0.484471 (0.546908), N = 242 moving right + --- -0.455458 (0.560701), N = 234 moving right + --- -0.0682722 (0.642369), N = 163 moving right + --- 0.121074 (0.683547), N = 115 moving right + --- 0.506621 (0.705424), N = 72 moving right + + -- best stat: 0.705424, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 15 17 10 2 0 + + + -- linear combo weights (showing up to 5) + + -0.0521 0.6841 -0.4597 -1.0261 -0.2557 + + + -- cutpoint (score) + --- -0.189374 (0.542777), N = 251 moving right + --- 0.210905 (0.592506), N = 211 moving right + --- 0.76783 (0.666156), N = 145 moving right + --- 0.903603 (0.675173), N = 132 moving right + --- 2.64414 (0.536225), N = 9 moving right + + -- best stat: 0.675173, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 3.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 7.1000e+01 9.9638e-01 3.6232e-03 + 7.7000e+01 9.8551e-01 1.4532e-02 + 1.1000e+02 9.8188e-01 1.8209e-02 + 1.3100e+02 9.7826e-01 2.1899e-02 + 1.7900e+02 9.7464e-01 2.5602e-02 + + +------------ Growing tree 54 -------------- + +- N obs inbag: 276 +- N row inbag: 172 +- max nodes: 193 +- max leaves: 97 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 6 3 2 10 16 + + + -- linear combo weights (showing up to 5) + + -0.5157 10.9687 -0.7407 -0.7633 0.3513 + + + -- cutpoint (score) + --- -2.28807 (0.5037), N = 270 moving right + --- -1.78758 (0.546337), N = 249 moving right + --- -0.988258 (0.686319), N = 148 moving right + --- -0.582385 (0.701559), N = 104 moving right + --- 10.0661 (0.600846), N = 16 moving right + + -- best stat: 0.701559, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 13 4 10 0 17 + + + -- linear combo weights (showing up to 5) + + 0.4389 0.2892 -0.9065 -0.0210 0.4085 + + + -- cutpoint (score) + --- -0.227314 (0.546183), N = 248 moving right + --- 0.677833 (0.643307), N = 191 moving right + --- 0.869574 (0.672422), N = 169 moving right + --- 1.97639 (0.690636), N = 79 moving right + --- 2.12178 (0.69112), N = 68 moving right + + -- best stat: 0.69112, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 4 3 2 0 17 + + + -- linear combo weights (showing up to 5) + + 0.5321 12.1223 -0.4592 0.1372 0.2969 + + + -- cutpoint (score) + --- 0.728302 (0.655244), N = 166 moving right + --- 1.26042 (0.650112), N = 62 moving right + --- 1.26304 (0.652865), N = 61 moving right + --- 1.39757 (0.632163), N = 32 moving right + --- 1.42278 (0.626371), N = 31 moving right + + -- best stat: 0.655244, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 3.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8551e-01 1.4532e-02 + 7.1000e+01 9.8188e-01 1.8209e-02 + 7.7000e+01 9.7826e-01 2.1899e-02 + 1.1000e+02 9.7464e-01 2.5602e-02 + + +------------ Growing tree 55 -------------- + +- N obs inbag: 276 +- N row inbag: 179 +- max nodes: 213 +- max leaves: 107 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 3 0 14 6 12 + + + -- linear combo weights (showing up to 5) + + 9.4145 0.2435 0.0716 0.5962 0.1775 + + + -- cutpoint (score) + --- -0.159131 (0.526044), N = 259 moving right + --- 0.104451 (0.600282), N = 152 moving right + --- 0.16357 (0.618453), N = 113 moving right + --- 0.167547 (0.621623), N = 112 moving right + --- 0.470946 (0.624772), N = 52 moving right + + -- best stat: 0.624772, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 11 2 0 9 6 + + + -- linear combo weights (showing up to 5) + + 1.1142 -0.0397 0.3828 0.3663 0.7085 + + + -- cutpoint (score) + --- -1.05989 (0.536508), N = 255 moving right + --- -0.958766 (0.556274), N = 247 moving right + --- -0.622907 (0.621395), N = 203 moving right + --- -0.487055 (0.650298), N = 180 moving right + --- 0.425464 (0.678187), N = 89 moving right + + -- best stat: 0.678187, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 13 12 17 1 6 + + + -- linear combo weights (showing up to 5) + + 0.5528 0.1315 0.5141 0.3995 0.4549 + + + -- cutpoint (score) + --- 0.913447 (0.611367), N = 220 moving right + --- 1.44115 (0.689272), N = 155 moving right + --- 2.44285 (0.662461), N = 58 moving right + --- 2.49383 (0.653717), N = 55 moving right + --- 2.51426 (0.618494), N = 50 moving right + + -- best stat: 0.689272, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.7000e+01 9.8913e-01 1.0896e-02 + 1.1000e+02 9.8551e-01 1.4559e-02 + 1.4000e+02 9.8188e-01 1.8235e-02 + 1.7900e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 56 -------------- + +- N obs inbag: 276 +- N row inbag: 162 +- max nodes: 207 +- max leaves: 104 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 8 6 1 11 2 + + + -- linear combo weights (showing up to 5) + + 2.1489 0.2205 0.4919 0.3366 0.0209 + + + -- cutpoint (score) + --- -0.90621 (0.713913), N = 152 moving right + --- -0.403286 (0.742329), N = 106 moving right + --- -0.384065 (0.747361), N = 98 moving right + --- 0.161231 (0.743317), N = 73 moving right + --- 2.53508 (0.627881), N = 28 moving right + + -- best stat: 0.747361, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 8 14 5 6 12 + + + -- linear combo weights (showing up to 5) + + 2.4862 -0.3434 0.8844 0.4269 0.1665 + + + -- cutpoint (score) + --- -1.19966 (0.632059), N = 197 moving right + --- -0.222939 (0.727751), N = 107 moving right + --- 0.142287 (0.729682), N = 89 moving right + --- 2.75473 (0.624354), N = 22 moving right + --- 3.24105 (0.612808), N = 20 moving right + + -- best stat: 0.729682, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 14 13 3 5 1 + + + -- linear combo weights (showing up to 5) + + 0.1640 0.3035 5.4090 1.1977 0.4345 + + + -- cutpoint (score) + --- -0.260956 (0.591895), N = 220 moving right + --- -0.081783 (0.626556), N = 195 moving right + --- 0.91295 (0.745137), N = 67 moving right + --- 1.21245 (0.71598), N = 59 moving right + --- 6.48891 (0.567546), N = 13 moving right + + -- best stat: 0.745137, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 3.0000e+00 + 1.4000e+02 1.0000e+00 3.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 3.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.1000e+01 9.8188e-01 1.8222e-02 + 7.7000e+01 9.7464e-01 2.5602e-02 + 1.1000e+02 9.6377e-01 3.6754e-02 + + +------------ Growing tree 57 -------------- + +- N obs inbag: 276 +- N row inbag: 172 +- max nodes: 251 +- max leaves: 126 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 12 8 10 17 9 + + + -- linear combo weights (showing up to 5) + + -0.0011 1.7251 -0.2610 0.5706 -0.4236 + + + -- cutpoint (score) + --- 1.35972 (0.70886), N = 120 moving right + --- 1.74351 (0.745059), N = 94 moving right + --- 2.13724 (0.743052), N = 73 moving right + --- 4.97862 (0.592427), N = 18 moving right + --- 5.01315 (0.586293), N = 17 moving right + + -- best stat: 0.745059, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 0 15 13 7 4 + + + -- linear combo weights (showing up to 5) + + -0.0414 0.1353 0.4463 14.2747 0.6291 + + + -- cutpoint (score) + --- -0.623098 (0.508349), N = 267 moving right + --- -0.46472 (0.541708), N = 253 moving right + --- -0.0155103 (0.63953), N = 192 moving right + --- 0.339671 (0.688073), N = 127 moving right + --- 1.89659 (0.57677), N = 15 moving right + + -- best stat: 0.688073, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 2 15 8 5 9 + + + -- linear combo weights (showing up to 5) + + -0.5272 -0.0380 1.8255 0.8685 -0.4200 + + + -- cutpoint (score) + --- -1.27633 (0.644226), N = 193 moving right + --- -1.21782 (0.651931), N = 190 moving right + --- -0.0181116 (0.74805), N = 87 moving right + --- 0.134361 (0.743923), N = 79 moving right + --- 0.583127 (0.708747), N = 54 moving right + + -- best stat: 0.74805, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 3.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8551e-01 1.4546e-02 + 7.1000e+01 9.8188e-01 1.8222e-02 + 7.7000e+01 9.7826e-01 2.1912e-02 + 1.4000e+02 9.7464e-01 2.5616e-02 + + +------------ Growing tree 58 -------------- + +- N obs inbag: 276 +- N row inbag: 172 +- max nodes: 209 +- max leaves: 105 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 3 1 2 12 8 + + + -- linear combo weights (showing up to 5) + + 7.9753 0.3504 -0.7903 0.2103 1.1651 + + + -- cutpoint (score) + --- -1.47548 (0.623275), N = 191 moving right + --- -1.16374 (0.73486), N = 134 moving right + --- -1.06319 (0.733388), N = 127 moving right + --- -0.841144 (0.746506), N = 110 moving right + --- 0.0200263 (0.703305), N = 54 moving right + + -- best stat: 0.746506, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 2 6 1 16 0 + + + -- linear combo weights (showing up to 5) + + -0.7439 -0.0811 0.3099 0.4737 0.1112 + + + -- cutpoint (score) + --- -1.10253 (0.57781), N = 217 moving right + --- -0.865345 (0.63769), N = 156 moving right + --- -0.679453 (0.660785), N = 120 moving right + --- -0.356487 (0.63279), N = 61 moving right + --- 0.374905 (0.575723), N = 16 moving right + + -- best stat: 0.660785, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 15 9 0 5 17 + + + -- linear combo weights (showing up to 5) + + -0.0226 0.6451 -0.0990 0.5317 0.5721 + + + -- cutpoint (score) + --- 0.966923 (0.607893), N = 220 moving right + --- 1.24396 (0.643579), N = 194 moving right + --- 1.7134 (0.681529), N = 144 moving right + --- 2.26781 (0.644019), N = 63 moving right + --- 2.55306 (0.573086), N = 34 moving right + + -- best stat: 0.681529, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 3.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + 3.2600e+02 1.0000e+00 2.0000e+00 + 3.3400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 1.1000e+02 9.9275e-01 7.2596e-03 + 1.7900e+02 9.8551e-01 1.4559e-02 + 1.9100e+02 9.8188e-01 1.8235e-02 + 1.9800e+02 9.7101e-01 2.9305e-02 + + +------------ Growing tree 59 -------------- + +- N obs inbag: 276 +- N row inbag: 169 +- max nodes: 213 +- max leaves: 107 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 2 12 7 5 14 + + + -- linear combo weights (showing up to 5) + + -1.0398 0.0010 25.0359 0.7584 0.3414 + + + -- cutpoint (score) + --- -1.3169 (0.532679), N = 255 moving right + --- -0.45912 (0.65516), N = 88 moving right + --- -0.328451 (0.642699), N = 66 moving right + --- -0.0161812 (0.618038), N = 43 moving right + --- 0.151293 (0.599597), N = 34 moving right + + -- best stat: 0.65516, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 1 6 0 14 17 + + + -- linear combo weights (showing up to 5) + + 0.2671 0.6886 -0.2225 0.3793 0.5673 + + + -- cutpoint (score) + --- 1.41599 (0.637152), N = 164 moving right + --- 1.46457 (0.610866), N = 159 moving right + --- 1.62097 (0.630824), N = 135 moving right + --- 2.19175 (0.646773), N = 67 moving right + --- 2.64487 (0.596541), N = 31 moving right + + -- best stat: 0.646773, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 11 6 7 14 8 + + + -- linear combo weights (showing up to 5) + + 0.6042 1.6070 21.8213 -0.1715 1.3036 + + + -- cutpoint (score) + --- -1.11774 (0.585576), N = 231 moving right + --- -0.86472 (0.659906), N = 190 moving right + --- -0.631789 (0.720257), N = 154 moving right + --- -0.520524 (0.731028), N = 139 moving right + --- 0.520002 (0.707342), N = 86 moving right + + -- best stat: 0.731028, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 2.0000e+00 + 3.3400e+02 1.0000e+00 1.0000e+00 + 3.4800e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9275e-01 7.2464e-03 + 7.1000e+01 9.8913e-01 1.0896e-02 + 1.3100e+02 9.8188e-01 1.8222e-02 + 1.4000e+02 9.7464e-01 2.5602e-02 + 1.7900e+02 9.7101e-01 2.9320e-02 + + +------------ Growing tree 60 -------------- + +- N obs inbag: 276 +- N row inbag: 174 +- max nodes: 223 +- max leaves: 112 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 8 13 9 12 7 + + + -- linear combo weights (showing up to 5) + + 1.0580 0.0806 0.1565 0.0251 5.6605 + + + -- cutpoint (score) + --- -0.777565 (0.55163), N = 249 moving right + --- -0.560784 (0.672183), N = 179 moving right + --- -0.478371 (0.71951), N = 145 moving right + --- -0.136938 (0.736451), N = 104 moving right + --- 4.16466 (0.594841), N = 18 moving right + + -- best stat: 0.736451, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 1 5 3 9 13 + + + -- linear combo weights (showing up to 5) + + 0.4640 1.1916 4.8646 0.3251 0.4300 + + + -- cutpoint (score) + --- -0.300324 (0.622994), N = 205 moving right + --- 0.685805 (0.713946), N = 96 moving right + --- 1.11408 (0.684097), N = 67 moving right + --- 1.87008 (0.616002), N = 29 moving right + --- 4.63773 (0.580775), N = 12 moving right + + -- best stat: 0.713946, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 6 14 0 3 5 + + + -- linear combo weights (showing up to 5) + + 1.4212 0.1998 -0.0739 5.0682 1.1226 + + + -- cutpoint (score) + --- -0.103982 (0.621587), N = 188 moving right + --- -0.0703196 (0.647319), N = 173 moving right + --- 1.09814 (0.648581), N = 49 moving right + --- 1.27257 (0.612051), N = 37 moving right + --- 6.17201 (0.538867), N = 6 moving right + + -- best stat: 0.648581, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 3.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9275e-01 7.2464e-03 + 7.7000e+01 9.8913e-01 1.0896e-02 + 1.4000e+02 9.8188e-01 1.8222e-02 + 1.7900e+02 9.7826e-01 2.1912e-02 + 1.8600e+02 9.7464e-01 2.5616e-02 + + +------------ Growing tree 61 -------------- + +- N obs inbag: 276 +- N row inbag: 176 +- max nodes: 243 +- max leaves: 122 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 7 16 3 1 15 + + + -- linear combo weights (showing up to 5) + + 3.7612 0.2938 1.1887 0.2188 -0.0165 + + + -- cutpoint (score) + --- -0.386436 (0.546644), N = 231 moving right + --- -0.309634 (0.561903), N = 223 moving right + --- -0.174686 (0.611133), N = 168 moving right + --- 0.0255656 (0.63557), N = 119 moving right + --- 0.450073 (0.591788), N = 48 moving right + + -- best stat: 0.63557, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 3 14 10 15 2 + + + -- linear combo weights (showing up to 5) + + 1.1623 0.3050 -0.5419 -0.2213 -0.0911 + + + -- cutpoint (score) + --- -1.68608 (0.484623), N = 271 moving right + --- -0.740322 (0.557738), N = 224 moving right + --- -0.660631 (0.559791), N = 207 moving right + --- -0.151333 (0.625247), N = 120 moving right + --- 0.539567 (0.620411), N = 44 moving right + + -- best stat: 0.625247, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 3 4 14 5 15 + + + -- linear combo weights (showing up to 5) + + 1.9875 0.5604 0.2699 1.0017 -0.2168 + + + -- cutpoint (score) + --- -0.564015 (0.484603), N = 268 moving right + --- -0.464169 (0.497651), N = 262 moving right + --- 0.182403 (0.639755), N = 173 moving right + --- 0.735161 (0.658745), N = 114 moving right + --- 1.3982 (0.63257), N = 53 moving right + + -- best stat: 0.658745, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 6.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 4.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + 3.2600e+02 1.0000e+00 3.0000e+00 + 3.3400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.7464e-01 2.5441e-02 + 1.1000e+02 9.7101e-01 2.9159e-02 + 1.7900e+02 9.6739e-01 3.2890e-02 + 1.9800e+02 9.5290e-01 4.7871e-02 + + +------------ Growing tree 62 -------------- + +- N obs inbag: 276 +- N row inbag: 175 +- max nodes: 197 +- max leaves: 99 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 17 9 10 4 16 + + + -- linear combo weights (showing up to 5) + + 0.1746 0.8136 -0.4285 0.7442 0.3888 + + + -- cutpoint (score) + --- -0.647358 (0.538123), N = 254 moving right + --- -0.193914 (0.608836), N = 217 moving right + --- 1.81429 (0.641491), N = 44 moving right + --- 1.82697 (0.643299), N = 43 moving right + --- 2.2204 (0.58936), N = 20 moving right + + -- best stat: 0.643299, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 11 5 16 13 1 + + + -- linear combo weights (showing up to 5) + + 0.9278 0.3382 0.2422 0.4903 0.6417 + + + -- cutpoint (score) + --- -1.50099 (0.558187), N = 245 moving right + --- -1.32102 (0.578512), N = 231 moving right + --- -1.3019 (0.581344), N = 230 moving right + --- -0.100163 (0.742855), N = 120 moving right + --- 1.42184 (0.663798), N = 38 moving right + + -- best stat: 0.742855, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 5 9 11 14 13 + + + -- linear combo weights (showing up to 5) + + 0.4969 0.3793 0.9012 0.1671 0.2661 + + + -- cutpoint (score) + --- -1.55458 (0.510958), N = 271 moving right + --- -0.594036 (0.643212), N = 178 moving right + --- 0.422781 (0.694166), N = 77 moving right + --- 2.14729 (0.531283), N = 11 moving right + --- 3.27818 (0.506928), N = 6 moving right + + -- best stat: 0.694166, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 3.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.4800e+02 1.0000e+00 1.0000e+00 + 4.6000e+02 1.0000e+00 1.0000e+00 + 5.1500e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.7000e+01 9.8913e-01 1.0909e-02 + 1.8600e+02 9.7826e-01 2.1898e-02 + 1.9100e+02 9.7464e-01 2.5602e-02 + + +------------ Growing tree 63 -------------- + +- N obs inbag: 276 +- N row inbag: 175 +- max nodes: 239 +- max leaves: 120 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 13 5 4 16 15 + + + -- linear combo weights (showing up to 5) + + 0.4777 1.2882 0.3304 0.4117 -0.2099 + + + -- cutpoint (score) + --- -0.134193 (0.638692), N = 180 moving right + --- 0.411706 (0.672938), N = 133 moving right + --- 1.0893 (0.66531), N = 79 moving right + --- 2.17366 (0.593949), N = 19 moving right + --- 2.87648 (0.545294), N = 9 moving right + + -- best stat: 0.672938, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 0 17 9 7 12 + + + -- linear combo weights (showing up to 5) + + -0.2716 0.4399 0.5939 6.6139 0.0737 + + + -- cutpoint (score) + --- 1.1127 (0.640088), N = 165 moving right + --- 1.20847 (0.670028), N = 143 moving right + --- 1.37096 (0.683396), N = 106 moving right + --- 1.39739 (0.675611), N = 97 moving right + --- 1.52477 (0.674884), N = 69 moving right + + -- best stat: 0.683396, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 3 8 9 6 10 + + + -- linear combo weights (showing up to 5) + + 5.9686 1.3523 -0.0418 0.1775 -0.2662 + + + -- cutpoint (score) + --- -0.636567 (0.685736), N = 150 moving right + --- -0.486117 (0.735079), N = 118 moving right + --- -0.408593 (0.748172), N = 109 moving right + --- -0.0520709 (0.744437), N = 84 moving right + --- 7.73565 (0.537057), N = 7 moving right + + -- best stat: 0.748172, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 3.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 7.1000e+01 9.9638e-01 3.6232e-03 + 1.1000e+02 9.8913e-01 1.0896e-02 + 1.3100e+02 9.8551e-01 1.4559e-02 + 1.7900e+02 9.8188e-01 1.8235e-02 + 1.9100e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 64 -------------- + +- N obs inbag: 276 +- N row inbag: 180 +- max nodes: 201 +- max leaves: 101 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 13 16 3 2 6 + + + -- linear combo weights (showing up to 5) + + 0.5471 0.4379 11.6841 -0.3262 0.3842 + + + -- cutpoint (score) + --- -1.09535 (0.543409), N = 250 moving right + --- -0.902519 (0.589996), N = 227 moving right + --- -0.38323 (0.690511), N = 150 moving right + --- -0.371809 (0.692293), N = 149 moving right + --- -0.183644 (0.712194), N = 117 moving right + + -- best stat: 0.712194, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 1 8 12 9 11 + + + -- linear combo weights (showing up to 5) + + 0.7390 2.2201 -0.0873 -0.3656 0.2983 + + + -- cutpoint (score) + --- -1.85919 (0.569064), N = 229 moving right + --- -1.60375 (0.608566), N = 212 moving right + --- 0.920438 (0.706505), N = 52 moving right + --- 2.67573 (0.637312), N = 28 moving right + --- 3.22361 (0.629261), N = 23 moving right + + -- best stat: 0.706505, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 5 6 2 1 3 + + + -- linear combo weights (showing up to 5) + + 0.8156 0.5113 -0.5062 0.6405 11.4749 + + + -- cutpoint (score) + --- -0.87902 (0.56827), N = 210 moving right + --- -0.728061 (0.595771), N = 197 moving right + --- 0.101599 (0.738471), N = 97 moving right + --- 0.559601 (0.715393), N = 55 moving right + --- 0.653526 (0.683813), N = 49 moving right + + -- best stat: 0.738471, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 4.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.4800e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.8551e-01 1.4493e-02 + 5.1000e+01 9.8188e-01 1.8169e-02 + 7.7000e+01 9.7826e-01 2.1859e-02 + 1.1000e+02 9.7101e-01 2.9267e-02 + 1.7900e+02 9.6739e-01 3.2998e-02 + + +------------ Growing tree 65 -------------- + +- N obs inbag: 276 +- N row inbag: 172 +- max nodes: 233 +- max leaves: 117 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 17 4 14 12 7 + + + -- linear combo weights (showing up to 5) + + 0.6600 -0.1431 0.4196 0.1312 9.4222 + + + -- cutpoint (score) + --- 1.06547 (0.568418), N = 241 moving right + --- 1.09963 (0.573931), N = 237 moving right + --- 1.20608 (0.585497), N = 232 moving right + --- 1.61869 (0.648402), N = 183 moving right + --- 2.46525 (0.687718), N = 71 moving right + + -- best stat: 0.687718, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 6 12 3 1 11 + + + -- linear combo weights (showing up to 5) + + 0.6249 0.0509 4.8408 0.3901 0.6414 + + + -- cutpoint (score) + --- -0.835641 (0.574617), N = 234 moving right + --- -0.501157 (0.638126), N = 196 moving right + --- -0.139196 (0.740868), N = 136 moving right + --- 0.118394 (0.763147), N = 101 moving right + --- 0.838312 (0.702821), N = 63 moving right + + -- best stat: 0.763147, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 6 2 7 14 0 + + + -- linear combo weights (showing up to 5) + + 1.0189 0.1448 9.9386 0.4199 -0.0801 + + + -- cutpoint (score) + --- 0.0515974 (0.671472), N = 149 moving right + --- 0.100105 (0.676943), N = 131 moving right + --- 0.142038 (0.671555), N = 124 moving right + --- 0.470079 (0.690027), N = 77 moving right + --- 1.92285 (0.61799), N = 23 moving right + + -- best stat: 0.690027, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 4.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 3.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 3.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.8551e-01 1.4493e-02 + 7.1000e+01 9.8188e-01 1.8169e-02 + 1.1000e+02 9.7826e-01 2.1859e-02 + 1.3100e+02 9.7464e-01 2.5563e-02 + 1.4000e+02 9.7101e-01 2.9280e-02 + + +------------ Growing tree 66 -------------- + +- N obs inbag: 276 +- N row inbag: 174 +- max nodes: 225 +- max leaves: 113 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 10 11 6 17 14 + + + -- linear combo weights (showing up to 5) + + -0.4349 0.9974 1.1627 0.3062 0.0919 + + + -- cutpoint (score) + --- -0.390873 (0.525417), N = 254 moving right + --- -0.109582 (0.575908), N = 217 moving right + --- 0.674871 (0.663581), N = 151 moving right + --- 1.37369 (0.722365), N = 85 moving right + --- 1.37713 (0.725687), N = 83 moving right + + -- best stat: 0.725687, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 11 15 3 1 5 + + + -- linear combo weights (showing up to 5) + + 1.0137 -0.0860 4.4992 0.2520 0.8932 + + + -- cutpoint (score) + --- -1.04985 (0.523874), N = 262 moving right + --- -0.289017 (0.666988), N = 163 moving right + --- 0.297674 (0.705671), N = 118 moving right + --- 0.482711 (0.737088), N = 100 moving right + --- 1.16292 (0.712164), N = 52 moving right + + -- best stat: 0.737088, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 12 8 1 17 7 + + + -- linear combo weights (showing up to 5) + + -0.1186 2.2435 0.3552 0.2344 5.4736 + + + -- cutpoint (score) + --- -0.992024 (0.541597), N = 255 moving right + --- -0.387989 (0.652051), N = 170 moving right + --- -0.370002 (0.669238), N = 161 moving right + --- -0.0163443 (0.742896), N = 121 moving right + --- 2.30677 (0.696477), N = 38 moving right + + -- best stat: 0.742896, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.8188e-01 1.8222e-02 + 1.1000e+02 9.7826e-01 2.1912e-02 + 1.3100e+02 9.7464e-01 2.5616e-02 + + +------------ Growing tree 67 -------------- + +- N obs inbag: 276 +- N row inbag: 172 +- max nodes: 221 +- max leaves: 111 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 0 13 10 15 5 + + + -- linear combo weights (showing up to 5) + + 0.0513 0.1573 -0.7028 -0.2531 1.5823 + + + -- cutpoint (score) + --- -0.729687 (0.553718), N = 242 moving right + --- 0.191844 (0.696312), N = 139 moving right + --- 0.506729 (0.6806), N = 116 moving right + --- 0.773265 (0.673576), N = 96 moving right + --- 1.55843 (0.651623), N = 55 moving right + + -- best stat: 0.696312, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 15 17 6 5 12 + + + -- linear combo weights (showing up to 5) + + -0.1782 0.4374 1.0456 1.3517 0.1991 + + + -- cutpoint (score) + --- 0.663402 (0.553638), N = 245 moving right + --- 1.57618 (0.681603), N = 140 moving right + --- 2.27328 (0.680359), N = 90 moving right + --- 2.57941 (0.666091), N = 70 moving right + --- 2.89445 (0.667356), N = 62 moving right + + -- best stat: 0.681603, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 3 12 2 4 17 + + + -- linear combo weights (showing up to 5) + + 4.7400 0.1953 -0.4690 0.5474 0.3450 + + + -- cutpoint (score) + --- 0.144204 (0.560742), N = 244 moving right + --- 0.481409 (0.64155), N = 191 moving right + --- 0.53635 (0.665329), N = 173 moving right + --- 1.38636 (0.630995), N = 72 moving right + --- 1.516 (0.605029), N = 49 moving right + + -- best stat: 0.665329, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 3.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.9275e-01 7.2596e-03 + 7.7000e+01 9.8551e-01 1.4559e-02 + 1.8600e+02 9.7464e-01 2.5588e-02 + 1.9100e+02 9.6739e-01 3.3023e-02 + + +------------ Growing tree 68 -------------- + +- N obs inbag: 276 +- N row inbag: 181 +- max nodes: 235 +- max leaves: 118 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 11 15 0 1 6 + + + -- linear combo weights (showing up to 5) + + 1.1973 -0.2323 0.1661 0.4321 0.9453 + + + -- cutpoint (score) + --- -0.682173 (0.649033), N = 188 moving right + --- -0.307618 (0.723145), N = 143 moving right + --- -0.0135752 (0.735602), N = 121 moving right + --- 0.251811 (0.743529), N = 102 moving right + --- 1.28812 (0.664833), N = 49 moving right + + -- best stat: 0.743529, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 17 10 5 1 2 + + + -- linear combo weights (showing up to 5) + + 0.3452 -0.5889 0.6304 0.3001 -0.8756 + + + -- cutpoint (score) + --- -0.308601 (0.615365), N = 205 moving right + --- 0.717914 (0.712827), N = 109 moving right + --- 1.00319 (0.694025), N = 79 moving right + --- 1.11715 (0.670873), N = 69 moving right + --- 1.97966 (0.598253), N = 25 moving right + + -- best stat: 0.712827, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 14 1 15 12 3 + + + -- linear combo weights (showing up to 5) + + 0.0721 0.4026 -0.2330 0.3053 8.9942 + + + -- cutpoint (score) + --- -0.798906 (0.534908), N = 250 moving right + --- -0.313749 (0.621423), N = 184 moving right + --- 0.0383332 (0.658434), N = 132 moving right + --- 0.155418 (0.683132), N = 115 moving right + --- 9.9194 (0.528095), N = 5 moving right + + -- best stat: 0.683132, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 3.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 3.0000e+00 + 3.0400e+02 1.0000e+00 4.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 7.7000e+01 9.9638e-01 3.6232e-03 + 1.1000e+02 9.8551e-01 1.4532e-02 + 1.3100e+02 9.8188e-01 1.8209e-02 + 1.7900e+02 9.7464e-01 2.5589e-02 + 1.9800e+02 9.7101e-01 2.9306e-02 + + +------------ Growing tree 69 -------------- + +- N obs inbag: 276 +- N row inbag: 175 +- max nodes: 199 +- max leaves: 100 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 7 11 14 15 12 + + + -- linear combo weights (showing up to 5) + + 8.5757 0.8094 0.2511 0.0121 -0.1246 + + + -- cutpoint (score) + --- -0.838018 (0.539533), N = 255 moving right + --- -0.690172 (0.580259), N = 233 moving right + --- -0.648228 (0.59862), N = 224 moving right + --- -0.04699 (0.718156), N = 112 moving right + --- 0.0159781 (0.711106), N = 102 moving right + + -- best stat: 0.718156, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 9 5 4 6 12 + + + -- linear combo weights (showing up to 5) + + 0.5984 1.1132 0.3319 1.3669 0.0909 + + + -- cutpoint (score) + --- 0.0297985 (0.638302), N = 172 moving right + --- 0.114798 (0.655789), N = 163 moving right + --- 0.371046 (0.689465), N = 122 moving right + --- 0.882841 (0.66333), N = 91 moving right + --- 2.71402 (0.525262), N = 9 moving right + + -- best stat: 0.689465, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 5 17 13 14 12 + + + -- linear combo weights (showing up to 5) + + 1.1775 0.3228 0.3563 0.3731 0.0549 + + + -- cutpoint (score) + --- 0.430267 (0.588417), N = 220 moving right + --- 1.23455 (0.703374), N = 126 moving right + --- 1.41705 (0.687825), N = 106 moving right + --- 1.89279 (0.636641), N = 61 moving right + --- 2.61942 (0.583326), N = 22 moving right + + -- best stat: 0.703374, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 3.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 3.3400e+02 1.0000e+00 1.0000e+00 + 3.4800e+02 1.0000e+00 1.0000e+00 + 4.0000e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.7000e+01 9.8551e-01 1.4532e-02 + 1.1000e+02 9.8188e-01 1.8209e-02 + 1.4000e+02 9.7464e-01 2.5589e-02 + 1.7900e+02 9.7101e-01 2.9306e-02 + + +------------ Growing tree 70 -------------- + +- N obs inbag: 276 +- N row inbag: 182 +- max nodes: 239 +- max leaves: 120 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 0 4 3 12 6 + + + -- linear combo weights (showing up to 5) + + 0.0787 0.4554 10.4998 0.0481 0.3679 + + + -- cutpoint (score) + --- 0.0163582 (0.554467), N = 214 moving right + --- 0.0463726 (0.568178), N = 206 moving right + --- 0.0640181 (0.587885), N = 178 moving right + --- 0.428099 (0.633898), N = 142 moving right + --- 0.434602 (0.630002), N = 129 moving right + + -- best stat: 0.633898, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 6 9 12 7 14 + + + -- linear combo weights (showing up to 5) + + 1.4855 0.3390 -0.0304 9.9720 0.3259 + + + -- cutpoint (score) + --- -0.460661 (0.501626), N = 260 moving right + --- -0.198338 (0.62361), N = 178 moving right + --- 0.208042 (0.6669), N = 100 moving right + --- 1.32787 (0.642503), N = 36 moving right + --- 1.73258 (0.61491), N = 29 moving right + + -- best stat: 0.6669, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 16 1 15 12 13 + + + -- linear combo weights (showing up to 5) + + 0.8464 0.5522 -0.2695 -0.0482 0.4183 + + + -- cutpoint (score) + --- -0.959676 (0.60935), N = 215 moving right + --- -0.213094 (0.675089), N = 150 moving right + --- 0.145638 (0.679893), N = 102 moving right + --- 0.362242 (0.681406), N = 85 moving right + --- 0.520906 (0.683732), N = 79 moving right + + -- best stat: 0.683732, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 7.1000e+01 9.9638e-01 3.6232e-03 + 7.7000e+01 9.8913e-01 1.0896e-02 + 1.1000e+02 9.8188e-01 1.8222e-02 + 1.3100e+02 9.7826e-01 2.1912e-02 + 1.4000e+02 9.7101e-01 2.9319e-02 + + +------------ Growing tree 71 -------------- + +- N obs inbag: 276 +- N row inbag: 166 +- max nodes: 247 +- max leaves: 124 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 12 15 2 7 14 + + + -- linear combo weights (showing up to 5) + + 0.0518 -0.0690 -0.0584 14.0441 0.2246 + + + -- cutpoint (score) + --- -0.206678 (0.568329), N = 214 moving right + --- -0.108763 (0.59861), N = 148 moving right + --- 0.0283402 (0.600557), N = 89 moving right + --- 0.092138 (0.615006), N = 67 moving right + --- 13.8846 (0.575889), N = 14 moving right + + -- best stat: 0.615006, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 2 12 9 17 16 + + + -- linear combo weights (showing up to 5) + + 0.0763 0.0992 0.3451 0.6150 0.4843 + + + -- cutpoint (score) + --- 1.20365 (0.598128), N = 230 moving right + --- 1.63663 (0.698538), N = 174 moving right + --- 1.83233 (0.69257), N = 146 moving right + --- 3.07582 (0.580056), N = 25 moving right + --- 3.20806 (0.568204), N = 23 moving right + + -- best stat: 0.698538, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 9 0 3 7 4 + + + -- linear combo weights (showing up to 5) + + 0.4037 0.0370 5.3069 10.2998 0.3431 + + + -- cutpoint (score) + --- 0.0950644 (0.630418), N = 170 moving right + --- 0.107066 (0.627822), N = 167 moving right + --- 0.406292 (0.656615), N = 66 moving right + --- 0.436429 (0.654186), N = 62 moving right + --- 0.697791 (0.640658), N = 34 moving right + + -- best stat: 0.656615, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 3.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 3.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 4.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8188e-01 1.8195e-02 + 7.1000e+01 9.7826e-01 2.1885e-02 + 1.1000e+02 9.7101e-01 2.9293e-02 + 1.3100e+02 9.6739e-01 3.3024e-02 + + +------------ Growing tree 72 -------------- + +- N obs inbag: 276 +- N row inbag: 160 +- max nodes: 211 +- max leaves: 106 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 13 4 14 5 12 + + + -- linear combo weights (showing up to 5) + + 0.2272 0.5331 0.2336 1.2118 0.1508 + + + -- cutpoint (score) + --- -0.175706 (0.596254), N = 222 moving right + --- 0.33713 (0.652862), N = 167 moving right + --- 0.461404 (0.650153), N = 150 moving right + --- 1.41684 (0.618092), N = 62 moving right + --- 2.15169 (0.538587), N = 11 moving right + + -- best stat: 0.652862, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 6 7 13 11 14 + + + -- linear combo weights (showing up to 5) + + 1.0301 5.7541 0.1773 0.6070 0.2377 + + + -- cutpoint (score) + --- -0.795215 (0.549611), N = 251 moving right + --- -0.29107 (0.68), N = 180 moving right + --- -0.00813038 (0.701673), N = 115 moving right + --- 0.0191441 (0.71616), N = 108 moving right + --- 0.599331 (0.7147), N = 68 moving right + + -- best stat: 0.71616, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 2 6 7 15 8 + + + -- linear combo weights (showing up to 5) + + -0.9784 0.5609 4.3363 -0.1139 1.4278 + + + -- cutpoint (score) + --- -1.76085 (0.606031), N = 208 moving right + --- -1.72478 (0.63232), N = 195 moving right + --- -1.64864 (0.651143), N = 179 moving right + --- -1.60446 (0.665559), N = 171 moving right + --- 1.20346 (0.640165), N = 33 moving right + + -- best stat: 0.665559, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 3.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 3.0000e+00 + 3.2600e+02 1.0000e+00 2.0000e+00 + 3.3400e+02 1.0000e+00 2.0000e+00 + 3.4800e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9275e-01 7.2464e-03 + 1.1000e+02 9.8551e-01 1.4546e-02 + 1.4000e+02 9.8188e-01 1.8222e-02 + 1.7900e+02 9.7101e-01 2.9292e-02 + 1.9800e+02 9.6739e-01 3.3024e-02 + + +------------ Growing tree 73 -------------- + +- N obs inbag: 276 +- N row inbag: 166 +- max nodes: 207 +- max leaves: 104 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 9 11 13 3 1 + + + -- linear combo weights (showing up to 5) + + 0.0166 0.6454 0.5425 5.5832 0.4922 + + + -- cutpoint (score) + --- -0.927846 (0.589381), N = 224 moving right + --- -0.896805 (0.60537), N = 216 moving right + --- 0.307576 (0.753699), N = 87 moving right + --- 0.7153 (0.707861), N = 71 moving right + --- 1.25721 (0.654087), N = 42 moving right + + -- best stat: 0.753699, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 13 15 12 4 7 + + + -- linear combo weights (showing up to 5) + + 0.4059 0.0108 0.0540 0.7603 14.1281 + + + -- cutpoint (score) + --- -0.306123 (0.570676), N = 233 moving right + --- 0.223615 (0.653315), N = 169 moving right + --- 0.610418 (0.709289), N = 109 moving right + --- 0.712483 (0.703015), N = 86 moving right + --- 1.31319 (0.582569), N = 23 moving right + + -- best stat: 0.709289, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 11 6 7 10 14 + + + -- linear combo weights (showing up to 5) + + 0.5534 0.9190 14.1689 -0.2259 0.4524 + + + -- cutpoint (score) + --- -1.01553 (0.517839), N = 253 moving right + --- -0.653857 (0.604083), N = 215 moving right + --- -0.636672 (0.621383), N = 206 moving right + --- 0.288197 (0.754565), N = 95 moving right + --- 1.00506 (0.668602), N = 46 moving right + + -- best stat: 0.754565, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 3.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.8800e+02 1.0000e+00 1.0000e+00 + 5.3300e+02 0 2.0000e+00 + 5.4900e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9275e-01 7.2464e-03 + 7.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.8551e-01 1.4559e-02 + 1.1000e+02 9.7464e-01 2.5588e-02 + 1.9800e+02 9.6739e-01 3.3023e-02 + + +------------ Growing tree 74 -------------- + +- N obs inbag: 276 +- N row inbag: 176 +- max nodes: 185 +- max leaves: 93 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 6 5 2 9 3 + + + -- linear combo weights (showing up to 5) + + -0.3449 1.4716 -0.0969 0.3707 7.5893 + + + -- cutpoint (score) + --- -0.326204 (0.560044), N = 246 moving right + --- -0.277265 (0.576904), N = 227 moving right + --- -0.210961 (0.630406), N = 192 moving right + --- -0.0515158 (0.694677), N = 132 moving right + --- 1.2606 (0.65446), N = 46 moving right + + -- best stat: 0.694677, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 7 5 11 10 16 + + + -- linear combo weights (showing up to 5) + + 4.8137 0.7017 0.9855 -0.6868 0.3971 + + + -- cutpoint (score) + --- -1.0522 (0.599317), N = 216 moving right + --- -0.534069 (0.712998), N = 160 moving right + --- -0.531073 (0.710278), N = 159 moving right + --- 0.914498 (0.795612), N = 68 moving right + --- 3.86311 (0.631508), N = 23 moving right + + -- best stat: 0.795612, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 4 0 16 9 2 + + + -- linear combo weights (showing up to 5) + + 0.7894 -0.3858 0.4828 0.3661 0.0558 + + + -- cutpoint (score) + --- 0.186311 (0.715606), N = 136 moving right + --- 0.588744 (0.714616), N = 85 moving right + --- 0.786444 (0.70495), N = 65 moving right + --- 0.836223 (0.69697), N = 57 moving right + --- 0.958238 (0.635397), N = 43 moving right + + -- best stat: 0.715606, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 3.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 1.1000e+02 9.9275e-01 7.2596e-03 + 1.3100e+02 9.8551e-01 1.4559e-02 + 1.4000e+02 9.8188e-01 1.8235e-02 + 1.7900e+02 9.7464e-01 2.5615e-02 + + +------------ Growing tree 75 -------------- + +- N obs inbag: 276 +- N row inbag: 173 +- max nodes: 217 +- max leaves: 109 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 11 4 12 2 16 + + + -- linear combo weights (showing up to 5) + + 0.8703 0.5147 0.1702 0.1199 0.4155 + + + -- cutpoint (score) + --- -0.607601 (0.5957), N = 230 moving right + --- -0.0304592 (0.685148), N = 165 moving right + --- 0.780717 (0.709859), N = 83 moving right + --- 0.937119 (0.70234), N = 77 moving right + --- 0.942731 (0.704959), N = 76 moving right + + -- best stat: 0.709859, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 15 3 9 6 12 + + + -- linear combo weights (showing up to 5) + + -0.2323 4.8543 0.5974 1.1783 0.2741 + + + -- cutpoint (score) + --- -0.521729 (0.547079), N = 244 moving right + --- -0.112497 (0.663161), N = 151 moving right + --- -0.037371 (0.670722), N = 133 moving right + --- 0.585219 (0.695624), N = 71 moving right + --- 3.54149 (0.617898), N = 24 moving right + + -- best stat: 0.695624, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 3 15 1 13 11 + + + -- linear combo weights (showing up to 5) + + 3.7639 -0.1086 0.5772 0.5407 0.6314 + + + -- cutpoint (score) + --- -0.980387 (0.584463), N = 231 moving right + --- -0.187129 (0.744498), N = 131 moving right + --- 0.39984 (0.749989), N = 78 moving right + --- 0.72488 (0.707008), N = 62 moving right + --- 4.92886 (0.552993), N = 11 moving right + + -- best stat: 0.749989, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8551e-01 1.4546e-02 + 7.1000e+01 9.8188e-01 1.8222e-02 + 7.7000e+01 9.7826e-01 2.1912e-02 + 1.1000e+02 9.7464e-01 2.5616e-02 + + +------------ Growing tree 76 -------------- + +- N obs inbag: 276 +- N row inbag: 176 +- max nodes: 201 +- max leaves: 101 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 6 0 3 13 15 + + + -- linear combo weights (showing up to 5) + + 0.8664 0.2024 9.0191 0.5122 -0.0848 + + + -- cutpoint (score) + --- -0.333079 (0.598018), N = 218 moving right + --- -0.155413 (0.629136), N = 180 moving right + --- -0.104471 (0.640787), N = 173 moving right + --- 0.24664 (0.689381), N = 107 moving right + --- 0.689337 (0.62727), N = 41 moving right + + -- best stat: 0.689381, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 4 6 15 8 14 + + + -- linear combo weights (showing up to 5) + + 0.3699 0.7477 -0.1930 1.8765 -0.2367 + + + -- cutpoint (score) + --- -0.687809 (0.628203), N = 190 moving right + --- -0.544516 (0.686914), N = 162 moving right + --- 0.658758 (0.701426), N = 58 moving right + --- 1.69868 (0.624927), N = 27 moving right + --- 3.63038 (0.549299), N = 10 moving right + + -- best stat: 0.701426, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 14 6 5 13 11 + + + -- linear combo weights (showing up to 5) + + 0.1214 1.4696 0.3751 0.4492 0.6175 + + + -- cutpoint (score) + --- -1.09227 (0.517228), N = 267 moving right + --- -0.245646 (0.691434), N = 167 moving right + --- 0.338695 (0.678228), N = 91 moving right + --- 0.342569 (0.670184), N = 90 moving right + --- 0.595748 (0.662078), N = 66 moving right + + -- best stat: 0.691434, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9275e-01 7.2464e-03 + 1.1000e+02 9.8913e-01 1.0896e-02 + 1.4000e+02 9.8551e-01 1.4559e-02 + 1.7900e+02 9.8188e-01 1.8235e-02 + 1.8600e+02 9.7464e-01 2.5616e-02 + + +------------ Growing tree 77 -------------- + +- N obs inbag: 276 +- N row inbag: 174 +- max nodes: 191 +- max leaves: 96 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 4 17 5 1 10 + + + -- linear combo weights (showing up to 5) + + 0.0997 0.2589 1.4329 0.4823 -0.8493 + + + -- cutpoint (score) + --- 0.0119409 (0.615351), N = 219 moving right + --- 0.466376 (0.648426), N = 194 moving right + --- 1.43016 (0.752783), N = 123 moving right + --- 1.91367 (0.760483), N = 96 moving right + --- 2.01429 (0.75594), N = 88 moving right + + -- best stat: 0.760483, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 11 1 13 0 15 + + + -- linear combo weights (showing up to 5) + + 0.9418 0.6785 0.7399 0.1380 -0.1683 + + + -- cutpoint (score) + --- -1.60201 (0.545818), N = 249 moving right + --- -0.699131 (0.689723), N = 159 moving right + --- 0.0874382 (0.762641), N = 102 moving right + --- 1.0537 (0.708282), N = 60 moving right + --- 2.70736 (0.569715), N = 14 moving right + + -- best stat: 0.762641, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 7 1 8 15 0 + + + -- linear combo weights (showing up to 5) + + 6.8109 0.4731 1.4998 -0.0865 -0.0807 + + + -- cutpoint (score) + --- -0.322798 (0.804461), N = 106 moving right + --- 0.0287255 (0.806574), N = 87 moving right + --- 1.88021 (0.698128), N = 41 moving right + --- 1.89816 (0.691018), N = 40 moving right + --- 6.82159 (0.617873), N = 20 moving right + + -- best stat: 0.806574, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 3.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 4.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 4.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.8913e-01 1.0870e-02 + 5.1000e+01 9.8188e-01 1.8196e-02 + 7.1000e+01 9.7826e-01 2.1886e-02 + 1.1000e+02 9.6377e-01 3.6700e-02 + 1.4000e+02 9.5652e-01 4.4219e-02 + + +------------ Growing tree 78 -------------- + +- N obs inbag: 276 +- N row inbag: 176 +- max nodes: 235 +- max leaves: 118 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 12 13 6 14 2 + + + -- linear combo weights (showing up to 5) + + 0.1740 0.3900 1.5602 0.4807 -0.1224 + + + -- cutpoint (score) + --- -0.949801 (0.51421), N = 260 moving right + --- -0.655444 (0.590786), N = 218 moving right + --- -0.023477 (0.652731), N = 130 moving right + --- 0.751148 (0.608381), N = 55 moving right + --- 1.0294 (0.612684), N = 45 moving right + + -- best stat: 0.652731, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 8 7 10 15 6 + + + -- linear combo weights (showing up to 5) + + 1.8526 2.6325 -0.2824 0.0119 0.7989 + + + -- cutpoint (score) + --- -1.04727 (0.64992), N = 192 moving right + --- -0.922646 (0.679315), N = 174 moving right + --- -0.799366 (0.719477), N = 147 moving right + --- 0.161136 (0.743899), N = 84 moving right + --- 2.58772 (0.637202), N = 26 moving right + + -- best stat: 0.743899, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 14 1 17 6 8 + + + -- linear combo weights (showing up to 5) + + 0.3167 0.2804 0.4003 0.6189 1.8390 + + + -- cutpoint (score) + --- -0.260293 (0.596141), N = 227 moving right + --- -0.206227 (0.604575), N = 224 moving right + --- 0.281118 (0.678511), N = 176 moving right + --- 0.44295 (0.69536), N = 155 moving right + --- 4.87216 (0.609547), N = 22 moving right + + -- best stat: 0.69536, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 4.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 7.1000e+01 9.9638e-01 3.6232e-03 + 7.7000e+01 9.8188e-01 1.8169e-02 + 1.1000e+02 9.7826e-01 2.1859e-02 + 1.4000e+02 9.7464e-01 2.5562e-02 + 1.8600e+02 9.7101e-01 2.9280e-02 + + +------------ Growing tree 79 -------------- + +- N obs inbag: 276 +- N row inbag: 165 +- max nodes: 201 +- max leaves: 101 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 13 4 14 0 9 + + + -- linear combo weights (showing up to 5) + + 0.7997 0.7874 0.4032 -0.2541 0.0750 + + + -- cutpoint (score) + --- -0.918566 (0.572874), N = 232 moving right + --- -0.356487 (0.638618), N = 176 moving right + --- -0.237164 (0.646646), N = 170 moving right + --- 0.114919 (0.677056), N = 138 moving right + --- 1.3682 (0.598155), N = 31 moving right + + -- best stat: 0.677056, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 3 16 17 10 6 + + + -- linear combo weights (showing up to 5) + + 9.1660 0.2152 0.3249 -0.5750 0.6080 + + + -- cutpoint (score) + --- 0.33913 (0.577567), N = 228 moving right + --- 0.958875 (0.696908), N = 129 moving right + --- 1.04259 (0.706639), N = 116 moving right + --- 1.33743 (0.703303), N = 87 moving right + --- 1.45884 (0.703763), N = 78 moving right + + -- best stat: 0.706639, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 4 11 12 17 6 + + + -- linear combo weights (showing up to 5) + + 0.5270 1.2580 0.0141 0.2422 0.8427 + + + -- cutpoint (score) + --- -0.273175 (0.578556), N = 241 moving right + --- -0.0332645 (0.631487), N = 213 moving right + --- 0.241269 (0.660425), N = 187 moving right + --- 0.277718 (0.663347), N = 185 moving right + --- 2.28112 (0.657573), N = 42 moving right + + -- best stat: 0.663347, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 4.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.7826e-01 2.1845e-02 + 7.7000e+01 9.7464e-01 2.5549e-02 + 1.1000e+02 9.7101e-01 2.9266e-02 + 1.3100e+02 9.6377e-01 3.6729e-02 + + +------------ Growing tree 80 -------------- + +- N obs inbag: 276 +- N row inbag: 176 +- max nodes: 235 +- max leaves: 118 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 4 14 8 2 9 + + + -- linear combo weights (showing up to 5) + + 0.4894 -0.0393 2.1875 -0.4029 -0.2094 + + + -- cutpoint (score) + --- -0.806126 (0.715288), N = 130 moving right + --- -0.692214 (0.725697), N = 121 moving right + --- 0.232921 (0.720031), N = 58 moving right + --- 1.0887 (0.682779), N = 40 moving right + --- 2.21034 (0.641704), N = 30 moving right + + -- best stat: 0.725697, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 5 0 14 15 10 + + + -- linear combo weights (showing up to 5) + + 0.4214 -0.2896 0.3989 -0.1093 -0.8835 + + + -- cutpoint (score) + --- -1.38736 (0.549663), N = 247 moving right + --- -0.383047 (0.671021), N = 166 moving right + --- -0.261251 (0.657307), N = 149 moving right + --- 0.578034 (0.662972), N = 67 moving right + --- 0.599561 (0.666052), N = 64 moving right + + -- best stat: 0.671021, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 1 2 11 17 0 + + + -- linear combo weights (showing up to 5) + + 0.3216 0.4427 0.9577 0.5128 -0.3317 + + + -- cutpoint (score) + --- 0.581197 (0.56929), N = 243 moving right + --- 1.15808 (0.685904), N = 183 moving right + --- 1.19635 (0.687905), N = 179 moving right + --- 1.45905 (0.728934), N = 144 moving right + --- 2.71319 (0.679946), N = 52 moving right + + -- best stat: 0.728934, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 3.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 3.3400e+02 1.0000e+00 3.0000e+00 + 3.4800e+02 1.0000e+00 1.0000e+00 + 4.0000e+02 1.0000e+00 3.0000e+00 + 5.1500e+02 1.0000e+00 1.0000e+00 + 5.3300e+02 0 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8551e-01 1.4546e-02 + 7.1000e+01 9.8188e-01 1.8222e-02 + 1.7900e+02 9.7101e-01 2.9292e-02 + 1.9800e+02 9.6739e-01 3.3024e-02 + + +------------ Growing tree 81 -------------- + +- N obs inbag: 276 +- N row inbag: 166 +- max nodes: 195 +- max leaves: 98 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 9 6 5 8 14 + + + -- linear combo weights (showing up to 5) + + -0.7862 0.9421 0.0990 2.7915 -0.0504 + + + -- cutpoint (score) + --- -1.56356 (0.516495), N = 259 moving right + --- -1.15722 (0.658867), N = 181 moving right + --- 0.770372 (0.725306), N = 59 moving right + --- 1.93345 (0.708327), N = 41 moving right + --- 8.50273 (0.57092), N = 11 moving right + + -- best stat: 0.725306, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 8 1 12 15 2 + + + -- linear combo weights (showing up to 5) + + 2.1958 0.4367 0.0881 -0.1904 -0.3046 + + + -- cutpoint (score) + --- -1.3818 (0.651165), N = 178 moving right + --- -1.32244 (0.674006), N = 164 moving right + --- -1.22093 (0.700504), N = 145 moving right + --- -0.842396 (0.758538), N = 114 moving right + --- 0.0523617 (0.757472), N = 68 moving right + + -- best stat: 0.758538, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 1 14 9 12 7 + + + -- linear combo weights (showing up to 5) + + 0.5642 0.4839 0.2799 0.1077 4.4078 + + + -- cutpoint (score) + --- -0.418159 (0.638546), N = 191 moving right + --- -0.222139 (0.640023), N = 173 moving right + --- 0.274426 (0.68258), N = 105 moving right + --- 0.30875 (0.688902), N = 102 moving right + --- 0.547109 (0.670542), N = 77 moving right + + -- best stat: 0.688902, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.1000e+01 9.8551e-01 1.4559e-02 + 7.7000e+01 9.7826e-01 2.1912e-02 + 1.1000e+02 9.7464e-01 2.5616e-02 + + +------------ Growing tree 82 -------------- + +- N obs inbag: 276 +- N row inbag: 182 +- max nodes: 207 +- max leaves: 104 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 6 14 7 16 5 + + + -- linear combo weights (showing up to 5) + + 0.5808 0.3891 5.3710 0.3979 0.8802 + + + -- cutpoint (score) + --- -0.573175 (0.526884), N = 255 moving right + --- -0.468953 (0.571196), N = 234 moving right + --- -0.405646 (0.574714), N = 232 moving right + --- 0.278706 (0.72152), N = 123 moving right + --- 2.08143 (0.606784), N = 21 moving right + + -- best stat: 0.72152, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 11 1 3 15 8 + + + -- linear combo weights (showing up to 5) + + 0.3983 0.3144 4.1016 -0.0973 1.6028 + + + -- cutpoint (score) + --- -1.3043 (0.570118), N = 238 moving right + --- -1.19638 (0.596941), N = 224 moving right + --- -1.10173 (0.62228), N = 214 moving right + --- -0.797592 (0.727112), N = 154 moving right + --- 0.893057 (0.705901), N = 49 moving right + + -- best stat: 0.727112, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 7 0 1 13 12 + + + -- linear combo weights (showing up to 5) + + 6.4248 -0.1444 0.6459 0.4856 0.0609 + + + -- cutpoint (score) + --- -0.726452 (0.567475), N = 230 moving right + --- -0.191992 (0.675093), N = 153 moving right + --- -0.155194 (0.687355), N = 143 moving right + --- -0.106918 (0.691849), N = 134 moving right + --- 0.184818 (0.66224), N = 100 moving right + + -- best stat: 0.691849, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 7.7000e+01 9.9275e-01 7.2464e-03 + 1.1000e+02 9.8551e-01 1.4546e-02 + 1.3100e+02 9.8188e-01 1.8222e-02 + 1.4000e+02 9.7826e-01 2.1912e-02 + 1.7900e+02 9.7101e-01 2.9320e-02 + + +------------ Growing tree 83 -------------- + +- N obs inbag: 276 +- N row inbag: 173 +- max nodes: 219 +- max leaves: 110 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 13 7 16 2 10 + + + -- linear combo weights (showing up to 5) + + 0.6312 9.1539 0.5559 -0.1499 -0.7889 + + + -- cutpoint (score) + --- -1.07823 (0.61362), N = 206 moving right + --- 0.0702865 (0.717755), N = 96 moving right + --- 0.348039 (0.718381), N = 81 moving right + --- 11.3175 (0.554206), N = 8 moving right + --- 11.5982 (0.547639), N = 7 moving right + + -- best stat: 0.718381, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 10 12 11 7 3 + + + -- linear combo weights (showing up to 5) + + -0.5270 0.0274 0.7128 8.5494 6.5381 + + + -- cutpoint (score) + --- -1.15525 (0.539018), N = 250 moving right + --- -1.05822 (0.556864), N = 244 moving right + --- -0.755469 (0.589379), N = 227 moving right + --- -0.722639 (0.605885), N = 215 moving right + --- -0.0322889 (0.724668), N = 115 moving right + + -- best stat: 0.724668, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 12 16 11 8 0 + + + -- linear combo weights (showing up to 5) + + -0.0459 0.4465 0.6765 1.3617 -0.0671 + + + -- cutpoint (score) + --- -1.23682 (0.640172), N = 199 moving right + --- -1.09126 (0.669663), N = 178 moving right + --- -0.836369 (0.712829), N = 148 moving right + --- -0.212997 (0.735536), N = 95 moving right + --- 0.404101 (0.710517), N = 67 moving right + + -- best stat: 0.735536, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.1000e+01 9.8551e-01 1.4559e-02 + 1.1000e+02 9.7826e-01 2.1912e-02 + 1.3100e+02 9.7101e-01 2.9319e-02 + + +------------ Growing tree 84 -------------- + +- N obs inbag: 276 +- N row inbag: 178 +- max nodes: 225 +- max leaves: 113 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 1 9 10 13 15 + + + -- linear combo weights (showing up to 5) + + 0.6520 0.3980 -0.6008 0.6330 -0.1029 + + + -- cutpoint (score) + --- -0.912581 (0.617197), N = 204 moving right + --- -0.617546 (0.665341), N = 177 moving right + --- 0.128112 (0.711135), N = 107 moving right + --- 0.910999 (0.659757), N = 50 moving right + --- 0.992931 (0.663915), N = 47 moving right + + -- best stat: 0.711135, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 0 8 5 3 9 + + + -- linear combo weights (showing up to 5) + + -0.2801 1.8522 0.6578 4.4475 -0.2323 + + + -- cutpoint (score) + --- -0.823469 (0.685607), N = 171 moving right + --- -0.517137 (0.743774), N = 126 moving right + --- -0.505085 (0.739857), N = 123 moving right + --- 0.344304 (0.723447), N = 74 moving right + --- 2.73274 (0.632341), N = 25 moving right + + -- best stat: 0.743774, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 14 12 2 15 10 + + + -- linear combo weights (showing up to 5) + + 0.3641 0.0140 -0.7084 -0.0903 -0.7458 + + + -- cutpoint (score) + --- -0.663712 (0.667992), N = 126 moving right + --- -0.530763 (0.676207), N = 115 moving right + --- -0.149111 (0.662067), N = 69 moving right + --- 0.110244 (0.651563), N = 51 moving right + --- 0.225357 (0.627601), N = 41 moving right + + -- best stat: 0.676207, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 3.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.9275e-01 7.2596e-03 + 1.3100e+02 9.8551e-01 1.4559e-02 + 1.4000e+02 9.8188e-01 1.8235e-02 + 1.7900e+02 9.7464e-01 2.5615e-02 + + +------------ Growing tree 85 -------------- + +- N obs inbag: 276 +- N row inbag: 179 +- max nodes: 207 +- max leaves: 104 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 9 3 11 7 6 + + + -- linear combo weights (showing up to 5) + + 0.4659 4.1252 0.4485 2.9222 0.6862 + + + -- cutpoint (score) + --- -0.625851 (0.531402), N = 252 moving right + --- -0.623626 (0.534596), N = 251 moving right + --- -0.527324 (0.569236), N = 238 moving right + --- 0.641285 (0.684068), N = 62 moving right + --- 1.31307 (0.62306), N = 38 moving right + + -- best stat: 0.684068, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 3 5 16 2 4 + + + -- linear combo weights (showing up to 5) + + 4.9804 0.2042 0.2004 -0.0338 0.6123 + + + -- cutpoint (score) + --- -0.199861 (0.527388), N = 251 moving right + --- 0.183186 (0.642664), N = 148 moving right + --- 0.352778 (0.660738), N = 139 moving right + --- 0.644939 (0.638583), N = 79 moving right + --- 5.30271 (0.546305), N = 10 moving right + + -- best stat: 0.660738, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 8 6 11 12 1 + + + -- linear combo weights (showing up to 5) + + 1.5977 0.2153 0.3532 -0.1276 0.3468 + + + -- cutpoint (score) + --- -1.30136 (0.549521), N = 246 moving right + --- -0.73396 (0.72361), N = 153 moving right + --- -0.569756 (0.741484), N = 132 moving right + --- -0.384311 (0.732347), N = 113 moving right + --- -0.305229 (0.746385), N = 107 moving right + + -- best stat: 0.746385, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 3.4800e+02 1.0000e+00 1.0000e+00 + 3.8800e+02 1.0000e+00 2.0000e+00 + 4.0000e+02 1.0000e+00 1.0000e+00 + 4.6000e+02 1.0000e+00 1.0000e+00 + 5.1500e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9275e-01 7.2464e-03 + 1.1000e+02 9.8913e-01 1.0896e-02 + 1.3100e+02 9.8188e-01 1.8222e-02 + 1.8600e+02 9.7826e-01 2.1912e-02 + 1.9800e+02 9.7464e-01 2.5616e-02 + + +------------ Growing tree 86 -------------- + +- N obs inbag: 276 +- N row inbag: 170 +- max nodes: 233 +- max leaves: 117 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 0 1 5 7 6 + + + -- linear combo weights (showing up to 5) + + -0.0593 0.3740 0.9502 4.2579 2.4113 + + + -- cutpoint (score) + --- -0.580214 (0.525161), N = 257 moving right + --- 0.56944 (0.700995), N = 101 moving right + --- 0.591431 (0.703523), N = 98 moving right + --- 0.993724 (0.701329), N = 66 moving right + --- 4.83126 (0.549026), N = 8 moving right + + -- best stat: 0.703523, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 13 0 4 17 1 + + + -- linear combo weights (showing up to 5) + + 0.1299 -0.1450 0.5587 0.6566 0.3445 + + + -- cutpoint (score) + --- 1.96445 (0.68342), N = 165 moving right + --- 2.0343 (0.685823), N = 156 moving right + --- 2.35051 (0.690379), N = 136 moving right + --- 2.9027 (0.677318), N = 64 moving right + --- 3.24223 (0.60871), N = 35 moving right + + -- best stat: 0.690379, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 3 8 10 2 16 + + + -- linear combo weights (showing up to 5) + + 5.2958 1.3394 -0.4427 0.0345 0.4796 + + + -- cutpoint (score) + --- -1.49058 (0.51722), N = 258 moving right + --- -1.17646 (0.583946), N = 230 moving right + --- 0.148662 (0.767324), N = 91 moving right + --- 0.341194 (0.75744), N = 85 moving right + --- 0.995888 (0.730711), N = 55 moving right + + -- best stat: 0.767324, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 3.0000e+00 + 7.7000e+01 1.0000e+00 3.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.8551e-01 1.4532e-02 + 7.7000e+01 9.7464e-01 2.5562e-02 + 1.1000e+02 9.7101e-01 2.9279e-02 + 1.7900e+02 9.6739e-01 3.3011e-02 + + +------------ Growing tree 87 -------------- + +- N obs inbag: 276 +- N row inbag: 167 +- max nodes: 233 +- max leaves: 117 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 15 11 0 2 16 + + + -- linear combo weights (showing up to 5) + + -0.1741 1.3575 -0.3165 1.5516 0.7801 + + + -- cutpoint (score) + --- 0.0830077 (0.61435), N = 210 moving right + --- 0.145355 (0.626669), N = 203 moving right + --- 0.571423 (0.699493), N = 155 moving right + --- 1.23359 (0.727055), N = 102 moving right + --- 2.07755 (0.705825), N = 68 moving right + + -- best stat: 0.727055, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 5 14 11 6 2 + + + -- linear combo weights (showing up to 5) + + 0.9433 -0.0237 1.2933 1.1675 0.9262 + + + -- cutpoint (score) + --- 0.152143 (0.60276), N = 213 moving right + --- 0.540119 (0.663142), N = 170 moving right + --- 2.14243 (0.706129), N = 63 moving right + --- 2.62149 (0.681064), N = 46 moving right + --- 5.02407 (0.528415), N = 5 moving right + + -- best stat: 0.706129, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 14 0 10 6 13 + + + -- linear combo weights (showing up to 5) + + 0.2852 -0.3614 -0.6244 0.8326 0.5827 + + + -- cutpoint (score) + --- -1.39286 (0.564116), N = 245 moving right + --- -0.74382 (0.594033), N = 198 moving right + --- -0.373587 (0.645017), N = 148 moving right + --- -0.306787 (0.655612), N = 143 moving right + --- -0.277539 (0.663568), N = 130 moving right + + -- best stat: 0.663568, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.7000e+01 9.9275e-01 7.2596e-03 + 1.1000e+02 9.8913e-01 1.0909e-02 + 1.3100e+02 9.8551e-01 1.4572e-02 + 1.4000e+02 9.8188e-01 1.8249e-02 + + +------------ Growing tree 88 -------------- + +- N obs inbag: 276 +- N row inbag: 187 +- max nodes: 209 +- max leaves: 105 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 11 1 8 15 3 + + + -- linear combo weights (showing up to 5) + + 0.4092 0.5031 1.2288 -0.0109 7.2094 + + + -- cutpoint (score) + --- -1.02852 (0.600946), N = 218 moving right + --- -0.728036 (0.684647), N = 178 moving right + --- -0.64005 (0.718867), N = 159 moving right + --- -0.457641 (0.755793), N = 137 moving right + --- 11.0775 (0.542873), N = 6 moving right + + -- best stat: 0.755793, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 11 12 4 10 8 + + + -- linear combo weights (showing up to 5) + + 0.6146 0.0268 -0.1431 -0.4745 1.4652 + + + -- cutpoint (score) + --- -1.31253 (0.610508), N = 213 moving right + --- -0.979502 (0.669902), N = 176 moving right + --- -0.945219 (0.678658), N = 173 moving right + --- -0.748607 (0.711123), N = 143 moving right + --- 0.519917 (0.717071), N = 63 moving right + + -- best stat: 0.717071, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 3 10 8 12 9 + + + -- linear combo weights (showing up to 5) + + 7.0146 -0.3768 1.7028 0.1278 -0.5472 + + + -- cutpoint (score) + --- -1.46724 (0.498905), N = 265 moving right + --- -0.842931 (0.641093), N = 193 moving right + --- -0.824922 (0.643344), N = 192 moving right + --- 0.0666195 (0.755215), N = 87 moving right + --- 0.970221 (0.690492), N = 43 moving right + + -- best stat: 0.755215, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 3.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.1000e+01 9.8913e-01 1.0909e-02 + 7.7000e+01 9.8188e-01 1.8235e-02 + 1.1000e+02 9.7101e-01 2.9305e-02 + + +------------ Growing tree 89 -------------- + +- N obs inbag: 276 +- N row inbag: 166 +- max nodes: 191 +- max leaves: 96 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 12 3 9 0 14 + + + -- linear combo weights (showing up to 5) + + 0.0160 8.3244 0.8270 -0.0498 0.1560 + + + -- cutpoint (score) + --- -0.375571 (0.618939), N = 164 moving right + --- -0.325675 (0.620959), N = 159 moving right + --- 0.147107 (0.696298), N = 81 moving right + --- 0.416758 (0.686126), N = 52 moving right + --- 4.82841 (0.617952), N = 19 moving right + + -- best stat: 0.696298, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 2 8 5 4 7 + + + -- linear combo weights (showing up to 5) + + -0.0851 2.0914 0.2496 0.2370 12.6813 + + + -- cutpoint (score) + --- -1.12354 (0.652415), N = 201 moving right + --- -1.0907 (0.667003), N = 194 moving right + --- -0.841116 (0.710839), N = 155 moving right + --- -0.772526 (0.731441), N = 143 moving right + --- 12.1584 (0.593568), N = 13 moving right + + -- best stat: 0.731441, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 2 17 0 12 4 + + + -- linear combo weights (showing up to 5) + + -0.4925 0.7996 -0.4402 0.0832 0.1562 + + + -- cutpoint (score) + --- 1.58733 (0.662775), N = 172 moving right + --- 2.04499 (0.702476), N = 108 moving right + --- 2.39335 (0.676447), N = 76 moving right + --- 2.86525 (0.561948), N = 29 moving right + --- 2.88665 (0.534885), N = 15 moving right + + -- best stat: 0.702476, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 3.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 4.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + 3.3400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.8913e-01 1.0870e-02 + 5.1000e+01 9.8188e-01 1.8196e-02 + 7.1000e+01 9.6739e-01 3.2956e-02 + 1.1000e+02 9.6377e-01 3.6701e-02 + 1.3100e+02 9.5652e-01 4.4220e-02 + + +------------ Growing tree 90 -------------- + +- N obs inbag: 276 +- N row inbag: 176 +- max nodes: 219 +- max leaves: 110 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 5 8 10 6 11 + + + -- linear combo weights (showing up to 5) + + 0.6881 1.7466 -0.4094 0.1911 0.5561 + + + -- cutpoint (score) + --- -1.80179 (0.545444), N = 256 moving right + --- -1.41269 (0.600283), N = 225 moving right + --- -1.33746 (0.618032), N = 217 moving right + --- -1.14993 (0.656359), N = 194 moving right + --- 1.18747 (0.695482), N = 49 moving right + + -- best stat: 0.695482, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 0 8 12 4 17 + + + -- linear combo weights (showing up to 5) + + -0.4422 2.1466 0.0563 -0.2263 0.6250 + + + -- cutpoint (score) + --- 0.302387 (0.673312), N = 196 moving right + --- 0.602635 (0.692012), N = 167 moving right + --- 0.744263 (0.701715), N = 159 moving right + --- 1.00983 (0.723067), N = 129 moving right + --- 3.9246 (0.619424), N = 20 moving right + + -- best stat: 0.723067, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 11 4 7 14 3 + + + -- linear combo weights (showing up to 5) + + 1.0585 0.6032 10.1659 -0.1062 4.9197 + + + -- cutpoint (score) + --- -0.756164 (0.566553), N = 241 moving right + --- -0.700068 (0.587684), N = 231 moving right + --- -0.695799 (0.597476), N = 226 moving right + --- -0.240326 (0.677402), N = 179 moving right + --- 0.830767 (0.751183), N = 74 moving right + + -- best stat: 0.751183, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 3.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + 3.3400e+02 1.0000e+00 1.0000e+00 + 3.8800e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.7000e+01 9.8551e-01 1.4532e-02 + 1.1000e+02 9.7826e-01 2.1885e-02 + 1.3100e+02 9.7464e-01 2.5589e-02 + 1.8600e+02 9.7101e-01 2.9306e-02 + + +------------ Growing tree 91 -------------- + +- N obs inbag: 276 +- N row inbag: 173 +- max nodes: 239 +- max leaves: 120 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 7 8 12 10 17 + + + -- linear combo weights (showing up to 5) + + 6.8065 1.0990 0.0392 -0.4565 0.2620 + + + -- cutpoint (score) + --- 0.5013 (0.707276), N = 132 moving right + --- 0.541847 (0.712936), N = 129 moving right + --- 0.672661 (0.729916), N = 102 moving right + --- 1.08192 (0.729585), N = 73 moving right + --- 3.2041 (0.65411), N = 32 moving right + + -- best stat: 0.729916, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 6 4 8 11 1 + + + -- linear combo weights (showing up to 5) + + 0.4159 0.5055 1.3609 0.5118 0.3808 + + + -- cutpoint (score) + --- -1.17916 (0.548521), N = 249 moving right + --- -0.874876 (0.649524), N = 200 moving right + --- -0.199593 (0.735362), N = 138 moving right + --- 3.42454 (0.627254), N = 28 moving right + --- 3.68067 (0.615583), N = 26 moving right + + -- best stat: 0.735362, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 11 1 3 17 7 + + + -- linear combo weights (showing up to 5) + + 0.6999 0.2916 2.3249 0.2769 8.2605 + + + -- cutpoint (score) + --- 0.0477225 (0.568116), N = 246 moving right + --- 0.253027 (0.623858), N = 211 moving right + --- 0.646369 (0.712253), N = 151 moving right + --- 1.03713 (0.766473), N = 104 moving right + --- 2.5165 (0.645933), N = 41 moving right + + -- best stat: 0.766473, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 4.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.8551e-01 1.4493e-02 + 5.1000e+01 9.7826e-01 2.1846e-02 + 7.1000e+01 9.7101e-01 2.9253e-02 + 7.7000e+01 9.6739e-01 3.2984e-02 + 1.3100e+02 9.6377e-01 3.6730e-02 + + +------------ Growing tree 92 -------------- + +- N obs inbag: 276 +- N row inbag: 176 +- max nodes: 243 +- max leaves: 122 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 14 6 13 11 15 + + + -- linear combo weights (showing up to 5) + + 0.2637 1.0971 0.2475 0.5801 -0.0463 + + + -- cutpoint (score) + --- -0.592519 (0.601625), N = 227 moving right + --- 0.382281 (0.688341), N = 91 moving right + --- 0.675144 (0.664011), N = 63 moving right + --- 0.84276 (0.629415), N = 46 moving right + --- 1.33617 (0.58591), N = 32 moving right + + -- best stat: 0.688341, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 10 2 3 16 4 + + + -- linear combo weights (showing up to 5) + + -0.4276 -0.2556 4.9548 0.2454 0.4474 + + + -- cutpoint (score) + --- -0.714851 (0.509342), N = 247 moving right + --- -0.676367 (0.511643), N = 244 moving right + --- -0.493945 (0.589155), N = 199 moving right + --- -0.426032 (0.607604), N = 191 moving right + --- 6.00067 (0.55275), N = 10 moving right + + -- best stat: 0.607604, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 9 11 17 5 10 + + + -- linear combo weights (showing up to 5) + + 0.3485 0.5079 0.3644 0.4288 -0.3757 + + + -- cutpoint (score) + --- 0.300379 (0.581013), N = 233 moving right + --- 1.07493 (0.71621), N = 150 moving right + --- 1.28722 (0.739773), N = 121 moving right + --- 1.59654 (0.752222), N = 97 moving right + --- 1.7571 (0.741602), N = 80 moving right + + -- best stat: 0.752222, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 3.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.1000e+01 9.8913e-01 1.0909e-02 + 1.4000e+02 9.7826e-01 2.1898e-02 + 1.7900e+02 9.7464e-01 2.5602e-02 + + +------------ Growing tree 93 -------------- + +- N obs inbag: 276 +- N row inbag: 172 +- max nodes: 211 +- max leaves: 106 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 13 17 3 6 12 + + + -- linear combo weights (showing up to 5) + + 0.8093 0.2637 6.7070 0.4458 -0.0212 + + + -- cutpoint (score) + --- -0.215816 (0.54996), N = 251 moving right + --- 0.640332 (0.678337), N = 144 moving right + --- 1.01512 (0.719502), N = 94 moving right + --- 1.19103 (0.701362), N = 79 moving right + --- 1.47091 (0.687534), N = 60 moving right + + -- best stat: 0.719502, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 0 14 1 10 11 + + + -- linear combo weights (showing up to 5) + + -0.1520 0.0140 0.3905 -0.6554 1.1702 + + + -- cutpoint (score) + --- -2.25336 (0.50499), N = 270 moving right + --- -1.74361 (0.531481), N = 252 moving right + --- 0.242648 (0.743372), N = 91 moving right + --- 0.844021 (0.734534), N = 66 moving right + --- 1.43789 (0.70134), N = 44 moving right + + -- best stat: 0.743372, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 17 16 13 12 1 + + + -- linear combo weights (showing up to 5) + + 0.4191 0.4345 0.8880 -0.0760 0.4814 + + + -- cutpoint (score) + --- -0.259851 (0.555372), N = 242 moving right + --- 0.511744 (0.652226), N = 196 moving right + --- 0.771875 (0.684807), N = 150 moving right + --- 0.916208 (0.69707), N = 138 moving right + --- 3.34196 (0.597488), N = 15 moving right + + -- best stat: 0.69707, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 3.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.9275e-01 7.2596e-03 + 7.7000e+01 9.8551e-01 1.4559e-02 + 1.3100e+02 9.7464e-01 2.5588e-02 + 1.4000e+02 9.6739e-01 3.3023e-02 + + +------------ Growing tree 94 -------------- + +- N obs inbag: 276 +- N row inbag: 178 +- max nodes: 215 +- max leaves: 108 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 11 2 0 17 3 + + + -- linear combo weights (showing up to 5) + + 0.9836 -0.1113 -0.0482 0.4368 4.2476 + + + -- cutpoint (score) + --- 0.321389 (0.595525), N = 229 moving right + --- 0.443959 (0.628632), N = 211 moving right + --- 1.60488 (0.741039), N = 83 moving right + --- 3.89674 (0.630774), N = 24 moving right + --- 4.93894 (0.617222), N = 21 moving right + + -- best stat: 0.741039, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 11 8 5 2 13 + + + -- linear combo weights (showing up to 5) + + 0.6967 1.5625 0.6828 -0.3807 -0.1075 + + + -- cutpoint (score) + --- 0.0581668 (0.774486), N = 85 moving right + --- 0.335356 (0.757158), N = 76 moving right + --- 0.418668 (0.745769), N = 71 moving right + --- 3.43212 (0.614146), N = 20 moving right + --- 4.17089 (0.600954), N = 17 moving right + + -- best stat: 0.774486, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 6 9 1 15 3 + + + -- linear combo weights (showing up to 5) + + -0.2747 0.5232 0.4862 -0.2184 5.6047 + + + -- cutpoint (score) + --- -0.657183 (0.56789), N = 232 moving right + --- 0.248382 (0.698049), N = 90 moving right + --- 0.311399 (0.67894), N = 78 moving right + --- 0.629243 (0.677306), N = 55 moving right + --- 6.05455 (0.555525), N = 8 moving right + + -- best stat: 0.698049, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 1.1000e+02 9.8551e-01 1.4559e-02 + 1.3100e+02 9.8188e-01 1.8235e-02 + 1.4000e+02 9.7464e-01 2.5615e-02 + + +------------ Growing tree 95 -------------- + +- N obs inbag: 276 +- N row inbag: 170 +- max nodes: 239 +- max leaves: 120 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 6 7 13 8 14 + + + -- linear combo weights (showing up to 5) + + 0.6328 7.6436 0.1410 1.8332 -0.1627 + + + -- cutpoint (score) + --- -1.08612 (0.578311), N = 226 moving right + --- -1.05585 (0.588425), N = 222 moving right + --- -0.459887 (0.748521), N = 126 moving right + --- 0.0262071 (0.750072), N = 96 moving right + --- 2.03552 (0.627353), N = 23 moving right + + -- best stat: 0.750072, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 0 4 15 9 8 + + + -- linear combo weights (showing up to 5) + + -0.2550 0.3275 -0.0659 -0.3573 2.0704 + + + -- cutpoint (score) + --- -0.988803 (0.649754), N = 192 moving right + --- -0.920414 (0.68955), N = 173 moving right + --- -0.468526 (0.742978), N = 113 moving right + --- 0.211722 (0.707587), N = 69 moving right + --- 2.03588 (0.621065), N = 27 moving right + + -- best stat: 0.742978, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 16 2 13 3 14 + + + -- linear combo weights (showing up to 5) + + 0.6314 -0.2247 0.4981 7.4053 0.0935 + + + -- cutpoint (score) + --- -0.558163 (0.67019), N = 170 moving right + --- -0.335134 (0.700782), N = 152 moving right + --- -0.122022 (0.699582), N = 126 moving right + --- 0.0638901 (0.672093), N = 97 moving right + --- 0.747751 (0.65991), N = 43 moving right + + -- best stat: 0.700782, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 3.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 3.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + 3.4800e+02 1.0000e+00 2.0000e+00 + 4.0000e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8188e-01 1.8195e-02 + 7.7000e+01 9.7826e-01 2.1885e-02 + 1.4000e+02 9.7464e-01 2.5589e-02 + 1.7900e+02 9.6377e-01 3.6741e-02 + + +------------ Growing tree 96 -------------- + +- N obs inbag: 276 +- N row inbag: 178 +- max nodes: 233 +- max leaves: 117 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 0 13 6 11 16 + + + -- linear combo weights (showing up to 5) + + -0.3899 0.2861 0.2932 0.9669 0.5158 + + + -- cutpoint (score) + --- -1.58083 (0.534853), N = 251 moving right + --- -1.06651 (0.62373), N = 207 moving right + --- 1.2172 (0.646563), N = 42 moving right + --- 1.42393 (0.632549), N = 39 moving right + --- 1.60509 (0.617078), N = 34 moving right + + -- best stat: 0.646563, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 10 11 3 9 15 + + + -- linear combo weights (showing up to 5) + + -0.6518 0.4910 6.5571 0.2162 -0.0569 + + + -- cutpoint (score) + --- -0.613137 (0.609486), N = 210 moving right + --- -0.49187 (0.64986), N = 188 moving right + --- 0.987566 (0.679019), N = 50 moving right + --- 1.37029 (0.682144), N = 39 moving right + --- 1.55269 (0.658736), N = 33 moving right + + -- best stat: 0.682144, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 6 16 1 4 15 + + + -- linear combo weights (showing up to 5) + + 0.3471 0.4795 0.2447 0.7737 -0.1534 + + + -- cutpoint (score) + --- 0.162889 (0.651566), N = 164 moving right + --- 0.343139 (0.680035), N = 149 moving right + --- 0.484774 (0.714505), N = 125 moving right + --- 1.00764 (0.667612), N = 62 moving right + --- 1.64903 (0.607875), N = 26 moving right + + -- best stat: 0.714505, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 4.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.8188e-01 1.8222e-02 + 1.3100e+02 9.7464e-01 2.5602e-02 + 1.4000e+02 9.7101e-01 2.9319e-02 + + +------------ Growing tree 97 -------------- + +- N obs inbag: 276 +- N row inbag: 169 +- max nodes: 197 +- max leaves: 99 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 9 5 13 1 3 + + + -- linear combo weights (showing up to 5) + + 0.5798 0.1793 0.2936 0.4321 12.9205 + + + -- cutpoint (score) + --- -0.487092 (0.604221), N = 221 moving right + --- -0.351854 (0.649362), N = 193 moving right + --- 0.424712 (0.697089), N = 73 moving right + --- 0.454661 (0.696301), N = 71 moving right + --- 0.550467 (0.684603), N = 57 moving right + + -- best stat: 0.697089, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 9 7 16 4 8 + + + -- linear combo weights (showing up to 5) + + -0.2731 11.1386 0.2873 0.5417 1.9577 + + + -- cutpoint (score) + --- -0.999516 (0.603802), N = 220 moving right + --- -0.989992 (0.617027), N = 212 moving right + --- -0.977109 (0.634143), N = 204 moving right + --- -0.929817 (0.651751), N = 196 moving right + --- 3.86446 (0.645717), N = 21 moving right + + -- best stat: 0.651751, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 11 3 5 10 2 + + + -- linear combo weights (showing up to 5) + + 0.3307 11.9069 0.1249 -0.5437 -0.6429 + + + -- cutpoint (score) + --- -1.70205 (0.512535), N = 269 moving right + --- -1.01204 (0.630744), N = 207 moving right + --- -0.499123 (0.741516), N = 117 moving right + --- -0.0435017 (0.726247), N = 73 moving right + --- 0.449777 (0.678151), N = 38 moving right + + -- best stat: 0.741516, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.3400e+02 1.0000e+00 5.0000e+00 + 3.4800e+02 1.0000e+00 1.0000e+00 + 5.3300e+02 0 2.0000e+00 + 5.4900e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 1.4000e+02 9.9275e-01 7.2596e-03 + 1.9100e+02 9.8913e-01 1.0909e-02 + 2.1600e+02 9.8551e-01 1.4572e-02 + 2.2300e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 98 -------------- + +- N obs inbag: 276 +- N row inbag: 177 +- max nodes: 231 +- max leaves: 116 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 10 14 4 9 8 + + + -- linear combo weights (showing up to 5) + + -0.6013 0.0167 0.2203 -0.3920 2.1028 + + + -- cutpoint (score) + --- -1.34444 (0.580158), N = 220 moving right + --- -1.27331 (0.591803), N = 216 moving right + --- -0.848541 (0.688901), N = 169 moving right + --- 0.147466 (0.725964), N = 85 moving right + --- 2.82001 (0.63233), N = 26 moving right + + -- best stat: 0.725964, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 7 3 11 14 9 + + + -- linear combo weights (showing up to 5) + + 8.2325 3.2995 0.6228 0.2294 0.3216 + + + -- cutpoint (score) + --- -0.251074 (0.730383), N = 146 moving right + --- 0.437749 (0.740197), N = 76 moving right + --- 2.16693 (0.6512), N = 35 moving right + --- 4.03014 (0.62608), N = 26 moving right + --- 11.6375 (0.55454), N = 10 moving right + + -- best stat: 0.740197, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 15 17 3 5 14 + + + -- linear combo weights (showing up to 5) + + 0.0768 0.3218 6.1678 1.2027 0.2064 + + + -- cutpoint (score) + --- 0.85801 (0.655002), N = 194 moving right + --- 0.860274 (0.656137), N = 193 moving right + --- 2.26441 (0.688622), N = 64 moving right + --- 2.34714 (0.681078), N = 50 moving right + --- 8.61382 (0.556153), N = 10 moving right + + -- best stat: 0.688622, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 3.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.9275e-01 7.2596e-03 + 7.7000e+01 9.8913e-01 1.0909e-02 + 1.1000e+02 9.8188e-01 1.8235e-02 + 1.3100e+02 9.7464e-01 2.5615e-02 + + +------------ Growing tree 99 -------------- + +- N obs inbag: 276 +- N row inbag: 176 +- max nodes: 231 +- max leaves: 116 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 16 14 8 9 12 + + + -- linear combo weights (showing up to 5) + + 0.3741 0.0832 1.6125 -0.1948 0.1515 + + + -- cutpoint (score) + --- -1.05628 (0.601752), N = 217 moving right + --- -0.457038 (0.728554), N = 120 moving right + --- -0.288668 (0.747555), N = 105 moving right + --- 0.911892 (0.696399), N = 48 moving right + --- 6.39354 (0.531955), N = 8 moving right + + -- best stat: 0.747555, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 5 1 2 17 13 + + + -- linear combo weights (showing up to 5) + + 0.7527 0.4148 -0.3313 0.4734 0.6512 + + + -- cutpoint (score) + --- 0.118277 (0.564648), N = 247 moving right + --- 0.893009 (0.674225), N = 178 moving right + --- 1.0384 (0.699832), N = 163 moving right + --- 1.08103 (0.704323), N = 160 moving right + --- 1.49204 (0.749172), N = 115 moving right + + -- best stat: 0.749172, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 5 6 8 9 11 + + + -- linear combo weights (showing up to 5) + + 0.5233 -0.2246 1.3660 -0.3237 1.3391 + + + -- cutpoint (score) + --- -1.14762 (0.643926), N = 193 moving right + --- -0.225023 (0.724083), N = 100 moving right + --- 1.01494 (0.740789), N = 65 moving right + --- 1.12771 (0.731128), N = 58 moving right + --- 1.89011 (0.676221), N = 41 moving right + + -- best stat: 0.740789, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 4.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8188e-01 1.8169e-02 + 7.1000e+01 9.7826e-01 2.1859e-02 + 1.3100e+02 9.7464e-01 2.5562e-02 + 1.4000e+02 9.7101e-01 2.9280e-02 + + +------------ Growing tree 100 -------------- + +- N obs inbag: 276 +- N row inbag: 174 +- max nodes: 249 +- max leaves: 125 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 4 0 12 10 8 + + + -- linear combo weights (showing up to 5) + + 0.1998 -0.1006 0.0670 -0.6184 1.6571 + + + -- cutpoint (score) + --- -1.48341 (0.543867), N = 247 moving right + --- 0.555466 (0.718269), N = 76 moving right + --- 1.64075 (0.644387), N = 37 moving right + --- 1.97361 (0.624694), N = 32 moving right + --- 2.26786 (0.629952), N = 29 moving right + + -- best stat: 0.718269, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 15 0 12 9 3 + + + -- linear combo weights (showing up to 5) + + -0.2082 0.1773 0.1816 0.2128 5.9476 + + + -- cutpoint (score) + --- -0.311531 (0.501397), N = 256 moving right + --- 0.143695 (0.636704), N = 116 moving right + --- 0.244294 (0.668387), N = 82 moving right + --- 0.261021 (0.673548), N = 79 moving right + --- 0.344137 (0.639634), N = 59 moving right + + -- best stat: 0.673548, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 1 13 17 2 6 + + + -- linear combo weights (showing up to 5) + + 0.5988 0.4640 0.6115 -0.3171 1.3000 + + + -- cutpoint (score) + --- 1.02574 (0.616662), N = 220 moving right + --- 1.25409 (0.664216), N = 189 moving right + --- 2.12142 (0.730938), N = 93 moving right + --- 2.50013 (0.69908), N = 60 moving right + --- 3.22244 (0.622308), N = 37 moving right + + -- best stat: 0.730938, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 3.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8551e-01 1.4546e-02 + 7.7000e+01 9.7826e-01 2.1899e-02 + 1.1000e+02 9.6739e-01 3.3010e-02 + 1.3100e+02 9.6014e-01 4.0500e-02 + + +------------ Growing tree 101 -------------- + +- N obs inbag: 276 +- N row inbag: 178 +- max nodes: 225 +- max leaves: 113 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 17 2 13 12 6 + + + -- linear combo weights (showing up to 5) + + 0.5420 -0.5555 0.6483 0.0577 1.0071 + + + -- cutpoint (score) + --- 0.8572 (0.669142), N = 188 moving right + --- 0.877262 (0.672442), N = 186 moving right + --- 1.53667 (0.732037), N = 114 moving right + --- 1.53899 (0.712552), N = 110 moving right + --- 1.59142 (0.712316), N = 96 moving right + + -- best stat: 0.732037, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 15 7 11 17 6 + + + -- linear combo weights (showing up to 5) + + -0.0025 11.2793 0.6520 0.2767 0.9848 + + + -- cutpoint (score) + --- -0.0869319 (0.532646), N = 262 moving right + --- 0.579451 (0.692123), N = 174 moving right + --- 1.14552 (0.703418), N = 99 moving right + --- 1.70681 (0.696838), N = 53 moving right + --- 13.0934 (0.553172), N = 10 moving right + + -- best stat: 0.703418, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 12 17 3 0 4 + + + -- linear combo weights (showing up to 5) + + 0.1129 0.3252 6.2832 -0.1166 0.4878 + + + -- cutpoint (score) + --- 0.729067 (0.594618), N = 223 moving right + --- 0.824172 (0.617678), N = 202 moving right + --- 1.33729 (0.667531), N = 127 moving right + --- 1.34219 (0.669809), N = 126 moving right + --- 1.63126 (0.647201), N = 76 moving right + + -- best stat: 0.669809, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 4.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 3.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.8551e-01 1.4493e-02 + 5.1000e+01 9.8188e-01 1.8169e-02 + 1.1000e+02 9.7101e-01 2.9239e-02 + 1.3100e+02 9.6377e-01 3.6702e-02 + 1.9800e+02 9.6014e-01 4.0461e-02 + + +------------ Growing tree 102 -------------- + +- N obs inbag: 276 +- N row inbag: 178 +- max nodes: 229 +- max leaves: 115 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 15 2 6 1 9 + + + -- linear combo weights (showing up to 5) + + -0.2530 -0.1612 1.5772 0.4070 0.6487 + + + -- cutpoint (score) + --- -0.53873 (0.611888), N = 210 moving right + --- -0.210391 (0.664274), N = 153 moving right + --- -0.0704593 (0.697259), N = 129 moving right + --- -0.0647979 (0.707815), N = 125 moving right + --- 0.0709638 (0.730139), N = 98 moving right + + -- best stat: 0.730139, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 11 1 7 10 6 + + + -- linear combo weights (showing up to 5) + + 0.6558 0.2996 5.5731 -0.4964 1.4927 + + + -- cutpoint (score) + --- -0.257661 (0.690791), N = 159 moving right + --- 0.166996 (0.731182), N = 114 moving right + --- 0.441546 (0.731808), N = 94 moving right + --- 0.523571 (0.733915), N = 93 moving right + --- 1.19428 (0.710611), N = 57 moving right + + -- best stat: 0.733915, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 14 0 9 3 7 + + + -- linear combo weights (showing up to 5) + + 0.1811 -0.2753 0.5590 4.1958 6.0955 + + + -- cutpoint (score) + --- -0.496884 (0.547129), N = 218 moving right + --- -0.292661 (0.652508), N = 136 moving right + --- -0.214747 (0.671722), N = 122 moving right + --- 0.347257 (0.688225), N = 67 moving right + --- 0.770718 (0.65885), N = 48 moving right + + -- best stat: 0.688225, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 4.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.3400e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.7000e+01 9.9275e-01 7.2596e-03 + 1.1000e+02 9.8551e-01 1.4559e-02 + 1.7900e+02 9.8188e-01 1.8235e-02 + 1.9100e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 103 -------------- + +- N obs inbag: 276 +- N row inbag: 174 +- max nodes: 241 +- max leaves: 121 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 4 6 12 11 17 + + + -- linear combo weights (showing up to 5) + + 0.3135 1.7941 0.0920 1.1392 0.3261 + + + -- cutpoint (score) + --- -0.0962915 (0.562319), N = 240 moving right + --- 0.0318461 (0.609257), N = 217 moving right + --- 0.494726 (0.66318), N = 182 moving right + --- 3.25905 (0.667844), N = 43 moving right + --- 3.45797 (0.62958), N = 36 moving right + + -- best stat: 0.667844, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 16 17 1 9 0 + + + -- linear combo weights (showing up to 5) + + 0.8089 0.4698 0.3638 0.6908 -0.3211 + + + -- cutpoint (score) + --- 0.707059 (0.669353), N = 181 moving right + --- 0.719713 (0.678621), N = 177 moving right + --- 1.22039 (0.709185), N = 129 moving right + --- 1.48666 (0.724884), N = 108 moving right + --- 2.61495 (0.642202), N = 38 moving right + + -- best stat: 0.724884, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 6 12 16 7 5 + + + -- linear combo weights (showing up to 5) + + 1.2588 0.2780 0.6822 5.5801 0.6792 + + + -- cutpoint (score) + --- -0.584597 (0.576966), N = 232 moving right + --- 0.128435 (0.66584), N = 130 moving right + --- 0.544102 (0.703172), N = 88 moving right + --- 0.613064 (0.69944), N = 86 moving right + --- 0.96684 (0.679435), N = 72 moving right + + -- best stat: 0.703172, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + 3.4800e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.8551e-01 1.4559e-02 + 1.3100e+02 9.7826e-01 2.1912e-02 + 1.4000e+02 9.7464e-01 2.5616e-02 + + +------------ Growing tree 104 -------------- + +- N obs inbag: 276 +- N row inbag: 175 +- max nodes: 219 +- max leaves: 110 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 11 5 1 13 2 + + + -- linear combo weights (showing up to 5) + + 1.5289 0.8475 0.6299 0.3757 0.2830 + + + -- cutpoint (score) + --- -1.61298 (0.542714), N = 253 moving right + --- -0.608903 (0.678154), N = 181 moving right + --- -0.564636 (0.684755), N = 168 moving right + --- 1.33194 (0.733646), N = 64 moving right + --- 3.60686 (0.539435), N = 10 moving right + + -- best stat: 0.733646, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 17 15 5 6 4 + + + -- linear combo weights (showing up to 5) + + 0.4773 -0.1233 0.7469 0.2296 0.3174 + + + -- cutpoint (score) + --- 0.968925 (0.569455), N = 239 moving right + --- 1.34697 (0.623572), N = 204 moving right + --- 1.45288 (0.651773), N = 175 moving right + --- 2.65351 (0.617627), N = 44 moving right + --- 3.15865 (0.526339), N = 8 moving right + + -- best stat: 0.651773, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 15 9 4 10 5 + + + -- linear combo weights (showing up to 5) + + -0.1007 0.3431 0.2439 -0.8679 0.8623 + + + -- cutpoint (score) + --- -0.50869 (0.583968), N = 212 moving right + --- 0.159833 (0.692625), N = 141 moving right + --- 0.177099 (0.694868), N = 140 moving right + --- 0.572656 (0.702674), N = 101 moving right + --- 0.929153 (0.665143), N = 71 moving right + + -- best stat: 0.702674, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 4.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 3.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.8188e-01 1.8222e-02 + 1.1000e+02 9.7826e-01 2.1912e-02 + 1.3100e+02 9.6377e-01 3.6727e-02 + + +------------ Growing tree 105 -------------- + +- N obs inbag: 276 +- N row inbag: 172 +- max nodes: 229 +- max leaves: 115 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 6 0 10 2 3 + + + -- linear combo weights (showing up to 5) + + 0.6080 0.3986 -0.4979 -0.3200 6.9343 + + + -- cutpoint (score) + --- -0.491108 (0.595288), N = 214 moving right + --- -0.404999 (0.613214), N = 203 moving right + --- 0.468604 (0.694852), N = 58 moving right + --- 0.751322 (0.660898), N = 31 moving right + --- 7.21819 (0.578061), N = 15 moving right + + -- best stat: 0.694852, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 5 13 14 11 8 + + + -- linear combo weights (showing up to 5) + + 0.8560 0.0796 -0.0548 0.3583 1.0550 + + + -- cutpoint (score) + --- -0.73414 (0.611136), N = 222 moving right + --- -0.684516 (0.619789), N = 215 moving right + --- 0.448546 (0.722291), N = 91 moving right + --- 0.506861 (0.7109), N = 84 moving right + --- 0.893234 (0.67127), N = 58 moving right + + -- best stat: 0.722291, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 4 9 15 12 6 + + + -- linear combo weights (showing up to 5) + + 0.6027 0.4083 -0.1254 0.1186 1.2185 + + + -- cutpoint (score) + --- -0.296366 (0.518446), N = 251 moving right + --- -0.260194 (0.529857), N = 246 moving right + --- -0.234413 (0.541488), N = 240 moving right + --- 0.300603 (0.641652), N = 153 moving right + --- 1.40277 (0.583197), N = 35 moving right + + -- best stat: 0.641652, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 4.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 4.0000e+00 + 1.9100e+02 1.0000e+00 3.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 3.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.1000e+01 9.8913e-01 1.0909e-02 + 1.1000e+02 9.7464e-01 2.5561e-02 + 1.7900e+02 9.7101e-01 2.9279e-02 + + +------------ Growing tree 106 -------------- + +- N obs inbag: 276 +- N row inbag: 176 +- max nodes: 219 +- max leaves: 110 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 7 9 1 14 5 + + + -- linear combo weights (showing up to 5) + + 6.8001 0.3889 0.4672 0.3356 0.6129 + + + -- cutpoint (score) + --- -0.350927 (0.615222), N = 209 moving right + --- -0.195204 (0.635508), N = 187 moving right + --- 0.582286 (0.701863), N = 76 moving right + --- 2.57806 (0.600232), N = 20 moving right + --- 3.51323 (0.580645), N = 15 moving right + + -- best stat: 0.701863, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 6 2 4 0 5 + + + -- linear combo weights (showing up to 5) + + 0.5771 0.0542 0.8751 -0.0895 1.0045 + + + -- cutpoint (score) + --- 0.0541837 (0.648239), N = 168 moving right + --- 0.92933 (0.624875), N = 94 moving right + --- 1.00452 (0.612104), N = 78 moving right + --- 1.50643 (0.600132), N = 61 moving right + --- 1.84438 (0.569693), N = 44 moving right + + -- best stat: 0.648239, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 6 3 9 1 15 + + + -- linear combo weights (showing up to 5) + + 0.4908 4.5462 0.5039 0.3431 -0.1241 + + + -- cutpoint (score) + --- -0.63672 (0.537135), N = 252 moving right + --- -0.531325 (0.567054), N = 236 moving right + --- -0.37954 (0.597953), N = 214 moving right + --- 0.542727 (0.665647), N = 58 moving right + --- 1.72126 (0.597454), N = 26 moving right + + -- best stat: 0.665647, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 3.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 4.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.8551e-01 1.4532e-02 + 1.1000e+02 9.8188e-01 1.8209e-02 + 1.4000e+02 9.7826e-01 2.1899e-02 + 1.7900e+02 9.7464e-01 2.5602e-02 + + +------------ Growing tree 107 -------------- + +- N obs inbag: 276 +- N row inbag: 179 +- max nodes: 251 +- max leaves: 126 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 6 12 5 8 9 + + + -- linear combo weights (showing up to 5) + + 0.1144 0.0222 0.6313 1.6867 -0.5487 + + + -- cutpoint (score) + --- -0.758912 (0.576944), N = 209 moving right + --- -0.493065 (0.701184), N = 142 moving right + --- 0.277822 (0.712746), N = 85 moving right + --- 0.708754 (0.700103), N = 72 moving right + --- 2.89863 (0.565675), N = 15 moving right + + -- best stat: 0.712746, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 12 17 9 15 16 + + + -- linear combo weights (showing up to 5) + + 0.0822 0.7143 0.2426 -0.0176 0.3312 + + + -- cutpoint (score) + --- 1.69926 (0.631917), N = 190 moving right + --- 1.79425 (0.649894), N = 174 moving right + --- 1.90223 (0.658011), N = 166 moving right + --- 2.27639 (0.687679), N = 118 moving right + --- 2.35949 (0.696621), N = 114 moving right + + -- best stat: 0.696621, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 4 15 3 2 13 + + + -- linear combo weights (showing up to 5) + + 1.0248 0.0383 5.5793 -0.6845 0.4325 + + + -- cutpoint (score) + --- -0.964582 (0.575863), N = 234 moving right + --- -0.050398 (0.708147), N = 153 moving right + --- 0.276757 (0.728469), N = 109 moving right + --- 0.61387 (0.676391), N = 69 moving right + --- 0.940229 (0.610331), N = 41 moving right + + -- best stat: 0.728469, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 3.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 3.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.9275e-01 7.2596e-03 + 7.7000e+01 9.8551e-01 1.4559e-02 + 1.1000e+02 9.7464e-01 2.5588e-02 + 1.3100e+02 9.6739e-01 3.3023e-02 + + +------------ Growing tree 108 -------------- + +- N obs inbag: 276 +- N row inbag: 170 +- max nodes: 249 +- max leaves: 125 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 6 1 14 8 9 + + + -- linear combo weights (showing up to 5) + + 0.4690 0.2937 -0.1994 1.5712 -0.2550 + + + -- cutpoint (score) + --- -0.632001 (0.631351), N = 184 moving right + --- -0.339169 (0.711352), N = 125 moving right + --- -0.249555 (0.741245), N = 110 moving right + --- -0.123905 (0.740243), N = 95 moving right + --- 0.438178 (0.713736), N = 61 moving right + + -- best stat: 0.741245, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 9 5 7 14 1 + + + -- linear combo weights (showing up to 5) + + 0.3522 0.4964 6.3066 0.1640 0.4849 + + + -- cutpoint (score) + --- -0.453998 (0.557161), N = 237 moving right + --- -0.338484 (0.578218), N = 227 moving right + --- -0.281309 (0.588376), N = 219 moving right + --- -0.0598735 (0.660042), N = 174 moving right + --- 1.84919 (0.597852), N = 21 moving right + + -- best stat: 0.660042, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 3 2 10 7 14 + + + -- linear combo weights (showing up to 5) + + 2.2360 -0.5583 -0.5017 4.8257 0.1924 + + + -- cutpoint (score) + --- -1.42422 (0.51719), N = 261 moving right + --- -0.664598 (0.651447), N = 168 moving right + --- -0.486514 (0.68158), N = 128 moving right + --- -0.29002 (0.688011), N = 101 moving right + --- -0.27534 (0.690696), N = 100 moving right + + -- best stat: 0.690696, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 3.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 7.1000e+01 9.9638e-01 3.6232e-03 + 1.1000e+02 9.9275e-01 7.2596e-03 + 1.4000e+02 9.8551e-01 1.4559e-02 + 1.7900e+02 9.7464e-01 2.5588e-02 + 1.8600e+02 9.6739e-01 3.3023e-02 + + +------------ Growing tree 109 -------------- + +- N obs inbag: 276 +- N row inbag: 173 +- max nodes: 219 +- max leaves: 110 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 17 16 9 12 13 + + + -- linear combo weights (showing up to 5) + + 0.6438 0.9137 0.3986 0.0280 0.4347 + + + -- cutpoint (score) + --- 1.78633 (0.734439), N = 130 moving right + --- 2.1431 (0.72785), N = 104 moving right + --- 2.45967 (0.740281), N = 83 moving right + --- 3.01883 (0.702965), N = 55 moving right + --- 3.23394 (0.70347), N = 42 moving right + + -- best stat: 0.740281, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 9 1 16 15 4 + + + -- linear combo weights (showing up to 5) + + 0.5249 0.2694 0.9493 -0.0113 0.7884 + + + -- cutpoint (score) + --- -0.937126 (0.58658), N = 230 moving right + --- -0.417205 (0.621041), N = 187 moving right + --- 0.43182 (0.733758), N = 103 moving right + --- 0.768651 (0.72741), N = 76 moving right + --- 1.13347 (0.711179), N = 61 moving right + + -- best stat: 0.733758, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 17 16 7 12 15 + + + -- linear combo weights (showing up to 5) + + 0.5144 0.7842 8.4154 0.0644 0.0357 + + + -- cutpoint (score) + --- 0.474689 (0.535339), N = 254 moving right + --- 0.898381 (0.63602), N = 194 moving right + --- 1.59519 (0.701274), N = 101 moving right + --- 2.11518 (0.70492), N = 68 moving right + --- 11.6 (0.545157), N = 6 moving right + + -- best stat: 0.70492, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 3.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 4.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 3.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 7.1000e+01 9.8188e-01 1.8195e-02 + 1.3100e+02 9.7826e-01 2.1885e-02 + 1.4000e+02 9.7464e-01 2.5589e-02 + 1.8600e+02 9.6014e-01 4.0459e-02 + + +------------ Growing tree 110 -------------- + +- N obs inbag: 276 +- N row inbag: 172 +- max nodes: 251 +- max leaves: 126 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 16 11 0 4 1 + + + -- linear combo weights (showing up to 5) + + 0.5085 1.2563 -0.0663 0.3633 0.4366 + + + -- cutpoint (score) + --- -0.37337 (0.71017), N = 144 moving right + --- -0.293585 (0.720938), N = 140 moving right + --- -0.14957 (0.719544), N = 127 moving right + --- 0.177987 (0.715281), N = 108 moving right + --- 2.17011 (0.650127), N = 40 moving right + + -- best stat: 0.720938, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 5 0 17 6 4 + + + -- linear combo weights (showing up to 5) + + 0.7939 -0.1484 0.4746 0.6886 0.0250 + + + -- cutpoint (score) + --- 0.474577 (0.517576), N = 267 moving right + --- 1.2753 (0.615257), N = 197 moving right + --- 1.63774 (0.664087), N = 142 moving right + --- 2.24265 (0.661764), N = 64 moving right + --- 2.7828 (0.558265), N = 16 moving right + + -- best stat: 0.664087, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 17 2 5 15 11 + + + -- linear combo weights (showing up to 5) + + 0.4795 -0.3424 0.5488 0.1244 1.1555 + + + -- cutpoint (score) + --- -0.309871 (0.531718), N = 262 moving right + --- -0.277807 (0.537234), N = 260 moving right + --- 0.910725 (0.703039), N = 157 moving right + --- 1.4025 (0.731565), N = 109 moving right + --- 3.38375 (0.572993), N = 23 moving right + + -- best stat: 0.731565, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.1000e+01 9.8551e-01 1.4559e-02 + 7.7000e+01 9.8188e-01 1.8235e-02 + 1.1000e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 111 -------------- + +- N obs inbag: 276 +- N row inbag: 170 +- max nodes: 219 +- max leaves: 110 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 0 13 15 16 10 + + + -- linear combo weights (showing up to 5) + + -0.1315 0.5642 0.0048 0.7588 -0.9577 + + + -- cutpoint (score) + --- -1.77062 (0.547239), N = 242 moving right + --- -1.25394 (0.601233), N = 213 moving right + --- -1.03774 (0.614889), N = 191 moving right + --- 0.632126 (0.722877), N = 71 moving right + --- 2.73785 (0.581328), N = 13 moving right + + -- best stat: 0.722877, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 6 4 10 8 15 + + + -- linear combo weights (showing up to 5) + + 0.0622 -0.1256 -0.7073 1.8583 -0.2485 + + + -- cutpoint (score) + --- -0.37302 (0.752533), N = 116 moving right + --- -0.369732 (0.755214), N = 115 moving right + --- 0.171088 (0.744174), N = 85 moving right + --- 0.432539 (0.734507), N = 69 moving right + --- 1.87496 (0.662171), N = 36 moving right + + -- best stat: 0.755214, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 16 15 13 14 7 + + + -- linear combo weights (showing up to 5) + + 0.5253 -0.1324 0.4839 0.6415 7.6382 + + + -- cutpoint (score) + --- -1.49107 (0.507599), N = 270 moving right + --- -1.46249 (0.517794), N = 264 moving right + --- -0.861436 (0.570437), N = 236 moving right + --- -0.520449 (0.670614), N = 177 moving right + --- 0.599264 (0.690666), N = 70 moving right + + -- best stat: 0.690666, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 7.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.8188e-01 1.8222e-02 + 1.1000e+02 9.7826e-01 2.1912e-02 + 1.4000e+02 9.7464e-01 2.5616e-02 + + +------------ Growing tree 112 -------------- + +- N obs inbag: 276 +- N row inbag: 171 +- max nodes: 205 +- max leaves: 103 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 0 4 17 15 2 + + + -- linear combo weights (showing up to 5) + + -0.1465 0.6594 0.4816 -0.1812 -1.4257 + + + -- cutpoint (score) + --- -0.348137 (0.607437), N = 218 moving right + --- -0.164865 (0.634374), N = 194 moving right + --- 0.44785 (0.687229), N = 125 moving right + --- 0.784501 (0.701107), N = 90 moving right + --- 2.14196 (0.531629), N = 17 moving right + + -- best stat: 0.701107, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 11 14 3 13 6 + + + -- linear combo weights (showing up to 5) + + 0.9095 -0.0962 8.4073 0.5077 0.1620 + + + -- cutpoint (score) + --- -1.09323 (0.579681), N = 233 moving right + --- -0.817676 (0.625122), N = 211 moving right + --- -0.76142 (0.635525), N = 206 moving right + --- 0.959694 (0.727689), N = 58 moving right + --- 1.56912 (0.657725), N = 30 moving right + + -- best stat: 0.727689, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 16 9 0 15 4 + + + -- linear combo weights (showing up to 5) + + 0.3978 0.7224 -0.1106 -0.3153 1.0795 + + + -- cutpoint (score) + --- 0.0222139 (0.681762), N = 160 moving right + --- 0.038898 (0.685281), N = 158 moving right + --- 0.25205 (0.716246), N = 137 moving right + --- 0.415252 (0.712019), N = 120 moving right + --- 0.497293 (0.710823), N = 115 moving right + + -- best stat: 0.716246, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 3.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 3.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + 3.3400e+02 1.0000e+00 2.0000e+00 + 3.4800e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8188e-01 1.8195e-02 + 1.1000e+02 9.7464e-01 2.5575e-02 + 1.3100e+02 9.7101e-01 2.9293e-02 + 1.4000e+02 9.6014e-01 4.0487e-02 + + +------------ Growing tree 113 -------------- + +- N obs inbag: 276 +- N row inbag: 169 +- max nodes: 203 +- max leaves: 102 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 11 14 5 7 16 + + + -- linear combo weights (showing up to 5) + + 1.6488 0.1412 0.1952 6.1559 0.6840 + + + -- cutpoint (score) + --- -1.70318 (0.542347), N = 250 moving right + --- -0.833164 (0.724203), N = 144 moving right + --- 0.844811 (0.762733), N = 62 moving right + --- 2.77057 (0.673184), N = 33 moving right + --- 3.3508 (0.613536), N = 22 moving right + + -- best stat: 0.762733, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 4 5 7 9 0 + + + -- linear combo weights (showing up to 5) + + 0.6065 0.2219 8.7567 0.3134 -0.0905 + + + -- cutpoint (score) + --- 0.134476 (0.657538), N = 154 moving right + --- 0.370169 (0.654471), N = 136 moving right + --- 0.517007 (0.681812), N = 97 moving right + --- 0.588104 (0.682562), N = 82 moving right + --- 0.634513 (0.688322), N = 79 moving right + + -- best stat: 0.688322, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 13 5 15 2 17 + + + -- linear combo weights (showing up to 5) + + 0.4588 0.5230 0.0333 -0.8626 0.6037 + + + -- cutpoint (score) + --- 0.381179 (0.606011), N = 219 moving right + --- 0.850051 (0.686733), N = 173 moving right + --- 0.921719 (0.685718), N = 170 moving right + --- 1.35796 (0.713214), N = 123 moving right + --- 1.61999 (0.69823), N = 86 moving right + + -- best stat: 0.713214, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 3.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + 3.2600e+02 1.0000e+00 2.0000e+00 + 3.3400e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.8913e-01 1.0870e-02 + 7.1000e+01 9.8188e-01 1.8196e-02 + 1.4000e+02 9.7464e-01 2.5576e-02 + 1.7900e+02 9.7101e-01 2.9293e-02 + 1.9100e+02 9.6739e-01 3.3024e-02 + + +------------ Growing tree 114 -------------- + +- N obs inbag: 276 +- N row inbag: 165 +- max nodes: 235 +- max leaves: 118 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 11 7 6 2 9 + + + -- linear combo weights (showing up to 5) + + 0.6569 11.4896 0.8625 0.0128 0.1589 + + + -- cutpoint (score) + --- -0.457905 (0.61642), N = 218 moving right + --- -0.352363 (0.662769), N = 185 moving right + --- 0.147583 (0.713466), N = 106 moving right + --- 0.349828 (0.715956), N = 85 moving right + --- 0.472275 (0.706796), N = 69 moving right + + -- best stat: 0.715956, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 13 0 3 2 14 + + + -- linear combo weights (showing up to 5) + + 0.3834 -0.3078 4.2381 -0.2140 0.1320 + + + -- cutpoint (score) + --- -0.531339 (0.663107), N = 183 moving right + --- -0.276934 (0.703229), N = 121 moving right + --- -0.156743 (0.661165), N = 94 moving right + --- 0.0218534 (0.632651), N = 69 moving right + --- 0.333385 (0.588054), N = 38 moving right + + -- best stat: 0.703229, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 2 14 0 8 9 + + + -- linear combo weights (showing up to 5) + + -0.5169 -0.3740 -0.0962 2.5563 -0.5484 + + + -- cutpoint (score) + --- -2.4447 (0.498966), N = 270 moving right + --- -2.06107 (0.521106), N = 261 moving right + --- -1.89425 (0.537759), N = 244 moving right + --- -1.87114 (0.541157), N = 243 moving right + --- -0.00756827 (0.670473), N = 53 moving right + + -- best stat: 0.670473, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 3.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 3.0000e+00 + 1.9100e+02 1.0000e+00 5.0000e+00 + 1.9800e+02 1.0000e+00 3.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + 3.4800e+02 1.0000e+00 2.0000e+00 + 4.0000e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.8913e-01 1.0870e-02 + 7.1000e+01 9.8188e-01 1.8196e-02 + 7.7000e+01 9.7826e-01 2.1886e-02 + 1.3100e+02 9.7464e-01 2.5589e-02 + 1.4000e+02 9.6377e-01 3.6742e-02 + + +------------ Growing tree 115 -------------- + +- N obs inbag: 276 +- N row inbag: 179 +- max nodes: 203 +- max leaves: 102 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 10 9 1 0 11 + + + -- linear combo weights (showing up to 5) + + -0.5095 0.4480 0.4669 0.0472 1.3099 + + + -- cutpoint (score) + --- -1.58631 (0.564593), N = 238 moving right + --- -1.30992 (0.601689), N = 219 moving right + --- -1.22838 (0.629784), N = 206 moving right + --- -1.05842 (0.666446), N = 182 moving right + --- 1.0185 (0.718674), N = 63 moving right + + -- best stat: 0.718674, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 7 11 9 15 6 + + + -- linear combo weights (showing up to 5) + + 12.6239 1.1561 0.5354 -0.0199 1.7727 + + + -- cutpoint (score) + --- -1.24956 (0.541245), N = 252 moving right + --- -0.715092 (0.671112), N = 184 moving right + --- 0.715051 (0.755336), N = 82 moving right + --- 1.75222 (0.698815), N = 43 moving right + --- 3.3687 (0.626729), N = 23 moving right + + -- best stat: 0.755336, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 3 11 1 13 0 + + + -- linear combo weights (showing up to 5) + + 5.5383 1.2687 0.4270 0.6315 0.1195 + + + -- cutpoint (score) + --- -1.29614 (0.607696), N = 218 moving right + --- -1.10014 (0.631415), N = 204 moving right + --- -0.0660887 (0.77311), N = 119 moving right + --- 0.515683 (0.741134), N = 90 moving right + --- 1.25268 (0.741959), N = 61 moving right + + -- best stat: 0.77311, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 1.1000e+02 9.9275e-01 7.2596e-03 + 1.3100e+02 9.8913e-01 1.0909e-02 + 1.4000e+02 9.8188e-01 1.8235e-02 + 1.8600e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 116 -------------- + +- N obs inbag: 276 +- N row inbag: 175 +- max nodes: 227 +- max leaves: 114 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 15 14 5 6 7 + + + -- linear combo weights (showing up to 5) + + -0.2249 0.4326 0.7262 1.6719 5.5451 + + + -- cutpoint (score) + --- -0.319289 (0.574713), N = 219 moving right + --- 0.0614955 (0.661286), N = 158 moving right + --- 0.348988 (0.677744), N = 120 moving right + --- 0.550438 (0.676619), N = 88 moving right + --- 2.42958 (0.621384), N = 25 moving right + + -- best stat: 0.677744, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 10 7 4 12 1 + + + -- linear combo weights (showing up to 5) + + -0.5595 5.1762 0.9258 0.0850 0.4840 + + + -- cutpoint (score) + --- -0.912407 (0.519537), N = 260 moving right + --- -0.0650527 (0.658957), N = 185 moving right + --- 0.196342 (0.700951), N = 159 moving right + --- 1.427 (0.674212), N = 60 moving right + --- 1.64585 (0.625074), N = 39 moving right + + -- best stat: 0.700951, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 11 16 15 4 3 + + + -- linear combo weights (showing up to 5) + + 0.7886 0.2234 -0.1147 1.0623 4.1910 + + + -- cutpoint (score) + --- -0.735197 (0.546967), N = 251 moving right + --- -0.575535 (0.580969), N = 237 moving right + --- 0.372981 (0.69582), N = 152 moving right + --- 0.662947 (0.744997), N = 124 moving right + --- 2.07736 (0.670916), N = 42 moving right + + -- best stat: 0.744997, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 3.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 3.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.9275e-01 7.2596e-03 + 7.7000e+01 9.8188e-01 1.8208e-02 + 1.1000e+02 9.7826e-01 2.1898e-02 + 1.3100e+02 9.7464e-01 2.5602e-02 + + +------------ Growing tree 117 -------------- + +- N obs inbag: 276 +- N row inbag: 170 +- max nodes: 195 +- max leaves: 98 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 13 1 16 15 4 + + + -- linear combo weights (showing up to 5) + + 0.6701 0.3570 0.6424 -0.1268 0.9312 + + + -- cutpoint (score) + --- -1.00892 (0.548109), N = 244 moving right + --- -0.448671 (0.637637), N = 192 moving right + --- -0.443266 (0.642627), N = 189 moving right + --- 1.09858 (0.696979), N = 71 moving right + --- 1.99876 (0.628396), N = 29 moving right + + -- best stat: 0.696979, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 16 3 1 11 14 + + + -- linear combo weights (showing up to 5) + + 0.4967 10.7092 0.3051 0.7162 0.0387 + + + -- cutpoint (score) + --- -0.334025 (0.702103), N = 130 moving right + --- -0.0870324 (0.728261), N = 105 moving right + --- 0.400139 (0.713963), N = 67 moving right + --- 0.742459 (0.682994), N = 54 moving right + --- 2.3439 (0.60904), N = 18 moving right + + -- best stat: 0.728261, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 4 2 9 5 3 + + + -- linear combo weights (showing up to 5) + + 0.5185 -0.7086 0.7778 0.9137 12.1001 + + + -- cutpoint (score) + --- -0.552061 (0.669322), N = 175 moving right + --- -0.454349 (0.669143), N = 170 moving right + --- -0.371897 (0.703066), N = 152 moving right + --- 0.293974 (0.720004), N = 81 moving right + --- 12.5479 (0.531372), N = 5 moving right + + -- best stat: 0.720004, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 3.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 7.1000e+01 9.9638e-01 3.6232e-03 + 7.7000e+01 9.8913e-01 1.0896e-02 + 1.3100e+02 9.8188e-01 1.8222e-02 + 1.8600e+02 9.7464e-01 2.5602e-02 + 1.9100e+02 9.7101e-01 2.9319e-02 + + +------------ Growing tree 118 -------------- + +- N obs inbag: 276 +- N row inbag: 182 +- max nodes: 217 +- max leaves: 109 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 2 16 0 8 7 + + + -- linear combo weights (showing up to 5) + + -0.2128 0.3217 -0.3824 1.6196 4.2242 + + + -- cutpoint (score) + --- -1.5303 (0.563569), N = 236 moving right + --- -1.44495 (0.594664), N = 219 moving right + --- -0.958738 (0.747602), N = 132 moving right + --- -0.253207 (0.732734), N = 86 moving right + --- -0.175496 (0.730096), N = 81 moving right + + -- best stat: 0.747602, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 12 14 0 15 10 + + + -- linear combo weights (showing up to 5) + + 0.0812 0.3891 0.0507 -0.3171 -0.8217 + + + -- cutpoint (score) + --- -0.733658 (0.611611), N = 205 moving right + --- -0.623561 (0.597742), N = 198 moving right + --- 0.0594178 (0.66227), N = 119 moving right + --- 0.440908 (0.667406), N = 86 moving right + --- 0.903826 (0.635392), N = 44 moving right + + -- best stat: 0.667406, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 7 6 2 9 4 + + + -- linear combo weights (showing up to 5) + + 6.3706 2.2308 -0.4320 0.4053 0.8843 + + + -- cutpoint (score) + --- -0.775945 (0.510292), N = 271 moving right + --- -0.627489 (0.583673), N = 233 moving right + --- -0.482486 (0.638849), N = 206 moving right + --- -0.468676 (0.640308), N = 201 moving right + --- 6.86391 (0.536211), N = 7 moving right + + -- best stat: 0.640308, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 3.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 2.0000e+00 + 3.3400e+02 1.0000e+00 1.0000e+00 + 3.4800e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 7.7000e+01 9.8551e-01 1.4546e-02 + 1.7900e+02 9.8188e-01 1.8222e-02 + 1.9100e+02 9.7101e-01 2.9292e-02 + 2.1600e+02 9.6739e-01 3.3024e-02 + + +------------ Growing tree 119 -------------- + +- N obs inbag: 276 +- N row inbag: 178 +- max nodes: 211 +- max leaves: 106 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 8 13 1 9 12 + + + -- linear combo weights (showing up to 5) + + 1.8858 0.3008 0.7291 -0.6122 0.2428 + + + -- cutpoint (score) + --- -1.66011 (0.545217), N = 252 moving right + --- -1.18664 (0.624521), N = 208 moving right + --- -0.916923 (0.679692), N = 166 moving right + --- 0.339487 (0.768492), N = 69 moving right + --- 0.839006 (0.693566), N = 50 moving right + + -- best stat: 0.768492, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 13 17 5 4 7 + + + -- linear combo weights (showing up to 5) + + 0.4332 0.3674 1.1271 -0.0184 12.9396 + + + -- cutpoint (score) + --- 1.36168 (0.691562), N = 122 moving right + --- 1.50413 (0.713887), N = 105 moving right + --- 2.01522 (0.69459), N = 62 moving right + --- 3.46256 (0.625958), N = 22 moving right + --- 14.4663 (0.570635), N = 12 moving right + + -- best stat: 0.713887, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 0 11 5 13 1 + + + -- linear combo weights (showing up to 5) + + -0.3726 0.9522 1.3692 0.4114 0.8428 + + + -- cutpoint (score) + --- -1.53115 (0.569437), N = 242 moving right + --- -0.771751 (0.670522), N = 183 moving right + --- -0.545802 (0.692847), N = 155 moving right + --- 0.145933 (0.744816), N = 111 moving right + --- 2.57335 (0.58586), N = 16 moving right + + -- best stat: 0.744816, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 3.0000e+00 + 1.8600e+02 1.0000e+00 3.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 5.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.3400e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 7.1000e+01 9.9638e-01 3.6232e-03 + 1.1000e+02 9.9275e-01 7.2596e-03 + 1.7900e+02 9.8188e-01 1.8208e-02 + 1.8600e+02 9.7101e-01 2.9279e-02 + 1.9100e+02 9.6739e-01 3.3010e-02 + + +------------ Growing tree 120 -------------- + +- N obs inbag: 276 +- N row inbag: 174 +- max nodes: 207 +- max leaves: 104 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 14 3 16 6 7 + + + -- linear combo weights (showing up to 5) + + 0.4553 5.9336 0.4009 0.0321 2.5580 + + + -- cutpoint (score) + --- -0.543362 (0.539442), N = 240 moving right + --- -0.501512 (0.563284), N = 226 moving right + --- -0.170898 (0.641078), N = 158 moving right + --- 0.0718255 (0.670874), N = 97 moving right + --- 0.0725243 (0.665926), N = 96 moving right + + -- best stat: 0.670874, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 0 17 12 4 8 + + + -- linear combo weights (showing up to 5) + + -0.0233 0.2450 0.1703 0.2783 1.3595 + + + -- cutpoint (score) + --- -0.157449 (0.59826), N = 218 moving right + --- 0.301616 (0.669113), N = 159 moving right + --- 0.687177 (0.750199), N = 106 moving right + --- 0.877822 (0.732397), N = 91 moving right + --- 1.13295 (0.668736), N = 64 moving right + + -- best stat: 0.750199, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 15 8 0 16 10 + + + -- linear combo weights (showing up to 5) + + -0.1715 1.3228 0.0372 0.2981 -0.4428 + + + -- cutpoint (score) + --- -1.53614 (0.491843), N = 258 moving right + --- -1.36467 (0.504739), N = 252 moving right + --- -0.879622 (0.620088), N = 192 moving right + --- -0.656322 (0.678822), N = 154 moving right + --- 0.67756 (0.712036), N = 53 moving right + + -- best stat: 0.712036, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + 3.3400e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 7.1000e+01 9.9638e-01 3.6232e-03 + 1.3100e+02 9.9275e-01 7.2596e-03 + 1.8600e+02 9.8913e-01 1.0909e-02 + 1.9800e+02 9.8188e-01 1.8235e-02 + 2.1600e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 121 -------------- + +- N obs inbag: 276 +- N row inbag: 176 +- max nodes: 229 +- max leaves: 115 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 17 11 5 0 6 + + + -- linear combo weights (showing up to 5) + + 0.3718 1.0311 0.4293 -0.0570 -0.0653 + + + -- cutpoint (score) + --- 0.0672303 (0.569554), N = 248 moving right + --- 0.805439 (0.697907), N = 158 moving right + --- 0.918581 (0.703895), N = 146 moving right + --- 2.31771 (0.650271), N = 48 moving right + --- 2.56976 (0.630271), N = 37 moving right + + -- best stat: 0.703895, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 15 14 17 10 4 + + + -- linear combo weights (showing up to 5) + + -0.0556 0.1977 0.5222 -0.6836 -0.0115 + + + -- cutpoint (score) + --- -0.0311255 (0.510504), N = 266 moving right + --- 1.39672 (0.668876), N = 157 moving right + --- 2.26572 (0.655349), N = 66 moving right + --- 3.20686 (0.582733), N = 15 moving right + --- 3.2798 (0.574632), N = 14 moving right + + -- best stat: 0.668876, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 14 8 9 10 4 + + + -- linear combo weights (showing up to 5) + + -0.0507 1.8863 -0.3039 -0.5209 0.0483 + + + -- cutpoint (score) + --- -1.51332 (0.540659), N = 243 moving right + --- -1.12798 (0.612888), N = 205 moving right + --- -0.724613 (0.692384), N = 163 moving right + --- 1.13191 (0.653411), N = 41 moving right + --- 1.71505 (0.632849), N = 32 moving right + + -- best stat: 0.692384, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 3.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 4.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8551e-01 1.4532e-02 + 7.7000e+01 9.8188e-01 1.8209e-02 + 1.1000e+02 9.7826e-01 2.1899e-02 + 1.9100e+02 9.7464e-01 2.5602e-02 + + +------------ Growing tree 122 -------------- + +- N obs inbag: 276 +- N row inbag: 176 +- max nodes: 221 +- max leaves: 111 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 5 13 15 12 4 + + + -- linear combo weights (showing up to 5) + + 0.5344 0.5855 0.1194 0.0334 0.8695 + + + -- cutpoint (score) + --- -0.471922 (0.558981), N = 244 moving right + --- -0.210709 (0.598084), N = 224 moving right + --- -0.118552 (0.608319), N = 214 moving right + --- 0.831966 (0.677311), N = 106 moving right + --- 1.44002 (0.60125), N = 46 moving right + + -- best stat: 0.677311, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 15 6 8 12 0 + + + -- linear combo weights (showing up to 5) + + -0.0326 0.8728 2.5519 -0.0987 -0.0631 + + + -- cutpoint (score) + --- -1.41348 (0.626338), N = 203 moving right + --- -1.4004 (0.631895), N = 201 moving right + --- -1.27462 (0.675472), N = 170 moving right + --- -1.17719 (0.716066), N = 149 moving right + --- 2.1939 (0.639801), N = 31 moving right + + -- best stat: 0.716066, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 6 5 12 0 3 + + + -- linear combo weights (showing up to 5) + + 0.7439 0.7910 0.2518 -0.0289 8.5138 + + + -- cutpoint (score) + --- -0.0662412 (0.6093), N = 158 moving right + --- -0.018638 (0.617615), N = 143 moving right + --- -0.0108478 (0.627605), N = 137 moving right + --- 0.669915 (0.640292), N = 64 moving right + --- 0.725903 (0.64591), N = 43 moving right + + -- best stat: 0.64591, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8551e-01 1.4546e-02 + 7.1000e+01 9.8188e-01 1.8222e-02 + 7.7000e+01 9.7826e-01 2.1912e-02 + 1.7900e+02 9.7464e-01 2.5616e-02 + + +------------ Growing tree 123 -------------- + +- N obs inbag: 276 +- N row inbag: 175 +- max nodes: 225 +- max leaves: 113 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 17 2 12 15 11 + + + -- linear combo weights (showing up to 5) + + 0.7186 0.6852 -0.0118 -0.0457 0.9867 + + + -- cutpoint (score) + --- 1.54423 (0.577162), N = 239 moving right + --- 1.86163 (0.608561), N = 224 moving right + --- 2.22638 (0.661688), N = 186 moving right + --- 2.24387 (0.669584), N = 183 moving right + --- 4.01615 (0.610601), N = 32 moving right + + -- best stat: 0.669584, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 4 8 15 0 10 + + + -- linear combo weights (showing up to 5) + + -0.1982 1.7415 -0.1500 -0.3958 -0.7998 + + + -- cutpoint (score) + --- -2.20455 (0.525095), N = 251 moving right + --- -1.43877 (0.632166), N = 190 moving right + --- -1.14226 (0.665708), N = 171 moving right + --- -0.963588 (0.695128), N = 154 moving right + --- -0.947049 (0.686049), N = 152 moving right + + -- best stat: 0.695128, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 11 8 16 14 9 + + + -- linear combo weights (showing up to 5) + + 0.5595 1.7172 0.2482 0.0856 -0.4108 + + + -- cutpoint (score) + --- -1.14121 (0.636451), N = 190 moving right + --- -1.12871 (0.64049), N = 186 moving right + --- -0.838161 (0.71755), N = 137 moving right + --- -0.624923 (0.723263), N = 123 moving right + --- 0.0849323 (0.692965), N = 78 moving right + + -- best stat: 0.723263, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.1000e+01 9.8551e-01 1.4559e-02 + 7.7000e+01 9.7826e-01 2.1912e-02 + 1.4000e+02 9.7464e-01 2.5616e-02 + + +------------ Growing tree 124 -------------- + +- N obs inbag: 276 +- N row inbag: 176 +- max nodes: 211 +- max leaves: 106 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 17 3 8 15 7 + + + -- linear combo weights (showing up to 5) + + 0.3456 8.5614 1.7756 0.0315 0.9153 + + + -- cutpoint (score) + --- -0.265955 (0.58281), N = 238 moving right + --- 0.00243713 (0.635649), N = 212 moving right + --- 0.428281 (0.717766), N = 153 moving right + --- 1.01964 (0.779051), N = 92 moving right + --- 1.81079 (0.690957), N = 60 moving right + + -- best stat: 0.779051, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 16 4 7 6 2 + + + -- linear combo weights (showing up to 5) + + 0.4412 0.7462 3.6007 0.4215 -0.5366 + + + -- cutpoint (score) + --- -0.0684662 (0.704275), N = 121 moving right + --- 0.115744 (0.710533), N = 104 moving right + --- 0.309305 (0.708303), N = 83 moving right + --- 0.438275 (0.697237), N = 72 moving right + --- 3.92611 (0.53571), N = 8 moving right + + -- best stat: 0.710533, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 3 12 16 17 5 + + + -- linear combo weights (showing up to 5) + + 9.0353 0.1181 0.4934 0.3146 0.8595 + + + -- cutpoint (score) + --- 0.14229 (0.526679), N = 259 moving right + --- 0.378938 (0.566374), N = 239 moving right + --- 1.34468 (0.677227), N = 108 moving right + --- 1.35957 (0.669561), N = 107 moving right + --- 1.69043 (0.683442), N = 72 moving right + + -- best stat: 0.683442, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 3.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8551e-01 1.4532e-02 + 7.1000e+01 9.7826e-01 2.1885e-02 + 7.7000e+01 9.7464e-01 2.5589e-02 + 1.3100e+02 9.6739e-01 3.3024e-02 + + +------------ Growing tree 125 -------------- + +- N obs inbag: 276 +- N row inbag: 171 +- max nodes: 219 +- max leaves: 110 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 7 4 6 11 12 + + + -- linear combo weights (showing up to 5) + + 7.7158 0.3921 0.3228 0.9790 0.0253 + + + -- cutpoint (score) + --- -0.349967 (0.667734), N = 189 moving right + --- -0.302043 (0.686183), N = 181 moving right + --- 0.0963339 (0.736861), N = 133 moving right + --- 0.232678 (0.740633), N = 113 moving right + --- 9.08242 (0.531781), N = 7 moving right + + -- best stat: 0.740633, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 4 9 7 1 8 + + + -- linear combo weights (showing up to 5) + + 0.2963 -0.2921 6.9406 0.5535 1.7071 + + + -- cutpoint (score) + --- -1.80144 (0.512598), N = 271 moving right + --- -0.176275 (0.749378), N = 128 moving right + --- 1.77612 (0.662087), N = 42 moving right + --- 2.273 (0.658825), N = 37 moving right + --- 3.35969 (0.639927), N = 28 moving right + + -- best stat: 0.749378, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 12 16 9 5 8 + + + -- linear combo weights (showing up to 5) + + 0.0799 0.6046 -0.4146 1.0150 1.9719 + + + -- cutpoint (score) + --- -1.47216 (0.557161), N = 245 moving right + --- -1.37586 (0.562543), N = 237 moving right + --- -0.912884 (0.664227), N = 184 moving right + --- -0.39039 (0.718881), N = 137 moving right + --- 2.95562 (0.630142), N = 27 moving right + + -- best stat: 0.718881, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 6.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 3.0000e+00 + 3.2600e+02 1.0000e+00 2.0000e+00 + 4.0000e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.1000e+01 9.8551e-01 1.4559e-02 + 7.7000e+01 9.7826e-01 2.1912e-02 + 1.4000e+02 9.5652e-01 4.4134e-02 + + +------------ Growing tree 126 -------------- + +- N obs inbag: 276 +- N row inbag: 177 +- max nodes: 205 +- max leaves: 103 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 0 11 6 4 16 + + + -- linear combo weights (showing up to 5) + + 0.0680 1.0043 0.7001 0.3741 0.1709 + + + -- cutpoint (score) + --- -0.497467 (0.632531), N = 200 moving right + --- -0.477108 (0.634511), N = 194 moving right + --- -0.168673 (0.692222), N = 152 moving right + --- 0.108753 (0.69596), N = 115 moving right + --- 0.330033 (0.689997), N = 88 moving right + + -- best stat: 0.69596, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 8 11 14 7 5 + + + -- linear combo weights (showing up to 5) + + 2.4145 0.3577 -0.1120 1.5842 0.4261 + + + -- cutpoint (score) + --- -1.8208 (0.515529), N = 264 moving right + --- -1.35687 (0.663055), N = 185 moving right + --- -1.19581 (0.708307), N = 159 moving right + --- -0.731719 (0.74426), N = 105 moving right + --- 2.35546 (0.649284), N = 27 moving right + + -- best stat: 0.74426, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 10 3 2 16 5 + + + -- linear combo weights (showing up to 5) + + -0.4872 3.9703 -1.7476 -0.0204 1.4765 + + + -- cutpoint (score) + --- -1.94509 (0.59778), N = 213 moving right + --- -1.8931 (0.611729), N = 204 moving right + --- -1.4236 (0.7017), N = 128 moving right + --- -0.5506 (0.686593), N = 86 moving right + --- 2.65863 (0.583496), N = 16 moving right + + -- best stat: 0.7017, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + 3.2600e+02 1.0000e+00 2.0000e+00 + 3.8800e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.1000e+01 9.8913e-01 1.0909e-02 + 7.7000e+01 9.8188e-01 1.8235e-02 + 1.1000e+02 9.7464e-01 2.5615e-02 + + +------------ Growing tree 127 -------------- + +- N obs inbag: 276 +- N row inbag: 170 +- max nodes: 223 +- max leaves: 112 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 11 1 5 16 4 + + + -- linear combo weights (showing up to 5) + + 0.6933 0.3006 0.5320 0.5892 0.7209 + + + -- cutpoint (score) + --- -0.959678 (0.556289), N = 245 moving right + --- -0.401968 (0.651175), N = 180 moving right + --- 0.611144 (0.727544), N = 106 moving right + --- 1.02339 (0.716167), N = 75 moving right + --- 2.50941 (0.581492), N = 20 moving right + + -- best stat: 0.727544, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 6 15 13 1 10 + + + -- linear combo weights (showing up to 5) + + 1.9523 0.0127 0.5381 0.4995 -0.6148 + + + -- cutpoint (score) + --- -0.310398 (0.650331), N = 156 moving right + --- -0.150416 (0.648768), N = 138 moving right + --- -0.0465796 (0.665988), N = 119 moving right + --- 0.28454 (0.705633), N = 90 moving right + --- 2.53814 (0.545426), N = 10 moving right + + -- best stat: 0.705633, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 2 12 8 0 11 + + + -- linear combo weights (showing up to 5) + + -0.0046 -0.0174 1.3673 -0.2030 0.5304 + + + -- cutpoint (score) + --- -1.32784 (0.585792), N = 233 moving right + --- -1.28197 (0.600173), N = 226 moving right + --- -1.19784 (0.632041), N = 213 moving right + --- -0.157548 (0.728017), N = 88 moving right + --- 1.90964 (0.591923), N = 24 moving right + + -- best stat: 0.728017, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 3.0000e+00 + 1.9800e+02 1.0000e+00 4.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + 3.3400e+02 1.0000e+00 1.0000e+00 + 3.4800e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 1.4000e+02 9.8913e-01 1.0896e-02 + 1.9100e+02 9.7826e-01 2.1885e-02 + 1.9800e+02 9.6377e-01 3.6700e-02 + 2.1600e+02 9.5652e-01 4.4219e-02 + + +------------ Growing tree 128 -------------- + +- N obs inbag: 276 +- N row inbag: 170 +- max nodes: 233 +- max leaves: 117 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 1 5 13 14 17 + + + -- linear combo weights (showing up to 5) + + 0.5545 1.0979 0.5200 0.3733 0.5607 + + + -- cutpoint (score) + --- 0.641153 (0.584088), N = 237 moving right + --- 0.973349 (0.60754), N = 226 moving right + --- 1.28161 (0.648481), N = 198 moving right + --- 2.49007 (0.739626), N = 94 moving right + --- 2.51498 (0.743883), N = 92 moving right + + -- best stat: 0.743883, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 1 2 14 3 8 + + + -- linear combo weights (showing up to 5) + + 0.4079 -0.2222 -0.3394 6.5509 1.1410 + + + -- cutpoint (score) + --- -0.944443 (0.609439), N = 223 moving right + --- -0.818062 (0.636956), N = 201 moving right + --- -0.582794 (0.682807), N = 163 moving right + --- -0.417559 (0.720775), N = 144 moving right + --- 1.12822 (0.663113), N = 42 moving right + + -- best stat: 0.720775, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 15 5 8 3 14 + + + -- linear combo weights (showing up to 5) + + -0.0597 0.5853 1.0442 6.3966 -0.2621 + + + -- cutpoint (score) + --- -0.755913 (0.525773), N = 260 moving right + --- -0.572172 (0.561306), N = 241 moving right + --- -0.400801 (0.673583), N = 183 moving right + --- 0.747922 (0.723173), N = 68 moving right + --- 1.54615 (0.659929), N = 40 moving right + + -- best stat: 0.723173, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 3.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 4.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 7.7000e+01 9.9638e-01 3.6232e-03 + 1.1000e+02 9.8551e-01 1.4532e-02 + 1.3100e+02 9.7826e-01 2.1885e-02 + 1.4000e+02 9.7464e-01 2.5589e-02 + 1.7900e+02 9.7101e-01 2.9306e-02 + + +------------ Growing tree 129 -------------- + +- N obs inbag: 276 +- N row inbag: 173 +- max nodes: 195 +- max leaves: 98 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 5 13 15 11 9 + + + -- linear combo weights (showing up to 5) + + 0.8645 -0.1336 -0.0987 0.9438 0.6920 + + + -- cutpoint (score) + --- -0.603109 (0.641185), N = 190 moving right + --- -0.396232 (0.694265), N = 153 moving right + --- -0.380851 (0.695673), N = 151 moving right + --- 0.21151 (0.723102), N = 108 moving right + --- 3.3948 (0.512722), N = 6 moving right + + -- best stat: 0.723102, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 13 6 9 14 16 + + + -- linear combo weights (showing up to 5) + + 0.0929 0.1062 0.6769 0.3159 0.4202 + + + -- cutpoint (score) + --- -0.512428 (0.630264), N = 196 moving right + --- 0.269401 (0.673809), N = 67 moving right + --- 0.451301 (0.670876), N = 53 moving right + --- 0.513974 (0.656746), N = 50 moving right + --- 1.14337 (0.587505), N = 27 moving right + + -- best stat: 0.673809, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 1 15 0 6 8 + + + -- linear combo weights (showing up to 5) + + 0.5818 -0.1710 0.2035 -0.5457 1.9260 + + + -- cutpoint (score) + --- -0.958257 (0.624792), N = 193 moving right + --- -0.858603 (0.650443), N = 182 moving right + --- -0.800943 (0.670692), N = 173 moving right + --- -0.625469 (0.715968), N = 144 moving right + --- 3.88246 (0.594085), N = 15 moving right + + -- best stat: 0.715968, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 3.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.1000e+01 9.8913e-01 1.0909e-02 + 1.4000e+02 9.8551e-01 1.4572e-02 + 1.7900e+02 9.8188e-01 1.8249e-02 + + +------------ Growing tree 130 -------------- + +- N obs inbag: 276 +- N row inbag: 172 +- max nodes: 229 +- max leaves: 115 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 7 10 0 1 17 + + + -- linear combo weights (showing up to 5) + + 7.7587 -0.5320 -0.0339 0.4654 0.4405 + + + -- cutpoint (score) + --- -0.14487 (0.516299), N = 264 moving right + --- 0.484195 (0.608982), N = 216 moving right + --- 0.93285 (0.650716), N = 182 moving right + --- 2.68695 (0.614468), N = 39 moving right + --- 3.01745 (0.607108), N = 23 moving right + + -- best stat: 0.650716, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 1 15 7 12 5 + + + -- linear combo weights (showing up to 5) + + 0.5714 -0.0680 7.9029 0.0514 0.8828 + + + -- cutpoint (score) + --- -0.608549 (0.534847), N = 249 moving right + --- -0.556147 (0.539465), N = 247 moving right + --- 0.138575 (0.661431), N = 162 moving right + --- 0.571333 (0.676605), N = 96 moving right + --- 2.04438 (0.607502), N = 20 moving right + + -- best stat: 0.676605, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 7 13 6 14 2 + + + -- linear combo weights (showing up to 5) + + 8.4783 0.3934 1.2210 0.1728 -0.3731 + + + -- cutpoint (score) + --- -0.728513 (0.572161), N = 228 moving right + --- -0.343497 (0.654031), N = 138 moving right + --- -0.332822 (0.655866), N = 137 moving right + --- -0.0311832 (0.676763), N = 83 moving right + --- 0.395933 (0.64525), N = 51 moving right + + -- best stat: 0.676763, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.8551e-01 1.4559e-02 + 1.1000e+02 9.7826e-01 2.1912e-02 + 1.3100e+02 9.7101e-01 2.9319e-02 + + +------------ Growing tree 131 -------------- + +- N obs inbag: 276 +- N row inbag: 176 +- max nodes: 225 +- max leaves: 113 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 6 0 17 11 5 + + + -- linear combo weights (showing up to 5) + + 0.9393 -0.1501 0.3088 1.4752 0.6326 + + + -- cutpoint (score) + --- 0.0252811 (0.644373), N = 198 moving right + --- 0.495991 (0.694301), N = 162 moving right + --- 1.25678 (0.734218), N = 102 moving right + --- 2.97801 (0.643503), N = 35 moving right + --- 3.30909 (0.628933), N = 30 moving right + + -- best stat: 0.734218, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 8 10 2 13 14 + + + -- linear combo weights (showing up to 5) + + 2.0876 -0.5963 -0.9154 0.0483 -0.0819 + + + -- cutpoint (score) + --- -2.11367 (0.650259), N = 202 moving right + --- -2.08748 (0.661223), N = 197 moving right + --- -1.99698 (0.676497), N = 187 moving right + --- 1.05002 (0.669554), N = 39 moving right + --- 3.83948 (0.578155), N = 14 moving right + + -- best stat: 0.676497, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 16 4 8 14 17 + + + -- linear combo weights (showing up to 5) + + 0.3254 -0.0456 2.1194 -0.0275 0.4626 + + + -- cutpoint (score) + --- -0.432767 (0.559648), N = 246 moving right + --- 1.01828 (0.73658), N = 106 moving right + --- 3.1361 (0.671067), N = 37 moving right + --- 4.70904 (0.621617), N = 22 moving right + --- 8.07988 (0.556435), N = 11 moving right + + -- best stat: 0.73658, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 3.0000e+00 + 1.3100e+02 1.0000e+00 4.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + 3.2600e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.8551e-01 1.4532e-02 + 1.3100e+02 9.7101e-01 2.9238e-02 + 1.4000e+02 9.6739e-01 3.2970e-02 + 1.8600e+02 9.6377e-01 3.6715e-02 + + +------------ Growing tree 132 -------------- + +- N obs inbag: 276 +- N row inbag: 164 +- max nodes: 199 +- max leaves: 100 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 9 4 5 1 3 + + + -- linear combo weights (showing up to 5) + + 0.4874 0.2963 0.7984 0.2708 4.9206 + + + -- cutpoint (score) + --- 0.119703 (0.67639), N = 158 moving right + --- 0.325929 (0.735347), N = 125 moving right + --- 0.433739 (0.746045), N = 117 moving right + --- 0.743833 (0.723459), N = 78 moving right + --- 1.88082 (0.611307), N = 26 moving right + + -- best stat: 0.746045, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 1 17 9 0 12 + + + -- linear combo weights (showing up to 5) + + 0.3947 0.6866 0.4687 0.0335 0.0431 + + + -- cutpoint (score) + --- 0.993734 (0.560854), N = 247 moving right + --- 2.34975 (0.723574), N = 105 moving right + --- 2.41112 (0.729586), N = 101 moving right + --- 2.70311 (0.700439), N = 74 moving right + --- 4.3626 (0.50144), N = 6 moving right + + -- best stat: 0.729586, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 12 3 15 9 0 + + + -- linear combo weights (showing up to 5) + + 0.1808 5.2100 -0.3751 0.5322 0.0219 + + + -- cutpoint (score) + --- -0.334436 (0.596745), N = 212 moving right + --- -0.103304 (0.665143), N = 149 moving right + --- 0.0355373 (0.692415), N = 113 moving right + --- 2.58052 (0.601522), N = 23 moving right + --- 5.27407 (0.568169), N = 14 moving right + + -- best stat: 0.692415, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 3.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.1000e+01 9.8551e-01 1.4559e-02 + 7.7000e+01 9.7464e-01 2.5588e-02 + 1.3100e+02 9.7101e-01 2.9306e-02 + + +------------ Growing tree 133 -------------- + +- N obs inbag: 276 +- N row inbag: 177 +- max nodes: 217 +- max leaves: 109 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 8 5 3 14 4 + + + -- linear combo weights (showing up to 5) + + 1.3010 0.7840 10.1433 -0.1512 0.3127 + + + -- cutpoint (score) + --- -0.464924 (0.663674), N = 197 moving right + --- -0.294436 (0.721171), N = 165 moving right + --- -0.270516 (0.724164), N = 159 moving right + --- 0.0180641 (0.747439), N = 135 moving right + --- 1.27474 (0.652609), N = 39 moving right + + -- best stat: 0.747439, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 4 13 0 5 6 + + + -- linear combo weights (showing up to 5) + + 0.4829 0.3994 -0.4043 1.6569 0.6356 + + + -- cutpoint (score) + --- -0.0444966 (0.671105), N = 179 moving right + --- 0.034085 (0.675644), N = 171 moving right + --- 0.821927 (0.653673), N = 99 moving right + --- 1.16442 (0.66022), N = 85 moving right + --- 2.38993 (0.52902), N = 10 moving right + + -- best stat: 0.675644, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 3 6 15 0 11 + + + -- linear combo weights (showing up to 5) + + 11.2432 0.1087 0.0050 -0.3310 0.7110 + + + -- cutpoint (score) + --- -0.889448 (0.556332), N = 250 moving right + --- -0.851871 (0.56304), N = 244 moving right + --- -0.67221 (0.638631), N = 208 moving right + --- -0.369837 (0.682171), N = 144 moving right + --- -0.227953 (0.714705), N = 123 moving right + + -- best stat: 0.714705, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.8551e-01 1.4559e-02 + 1.3100e+02 9.8188e-01 1.8235e-02 + 1.4000e+02 9.7464e-01 2.5615e-02 + + +------------ Growing tree 134 -------------- + +- N obs inbag: 276 +- N row inbag: 171 +- max nodes: 225 +- max leaves: 113 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 4 6 12 2 16 + + + -- linear combo weights (showing up to 5) + + 0.9431 1.5113 0.0612 -0.3811 0.3189 + + + -- cutpoint (score) + --- -0.761252 (0.504088), N = 265 moving right + --- -0.685086 (0.523544), N = 248 moving right + --- -0.470823 (0.57233), N = 216 moving right + --- 0.284933 (0.658979), N = 136 moving right + --- 0.384528 (0.665374), N = 109 moving right + + -- best stat: 0.665374, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 12 9 16 11 8 + + + -- linear combo weights (showing up to 5) + + -0.0161 -0.3376 0.1778 0.8932 1.6264 + + + -- cutpoint (score) + --- -1.60532 (0.544404), N = 245 moving right + --- -1.4642 (0.580548), N = 226 moving right + --- -1.10654 (0.665772), N = 168 moving right + --- -0.822936 (0.698205), N = 134 moving right + --- 3.58406 (0.607552), N = 19 moving right + + -- best stat: 0.698205, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 15 17 14 6 7 + + + -- linear combo weights (showing up to 5) + + -0.0920 0.6054 0.3936 1.6010 6.2963 + + + -- cutpoint (score) + --- 1.05194 (0.585895), N = 234 moving right + --- 1.9429 (0.69049), N = 146 moving right + --- 2.0335 (0.710281), N = 133 moving right + --- 2.19766 (0.714768), N = 105 moving right + --- 8.72933 (0.574741), N = 13 moving right + + -- best stat: 0.714768, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 3.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8551e-01 1.4546e-02 + 7.1000e+01 9.8188e-01 1.8222e-02 + 1.1000e+02 9.7826e-01 2.1912e-02 + 1.3100e+02 9.6739e-01 3.3023e-02 + + +------------ Growing tree 135 -------------- + +- N obs inbag: 276 +- N row inbag: 170 +- max nodes: 245 +- max leaves: 123 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 10 12 6 1 5 + + + -- linear combo weights (showing up to 5) + + -0.7939 0.0765 -0.3670 0.4801 1.2873 + + + -- cutpoint (score) + --- -1.58116 (0.53061), N = 261 moving right + --- 0.309058 (0.713295), N = 139 moving right + --- 0.352048 (0.716343), N = 136 moving right + --- 0.576569 (0.721486), N = 124 moving right + --- 1.79415 (0.642629), N = 44 moving right + + -- best stat: 0.721486, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 2 10 8 1 15 + + + -- linear combo weights (showing up to 5) + + -0.4129 -0.7514 1.2820 0.4344 -0.2113 + + + -- cutpoint (score) + --- -2.37183 (0.530267), N = 262 moving right + --- -1.60473 (0.6268), N = 215 moving right + --- -0.917435 (0.735486), N = 164 moving right + --- 0.227695 (0.763771), N = 88 moving right + --- 4.39632 (0.54901), N = 11 moving right + + -- best stat: 0.763771, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 17 11 3 12 2 + + + -- linear combo weights (showing up to 5) + + 0.3297 0.7167 5.1626 0.1581 0.1191 + + + -- cutpoint (score) + --- 0.624496 (0.6516), N = 202 moving right + --- 1.05314 (0.717867), N = 140 moving right + --- 1.27011 (0.712057), N = 115 moving right + --- 1.44745 (0.712971), N = 82 moving right + --- 2.00614 (0.656876), N = 49 moving right + + -- best stat: 0.717867, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 3.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 3.0000e+00 + 1.8600e+02 1.0000e+00 3.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 4.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.8913e-01 1.0870e-02 + 5.1000e+01 9.8551e-01 1.4533e-02 + 7.1000e+01 9.7826e-01 2.1886e-02 + 1.3100e+02 9.7101e-01 2.9293e-02 + 1.4000e+02 9.6739e-01 3.3024e-02 + + +------------ Growing tree 136 -------------- + +- N obs inbag: 276 +- N row inbag: 177 +- max nodes: 203 +- max leaves: 102 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 1 5 10 8 13 + + + -- linear combo weights (showing up to 5) + + 0.5255 0.9252 -0.6249 1.8622 0.0083 + + + -- cutpoint (score) + --- -1.33418 (0.637985), N = 207 moving right + --- -0.483347 (0.740205), N = 142 moving right + --- -0.461427 (0.746618), N = 137 moving right + --- 0.44208 (0.75522), N = 80 moving right + --- 0.549255 (0.752222), N = 76 moving right + + -- best stat: 0.75522, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 0 1 9 5 14 + + + -- linear combo weights (showing up to 5) + + -0.3191 0.5270 0.3802 1.1671 0.5406 + + + -- cutpoint (score) + --- -0.736772 (0.586438), N = 234 moving right + --- -0.330258 (0.66817), N = 187 moving right + --- -0.188856 (0.687147), N = 170 moving right + --- -0.153012 (0.687081), N = 168 moving right + --- 0.544696 (0.690999), N = 88 moving right + + -- best stat: 0.690999, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 5 9 16 17 14 + + + -- linear combo weights (showing up to 5) + + 0.6063 0.4134 0.2832 0.6277 0.5579 + + + -- cutpoint (score) + --- 0.778863 (0.55969), N = 243 moving right + --- 1.591 (0.671212), N = 187 moving right + --- 2.40737 (0.694523), N = 103 moving right + --- 2.94709 (0.656481), N = 35 moving right + --- 3.93773 (0.554546), N = 11 moving right + + -- best stat: 0.694523, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 4.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + 3.3400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.8551e-01 1.4559e-02 + 1.1000e+02 9.7101e-01 2.9265e-02 + 1.7900e+02 9.6739e-01 3.2996e-02 + + +------------ Growing tree 137 -------------- + +- N obs inbag: 276 +- N row inbag: 163 +- max nodes: 217 +- max leaves: 109 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 3 6 7 13 16 + + + -- linear combo weights (showing up to 5) + + 7.7346 0.5747 10.9807 0.4357 0.2903 + + + -- cutpoint (score) + --- -0.369391 (0.632466), N = 196 moving right + --- 0.0185141 (0.691687), N = 131 moving right + --- 0.182383 (0.688146), N = 97 moving right + --- 0.715103 (0.598631), N = 40 moving right + --- 0.989154 (0.5826), N = 21 moving right + + -- best stat: 0.691687, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 12 11 15 0 17 + + + -- linear combo weights (showing up to 5) + + -0.0943 0.8647 0.0422 -0.1620 0.4166 + + + -- cutpoint (score) + --- 0.114016 (0.529671), N = 260 moving right + --- 1.11463 (0.692166), N = 115 moving right + --- 1.47278 (0.67946), N = 78 moving right + --- 1.92854 (0.623684), N = 33 moving right + --- 2.18361 (0.613036), N = 28 moving right + + -- best stat: 0.692166, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 8 11 13 14 15 + + + -- linear combo weights (showing up to 5) + + 2.0482 0.4137 -0.0500 -0.0952 -0.0717 + + + -- cutpoint (score) + --- -1.49291 (0.55044), N = 251 moving right + --- -0.974642 (0.707671), N = 155 moving right + --- -0.25143 (0.732939), N = 99 moving right + --- 5.20412 (0.55379), N = 9 moving right + --- 5.40408 (0.545344), N = 8 moving right + + -- best stat: 0.732939, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 3.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + 3.8800e+02 1.0000e+00 2.0000e+00 + 4.0000e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.8913e-01 1.0870e-02 + 7.1000e+01 9.8551e-01 1.4533e-02 + 7.7000e+01 9.7826e-01 2.1886e-02 + 1.1000e+02 9.7464e-01 2.5589e-02 + 1.8600e+02 9.7101e-01 2.9307e-02 + + +------------ Growing tree 138 -------------- + +- N obs inbag: 276 +- N row inbag: 167 +- max nodes: 237 +- max leaves: 119 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 8 11 6 17 4 + + + -- linear combo weights (showing up to 5) + + 1.2139 0.5140 0.7346 0.3357 0.1820 + + + -- cutpoint (score) + --- -0.111346 (0.602233), N = 230 moving right + --- 0.00967467 (0.639518), N = 214 moving right + --- 0.320617 (0.677264), N = 181 moving right + --- 0.649296 (0.729944), N = 148 moving right + --- 3.14505 (0.653189), N = 38 moving right + + -- best stat: 0.729944, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 16 14 1 10 4 + + + -- linear combo weights (showing up to 5) + + 0.4049 0.2753 0.1655 -0.7982 0.9370 + + + -- cutpoint (score) + --- 0.247851 (0.714589), N = 159 moving right + --- 0.560469 (0.712064), N = 135 moving right + --- 0.682672 (0.721325), N = 128 moving right + --- 0.856618 (0.718197), N = 105 moving right + --- 3.67223 (0.538648), N = 7 moving right + + -- best stat: 0.721325, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 3 4 5 13 0 + + + -- linear combo weights (showing up to 5) + + 4.3362 0.9139 0.8398 0.3243 0.1125 + + + -- cutpoint (score) + --- 0.0940677 (0.634226), N = 212 moving right + --- 0.821388 (0.659223), N = 142 moving right + --- 0.880684 (0.67127), N = 127 moving right + --- 1.08164 (0.673395), N = 108 moving right + --- 1.84984 (0.626589), N = 36 moving right + + -- best stat: 0.673395, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 3.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.8551e-01 1.4532e-02 + 1.4000e+02 9.7826e-01 2.1885e-02 + 1.7900e+02 9.7101e-01 2.9293e-02 + 1.8600e+02 9.6377e-01 3.6755e-02 + + +------------ Growing tree 139 -------------- + +- N obs inbag: 276 +- N row inbag: 174 +- max nodes: 215 +- max leaves: 108 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 7 4 14 8 5 + + + -- linear combo weights (showing up to 5) + + 5.0031 0.2057 0.1986 1.4628 0.4828 + + + -- cutpoint (score) + --- -0.0776574 (0.737948), N = 105 moving right + --- 0.322558 (0.739607), N = 85 moving right + --- 0.81803 (0.693275), N = 56 moving right + --- 1.90651 (0.636856), N = 29 moving right + --- 1.97425 (0.640306), N = 27 moving right + + -- best stat: 0.739607, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 12 3 16 10 9 + + + -- linear combo weights (showing up to 5) + + 0.1277 1.6670 0.4836 -0.6016 0.2128 + + + -- cutpoint (score) + --- -0.552604 (0.62), N = 203 moving right + --- 0.0988785 (0.710437), N = 112 moving right + --- 0.363898 (0.730721), N = 82 moving right + --- 0.791861 (0.698013), N = 60 moving right + --- 2.62525 (0.577314), N = 17 moving right + + -- best stat: 0.730721, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 16 8 7 2 3 + + + -- linear combo weights (showing up to 5) + + 0.3469 1.5106 4.7602 -0.2721 1.5893 + + + -- cutpoint (score) + --- -1.35698 (0.552118), N = 243 moving right + --- -1.11456 (0.657773), N = 181 moving right + --- -0.60186 (0.752773), N = 118 moving right + --- -0.543854 (0.741921), N = 114 moving right + --- -0.193717 (0.716157), N = 90 moving right + + -- best stat: 0.752773, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 3.0000e+00 + 3.2100e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.8551e-01 1.4559e-02 + 1.1000e+02 9.7826e-01 2.1912e-02 + 1.3100e+02 9.7464e-01 2.5616e-02 + + +------------ Growing tree 140 -------------- + +- N obs inbag: 276 +- N row inbag: 168 +- max nodes: 201 +- max leaves: 101 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 10 7 6 14 17 + + + -- linear combo weights (showing up to 5) + + -0.3917 19.5433 -0.0753 0.4777 0.5028 + + + -- cutpoint (score) + --- 0.266084 (0.540203), N = 249 moving right + --- 1.30664 (0.700875), N = 154 moving right + --- 1.61244 (0.668226), N = 116 moving right + --- 1.76941 (0.694279), N = 93 moving right + --- 3.20459 (0.621568), N = 20 moving right + + -- best stat: 0.700875, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 4 1 5 15 9 + + + -- linear combo weights (showing up to 5) + + 1.0752 0.4303 1.0320 -0.1546 0.6945 + + + -- cutpoint (score) + --- -0.668645 (0.548108), N = 244 moving right + --- -0.477919 (0.570303), N = 226 moving right + --- 0.0604799 (0.675429), N = 173 moving right + --- 0.0616071 (0.675686), N = 170 moving right + --- 1.30764 (0.720099), N = 77 moving right + + -- best stat: 0.720099, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 6 17 16 8 1 + + + -- linear combo weights (showing up to 5) + + -0.3026 0.2700 0.2242 2.7053 0.3106 + + + -- cutpoint (score) + --- -1.27596 (0.546471), N = 250 moving right + --- -0.906398 (0.642476), N = 199 moving right + --- -0.229721 (0.738084), N = 116 moving right + --- -0.182679 (0.742177), N = 113 moving right + --- 0.867806 (0.764091), N = 66 moving right + + -- best stat: 0.764091, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 4.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + 3.3400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.7000e+01 9.8913e-01 1.0909e-02 + 1.3100e+02 9.8188e-01 1.8235e-02 + 1.9800e+02 9.7464e-01 2.5615e-02 + + +------------ Growing tree 141 -------------- + +- N obs inbag: 276 +- N row inbag: 178 +- max nodes: 225 +- max leaves: 113 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 10 0 14 6 12 + + + -- linear combo weights (showing up to 5) + + -0.7395 0.0466 0.1819 0.2913 -0.0873 + + + -- cutpoint (score) + --- -0.857541 (0.523505), N = 254 moving right + --- -0.279457 (0.602478), N = 183 moving right + --- -0.0518763 (0.636665), N = 145 moving right + --- 0.0634659 (0.642099), N = 124 moving right + --- 0.148925 (0.642716), N = 111 moving right + + -- best stat: 0.642716, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 9 14 2 3 8 + + + -- linear combo weights (showing up to 5) + + 0.0057 -0.2037 -0.5901 9.3532 1.9939 + + + -- cutpoint (score) + --- -1.61141 (0.597127), N = 218 moving right + --- -1.5972 (0.616268), N = 207 moving right + --- -1.17145 (0.745688), N = 128 moving right + --- -0.980231 (0.756864), N = 110 moving right + --- -0.676038 (0.746758), N = 90 moving right + + -- best stat: 0.756864, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 5 9 12 4 15 + + + -- linear combo weights (showing up to 5) + + 0.6945 0.5757 -0.0343 0.6834 -0.2467 + + + -- cutpoint (score) + --- -0.59564 (0.518833), N = 265 moving right + --- -0.311246 (0.550879), N = 238 moving right + --- 0.632429 (0.682522), N = 108 moving right + --- 1.58312 (0.56471), N = 18 moving right + --- 1.99443 (0.540897), N = 11 moving right + + -- best stat: 0.682522, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 3.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 3.0400e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.9275e-01 7.2596e-03 + 7.7000e+01 9.8188e-01 1.8208e-02 + 1.3100e+02 9.7826e-01 2.1898e-02 + 1.4000e+02 9.7101e-01 2.9306e-02 + + +------------ Growing tree 142 -------------- + +- N obs inbag: 276 +- N row inbag: 169 +- max nodes: 225 +- max leaves: 113 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 9 15 17 6 1 + + + -- linear combo weights (showing up to 5) + + 0.4800 -0.2321 0.5254 0.3919 0.4758 + + + -- cutpoint (score) + --- 1.02199 (0.607991), N = 204 moving right + --- 1.13781 (0.6269), N = 190 moving right + --- 2.37596 (0.706508), N = 77 moving right + --- 2.82028 (0.620991), N = 35 moving right + --- 3.36378 (0.502404), N = 7 moving right + + -- best stat: 0.706508, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 6 9 8 0 17 + + + -- linear combo weights (showing up to 5) + + -0.5711 -0.1820 1.2776 -0.4275 0.5174 + + + -- cutpoint (score) + --- 0.404974 (0.623375), N = 220 moving right + --- 0.850013 (0.674009), N = 177 moving right + --- 0.881518 (0.673051), N = 175 moving right + --- 1.13754 (0.717287), N = 133 moving right + --- 2.84323 (0.652247), N = 45 moving right + + -- best stat: 0.717287, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 10 3 6 1 4 + + + -- linear combo weights (showing up to 5) + + -0.5718 3.9694 -0.2576 0.3481 0.6058 + + + -- cutpoint (score) + --- -0.0803273 (0.639594), N = 192 moving right + --- 0.387336 (0.695831), N = 133 moving right + --- 0.490166 (0.698969), N = 116 moving right + --- 0.575164 (0.709524), N = 104 moving right + --- 0.901366 (0.697767), N = 86 moving right + + -- best stat: 0.709524, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 3.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 3.0000e+00 + 1.8600e+02 1.0000e+00 3.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.8913e-01 1.0870e-02 + 5.1000e+01 9.8551e-01 1.4533e-02 + 7.1000e+01 9.8188e-01 1.8209e-02 + 1.1000e+02 9.7826e-01 2.1899e-02 + 1.4000e+02 9.7101e-01 2.9306e-02 + + +------------ Growing tree 143 -------------- + +- N obs inbag: 276 +- N row inbag: 178 +- max nodes: 227 +- max leaves: 114 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 9 6 4 5 8 + + + -- linear combo weights (showing up to 5) + + -0.3681 -0.0885 0.6280 0.0725 2.1959 + + + -- cutpoint (score) + --- -0.906385 (0.647498), N = 198 moving right + --- -0.58341 (0.687014), N = 167 moving right + --- -0.515795 (0.698632), N = 160 moving right + --- -0.0918144 (0.738771), N = 111 moving right + --- 0.478103 (0.711319), N = 74 moving right + + -- best stat: 0.738771, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 7 13 0 3 16 + + + -- linear combo weights (showing up to 5) + + 3.0829 0.6716 0.1894 8.4282 0.5676 + + + -- cutpoint (score) + --- -0.117142 (0.719945), N = 131 moving right + --- 0.0324215 (0.720333), N = 120 moving right + --- 0.412878 (0.708521), N = 77 moving right + --- 0.42647 (0.706248), N = 72 moving right + --- 9.40652 (0.59714), N = 16 moving right + + -- best stat: 0.720333, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 2 13 1 12 14 + + + -- linear combo weights (showing up to 5) + + -0.8015 0.8502 0.4620 0.2093 0.2385 + + + -- cutpoint (score) + --- -1.70736 (0.586202), N = 230 moving right + --- -1.57276 (0.61039), N = 215 moving right + --- -1.45791 (0.656979), N = 191 moving right + --- 0.0678499 (0.659912), N = 50 moving right + --- 0.533881 (0.599685), N = 28 moving right + + -- best stat: 0.659912, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 3.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 3.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.7000e+01 9.8913e-01 1.0909e-02 + 1.1000e+02 9.7826e-01 2.1898e-02 + 1.3100e+02 9.7464e-01 2.5602e-02 + + +------------ Growing tree 144 -------------- + +- N obs inbag: 276 +- N row inbag: 187 +- max nodes: 227 +- max leaves: 114 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 6 15 0 17 9 + + + -- linear combo weights (showing up to 5) + + 1.4521 -0.0816 -0.2393 0.6549 0.3671 + + + -- cutpoint (score) + --- 1.42497 (0.623442), N = 209 moving right + --- 1.51723 (0.636152), N = 200 moving right + --- 1.73715 (0.709295), N = 161 moving right + --- 1.86629 (0.700933), N = 146 moving right + --- 1.91326 (0.703266), N = 143 moving right + + -- best stat: 0.709295, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 12 7 11 5 15 + + + -- linear combo weights (showing up to 5) + + 0.0727 3.5228 0.7564 1.0080 -0.0406 + + + -- cutpoint (score) + --- -0.614488 (0.582064), N = 231 moving right + --- -0.512352 (0.610806), N = 213 moving right + --- -0.0583296 (0.701418), N = 129 moving right + --- 0.150913 (0.722658), N = 116 moving right + --- 2.50149 (0.574935), N = 19 moving right + + -- best stat: 0.722658, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 0 3 11 8 17 + + + -- linear combo weights (showing up to 5) + + -0.1944 5.9721 0.2801 1.0324 0.4351 + + + -- cutpoint (score) + --- 0.299987 (0.629414), N = 214 moving right + --- 0.966093 (0.725644), N = 124 moving right + --- 1.40193 (0.748619), N = 82 moving right + --- 1.58439 (0.715118), N = 70 moving right + --- 7.07326 (0.559817), N = 11 moving right + + -- best stat: 0.748619, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 3.0000e+00 + 1.9100e+02 1.0000e+00 5.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.8551e-01 1.4559e-02 + 1.1000e+02 9.8188e-01 1.8235e-02 + 1.8600e+02 9.7101e-01 2.9306e-02 + + +------------ Growing tree 145 -------------- + +- N obs inbag: 276 +- N row inbag: 181 +- max nodes: 235 +- max leaves: 118 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 12 8 5 2 13 + + + -- linear combo weights (showing up to 5) + + 0.0410 1.8952 1.0200 -0.1221 -0.0517 + + + -- cutpoint (score) + --- -1.04168 (0.662175), N = 189 moving right + --- -0.627642 (0.714696), N = 142 moving right + --- -0.0494973 (0.728814), N = 101 moving right + --- 1.06094 (0.655806), N = 50 moving right + --- 1.6223 (0.624811), N = 36 moving right + + -- best stat: 0.728814, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 6 3 12 17 4 + + + -- linear combo weights (showing up to 5) + + 0.3715 5.7432 -0.0037 0.4236 0.3929 + + + -- cutpoint (score) + --- 0.844574 (0.553315), N = 254 moving right + --- 1.24011 (0.597955), N = 218 moving right + --- 1.66264 (0.677011), N = 137 moving right + --- 1.66307 (0.649871), N = 129 moving right + --- 1.66393 (0.650117), N = 124 moving right + + -- best stat: 0.677011, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 14 9 15 12 6 + + + -- linear combo weights (showing up to 5) + + 0.2910 0.3525 -0.1681 0.0005 0.9795 + + + -- cutpoint (score) + --- -0.378902 (0.584744), N = 225 moving right + --- -0.101739 (0.61419), N = 154 moving right + --- 0.191226 (0.628156), N = 90 moving right + --- 0.318768 (0.584366), N = 73 moving right + --- 0.411162 (0.576637), N = 64 moving right + + -- best stat: 0.628156, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.7000e+01 9.9275e-01 7.2596e-03 + 1.4000e+02 9.8551e-01 1.4559e-02 + 1.7900e+02 9.8188e-01 1.8235e-02 + 1.8600e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 146 -------------- + +- N obs inbag: 276 +- N row inbag: 179 +- max nodes: 205 +- max leaves: 103 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 5 4 8 6 13 + + + -- linear combo weights (showing up to 5) + + -0.0755 0.3519 2.5371 -0.1876 -0.1726 + + + -- cutpoint (score) + --- -1.55746 (0.518555), N = 267 moving right + --- -1.00861 (0.649366), N = 169 moving right + --- -0.839859 (0.684809), N = 137 moving right + --- -0.713755 (0.699802), N = 122 moving right + --- -0.319845 (0.693804), N = 84 moving right + + -- best stat: 0.699802, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 11 6 16 8 12 + + + -- linear combo weights (showing up to 5) + + 0.2947 -0.4714 0.5605 2.1373 -0.1295 + + + -- cutpoint (score) + --- -1.36017 (0.650742), N = 174 moving right + --- -0.820271 (0.732448), N = 124 moving right + --- -0.0537307 (0.687424), N = 78 moving right + --- -0.00486889 (0.689002), N = 75 moving right + --- 5.23237 (0.543085), N = 5 moving right + + -- best stat: 0.732448, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 17 4 5 8 13 + + + -- linear combo weights (showing up to 5) + + 0.6224 -0.0502 -0.2272 2.5420 -0.1170 + + + -- cutpoint (score) + --- 0.21057 (0.573522), N = 234 moving right + --- 0.456133 (0.642783), N = 198 moving right + --- 0.660516 (0.66835), N = 171 moving right + --- 0.799586 (0.663593), N = 160 moving right + --- 1.1108 (0.689949), N = 121 moving right + + -- best stat: 0.689949, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + 3.3400e+02 1.0000e+00 1.0000e+00 + 3.8800e+02 1.0000e+00 1.0000e+00 + 4.6000e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 1.8600e+02 9.8913e-01 1.0909e-02 + 1.9100e+02 9.8551e-01 1.4572e-02 + 2.1600e+02 9.8188e-01 1.8249e-02 + + +------------ Growing tree 147 -------------- + +- N obs inbag: 276 +- N row inbag: 175 +- max nodes: 233 +- max leaves: 117 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 17 0 5 9 15 + + + -- linear combo weights (showing up to 5) + + 0.5265 -0.2357 0.9525 0.3918 -0.1891 + + + -- cutpoint (score) + --- 0.697019 (0.555762), N = 243 moving right + --- 1.33542 (0.651015), N = 170 moving right + --- 1.83794 (0.656149), N = 105 moving right + --- 2.47317 (0.627044), N = 52 moving right + --- 3.0716 (0.525334), N = 15 moving right + + -- best stat: 0.656149, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 17 11 13 7 10 + + + -- linear combo weights (showing up to 5) + + 0.4086 0.9231 0.1524 13.1160 -0.4663 + + + -- cutpoint (score) + --- 1.62273 (0.72747), N = 79 moving right + --- 1.65966 (0.729998), N = 77 moving right + --- 1.89659 (0.746663), N = 67 moving right + --- 3.25037 (0.624635), N = 24 moving right + --- 3.27144 (0.61334), N = 22 moving right + + -- best stat: 0.746663, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 13 5 12 0 14 + + + -- linear combo weights (showing up to 5) + + 0.2790 1.2396 0.0194 -0.0190 0.4344 + + + -- cutpoint (score) + --- -0.578872 (0.535661), N = 257 moving right + --- 0.289621 (0.637667), N = 117 moving right + --- 0.745603 (0.639622), N = 67 moving right + --- 1.0649 (0.577699), N = 38 moving right + --- 1.50646 (0.550608), N = 17 moving right + + -- best stat: 0.639622, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 3.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.7000e+01 9.9275e-01 7.2596e-03 + 1.3100e+02 9.8551e-01 1.4559e-02 + 1.4000e+02 9.8188e-01 1.8235e-02 + 1.7900e+02 9.7101e-01 2.9305e-02 + + +------------ Growing tree 148 -------------- + +- N obs inbag: 276 +- N row inbag: 183 +- max nodes: 217 +- max leaves: 109 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 0 14 12 10 9 + + + -- linear combo weights (showing up to 5) + + 0.0715 0.3673 0.1449 -0.7437 0.3429 + + + -- cutpoint (score) + --- -1.02653 (0.566351), N = 242 moving right + --- -0.583124 (0.592065), N = 202 moving right + --- -0.121444 (0.649503), N = 136 moving right + --- 0.130023 (0.676873), N = 109 moving right + --- 0.422003 (0.665427), N = 83 moving right + + -- best stat: 0.676873, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 13 12 4 6 0 + + + -- linear combo weights (showing up to 5) + + 0.3844 0.1530 0.8377 1.1958 0.1023 + + + -- cutpoint (score) + --- 0.737544 (0.697518), N = 115 moving right + --- 0.780961 (0.706042), N = 105 moving right + --- 0.954879 (0.663219), N = 83 moving right + --- 0.989308 (0.660643), N = 79 moving right + --- 1.22778 (0.621193), N = 59 moving right + + -- best stat: 0.706042, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 16 12 5 13 3 + + + -- linear combo weights (showing up to 5) + + 0.5019 0.2287 0.6016 0.4662 7.2500 + + + -- cutpoint (score) + --- -0.320777 (0.659417), N = 195 moving right + --- -0.185228 (0.665978), N = 184 moving right + --- 0.147219 (0.70686), N = 138 moving right + --- 0.482256 (0.703344), N = 93 moving right + --- 7.91558 (0.550856), N = 10 moving right + + -- best stat: 0.70686, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 3.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.1000e+01 9.8188e-01 1.8208e-02 + 1.1000e+02 9.7464e-01 2.5589e-02 + 1.3100e+02 9.7101e-01 2.9306e-02 + + +------------ Growing tree 149 -------------- + +- N obs inbag: 276 +- N row inbag: 174 +- max nodes: 195 +- max leaves: 98 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 8 13 4 1 12 + + + -- linear combo weights (showing up to 5) + + 1.9223 0.0256 0.8454 0.3060 0.1427 + + + -- cutpoint (score) + --- -1.19607 (0.569068), N = 235 moving right + --- -1.03797 (0.615297), N = 211 moving right + --- -0.15197 (0.77329), N = 130 moving right + --- 0.44175 (0.769384), N = 81 moving right + --- 6.44615 (0.548028), N = 7 moving right + + -- best stat: 0.77329, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 1 15 7 8 10 + + + -- linear combo weights (showing up to 5) + + 0.2864 0.0443 4.7548 1.8239 -0.4351 + + + -- cutpoint (score) + --- -1.58105 (0.54206), N = 242 moving right + --- -0.391308 (0.790337), N = 101 moving right + --- -0.0251598 (0.787902), N = 85 moving right + --- 2.71718 (0.644851), N = 26 moving right + --- 4.88769 (0.597942), N = 17 moving right + + -- best stat: 0.790337, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 2 5 15 14 3 + + + -- linear combo weights (showing up to 5) + + 0.0036 0.9394 -0.0118 0.2454 6.2307 + + + -- cutpoint (score) + --- 0.0870157 (0.635372), N = 126 moving right + --- 0.111743 (0.64292), N = 121 moving right + --- 0.112112 (0.639585), N = 120 moving right + --- 0.809143 (0.654812), N = 55 moving right + --- 7.30013 (0.538154), N = 6 moving right + + -- best stat: 0.654812, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.9275e-01 7.2596e-03 + 1.7900e+02 9.8551e-01 1.4559e-02 + 1.9100e+02 9.8188e-01 1.8235e-02 + 1.9800e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 150 -------------- + +- N obs inbag: 276 +- N row inbag: 175 +- max nodes: 203 +- max leaves: 102 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 15 2 3 8 0 + + + -- linear combo weights (showing up to 5) + + 0.0562 0.2795 3.4875 1.9604 -0.1332 + + + -- cutpoint (score) + --- -1.07909 (0.524739), N = 262 moving right + --- -0.849132 (0.631152), N = 206 moving right + --- -0.827928 (0.654359), N = 194 moving right + --- -0.641431 (0.739709), N = 130 moving right + --- -0.29247 (0.759329), N = 103 moving right + + -- best stat: 0.759329, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 5 13 10 4 8 + + + -- linear combo weights (showing up to 5) + + 0.2788 0.0871 -0.5959 -0.2390 1.9586 + + + -- cutpoint (score) + --- -1.88594 (0.537425), N = 257 moving right + --- -1.41133 (0.603351), N = 220 moving right + --- -1.1611 (0.680038), N = 177 moving right + --- -0.85409 (0.733868), N = 145 moving right + --- 3.05964 (0.647535), N = 28 moving right + + -- best stat: 0.733868, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 15 17 14 3 12 + + + -- linear combo weights (showing up to 5) + + -0.0734 0.3572 0.6965 4.1544 0.0909 + + + -- cutpoint (score) + --- -0.0679774 (0.519402), N = 263 moving right + --- 1.25137 (0.688875), N = 104 moving right + --- 1.26792 (0.694847), N = 100 moving right + --- 1.47094 (0.684041), N = 89 moving right + --- 2.14589 (0.650182), N = 42 moving right + + -- best stat: 0.694847, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 3.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 3.4800e+02 1.0000e+00 3.0000e+00 + 3.8800e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.8551e-01 1.4559e-02 + 1.3100e+02 9.8188e-01 1.8235e-02 + 1.4000e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 151 -------------- + +- N obs inbag: 276 +- N row inbag: 164 +- max nodes: 215 +- max leaves: 108 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 7 3 17 4 13 + + + -- linear combo weights (showing up to 5) + + 10.0060 6.2686 0.1343 0.6447 0.4117 + + + -- cutpoint (score) + --- -0.171353 (0.544371), N = 254 moving right + --- 0.731627 (0.689492), N = 149 moving right + --- 0.979293 (0.718318), N = 106 moving right + --- 1.11431 (0.74018), N = 81 moving right + --- 1.87875 (0.654513), N = 28 moving right + + -- best stat: 0.74018, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 16 8 13 3 9 + + + -- linear combo weights (showing up to 5) + + 0.1999 1.4788 0.1147 8.5068 0.1578 + + + -- cutpoint (score) + --- -1.16214 (0.529357), N = 256 moving right + --- -1.03163 (0.607667), N = 213 moving right + --- 0.210551 (0.756975), N = 68 moving right + --- 10.0572 (0.57396), N = 12 moving right + --- 12.3399 (0.547633), N = 8 moving right + + -- best stat: 0.756975, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 15 12 11 3 17 + + + -- linear combo weights (showing up to 5) + + 0.1220 0.0882 0.8543 10.4809 0.2448 + + + -- cutpoint (score) + --- 0.127472 (0.614144), N = 216 moving right + --- 0.234459 (0.680077), N = 183 moving right + --- 0.406734 (0.71575), N = 158 moving right + --- 0.429241 (0.715634), N = 155 moving right + --- 11.9331 (0.552283), N = 9 moving right + + -- best stat: 0.71575, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 3.0000e+00 + 7.7000e+01 1.0000e+00 4.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 3.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.8913e-01 1.0870e-02 + 7.7000e+01 9.7464e-01 2.5522e-02 + 1.1000e+02 9.7101e-01 2.9239e-02 + 1.3100e+02 9.6014e-01 4.0433e-02 + 1.7900e+02 9.5652e-01 4.4207e-02 + + +------------ Growing tree 152 -------------- + +- N obs inbag: 276 +- N row inbag: 183 +- max nodes: 223 +- max leaves: 112 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 4 0 6 3 7 + + + -- linear combo weights (showing up to 5) + + 0.5597 -0.1013 0.4934 5.7732 7.3448 + + + -- cutpoint (score) + --- -0.101311 (0.573856), N = 221 moving right + --- 0.493369 (0.617868), N = 81 moving right + --- 0.951789 (0.6028), N = 25 moving right + --- 1.0531 (0.601442), N = 19 moving right + --- 6.82626 (0.590324), N = 15 moving right + + -- best stat: 0.617868, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 10 3 16 5 1 + + + -- linear combo weights (showing up to 5) + + -0.5359 5.6354 0.1942 0.6811 0.3039 + + + -- cutpoint (score) + --- -0.953076 (0.513939), N = 257 moving right + --- -0.178505 (0.658913), N = 172 moving right + --- 0.218628 (0.700104), N = 135 moving right + --- 0.695893 (0.678077), N = 77 moving right + --- 1.28434 (0.64046), N = 32 moving right + + -- best stat: 0.700104, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 14 9 10 16 6 + + + -- linear combo weights (showing up to 5) + + 0.1619 0.4334 -0.7316 0.4388 -0.0737 + + + -- cutpoint (score) + --- -1.46428 (0.511515), N = 259 moving right + --- -0.29006 (0.663532), N = 144 moving right + --- -0.106163 (0.685873), N = 125 moving right + --- 0.0609629 (0.694608), N = 110 moving right + --- 1.41798 (0.580606), N = 25 moving right + + -- best stat: 0.694608, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 3.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + 3.4800e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 1.1000e+02 9.9638e-01 3.6232e-03 + 1.4000e+02 9.8551e-01 1.4532e-02 + 1.7900e+02 9.7826e-01 2.1885e-02 + 1.9100e+02 9.7464e-01 2.5589e-02 + 1.9800e+02 9.6739e-01 3.3024e-02 + + +------------ Growing tree 153 -------------- + +- N obs inbag: 276 +- N row inbag: 172 +- max nodes: 193 +- max leaves: 97 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 15 7 9 0 8 + + + -- linear combo weights (showing up to 5) + + -0.1199 3.2297 -0.0111 -0.0798 1.7060 + + + -- cutpoint (score) + --- -1.13295 (0.552162), N = 251 moving right + --- -1.02741 (0.602228), N = 221 moving right + --- -0.9054 (0.66072), N = 177 moving right + --- -0.751774 (0.715713), N = 145 moving right + --- 1.12998 (0.676028), N = 39 moving right + + -- best stat: 0.715713, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 10 0 2 15 3 + + + -- linear combo weights (showing up to 5) + + -0.8897 0.2044 -0.0592 -0.0143 9.4654 + + + -- cutpoint (score) + --- -0.463539 (0.594379), N = 213 moving right + --- -0.445735 (0.595599), N = 202 moving right + --- -0.370893 (0.612173), N = 191 moving right + --- -0.342405 (0.605681), N = 187 moving right + --- 0.844952 (0.68298), N = 50 moving right + + -- best stat: 0.68298, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 1 16 11 0 9 + + + -- linear combo weights (showing up to 5) + + 0.5998 0.5917 1.0988 0.0545 0.5009 + + + -- cutpoint (score) + --- -0.985781 (0.660835), N = 188 moving right + --- -0.679996 (0.724161), N = 142 moving right + --- -0.298871 (0.75404), N = 110 moving right + --- -0.0556345 (0.744211), N = 94 moving right + --- 1.82283 (0.615533), N = 34 moving right + + -- best stat: 0.75404, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.1000e+01 9.8551e-01 1.4559e-02 + 7.7000e+01 9.8188e-01 1.8235e-02 + 1.1000e+02 9.7826e-01 2.1926e-02 + + +------------ Growing tree 154 -------------- + +- N obs inbag: 276 +- N row inbag: 175 +- max nodes: 213 +- max leaves: 107 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 5 2 3 1 11 + + + -- linear combo weights (showing up to 5) + + 0.5982 -0.2173 5.1566 0.2995 0.4412 + + + -- cutpoint (score) + --- -0.404414 (0.645512), N = 188 moving right + --- -0.38667 (0.631889), N = 181 moving right + --- -0.0731176 (0.717812), N = 117 moving right + --- 0.313006 (0.691679), N = 66 moving right + --- 1.73405 (0.589462), N = 17 moving right + + -- best stat: 0.717812, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 15 8 4 9 12 + + + -- linear combo weights (showing up to 5) + + 0.0442 2.7420 0.5484 -0.1552 -0.0567 + + + -- cutpoint (score) + --- -1.36624 (0.635785), N = 204 moving right + --- -1.18568 (0.645423), N = 189 moving right + --- -1.13953 (0.660248), N = 181 moving right + --- -0.786258 (0.724156), N = 131 moving right + --- 1.62991 (0.658868), N = 41 moving right + + -- best stat: 0.724156, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 9 11 17 6 2 + + + -- linear combo weights (showing up to 5) + + 0.6921 0.4058 0.4910 1.8425 -0.5681 + + + -- cutpoint (score) + --- 0.481625 (0.670666), N = 182 moving right + --- 0.908589 (0.697868), N = 134 moving right + --- 1.85684 (0.631711), N = 51 moving right + --- 1.92937 (0.626124), N = 48 moving right + --- 3.28104 (0.541426), N = 6 moving right + + -- best stat: 0.697868, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + 3.4800e+02 1.0000e+00 1.0000e+00 + 3.8800e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 7.7000e+01 9.9275e-01 7.2464e-03 + 1.7900e+02 9.8551e-01 1.4546e-02 + 1.9100e+02 9.8188e-01 1.8222e-02 + 1.9800e+02 9.7826e-01 2.1912e-02 + 2.1600e+02 9.7101e-01 2.9320e-02 + + +------------ Growing tree 155 -------------- + +- N obs inbag: 276 +- N row inbag: 165 +- max nodes: 229 +- max leaves: 115 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 14 3 2 17 9 + + + -- linear combo weights (showing up to 5) + + -0.0859 9.3859 -0.9108 0.5288 0.6810 + + + -- cutpoint (score) + --- 0.278653 (0.630916), N = 208 moving right + --- 0.384411 (0.642499), N = 187 moving right + --- 0.436856 (0.660349), N = 179 moving right + --- 0.705048 (0.679885), N = 152 moving right + --- 1.67613 (0.639301), N = 50 moving right + + -- best stat: 0.679885, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 8 9 17 13 11 + + + -- linear combo weights (showing up to 5) + + 1.1890 0.0470 0.3411 0.1184 1.0142 + + + -- cutpoint (score) + --- -0.182439 (0.649112), N = 194 moving right + --- -0.120182 (0.667329), N = 187 moving right + --- 0.0979065 (0.699313), N = 165 moving right + --- 0.155596 (0.693327), N = 160 moving right + --- 0.270547 (0.701733), N = 157 moving right + + -- best stat: 0.701733, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 7 12 15 8 4 + + + -- linear combo weights (showing up to 5) + + 4.8709 0.0562 0.0133 1.6266 0.3908 + + + -- cutpoint (score) + --- -0.924551 (0.578856), N = 233 moving right + --- -0.37689 (0.70947), N = 133 moving right + --- -0.33393 (0.712128), N = 119 moving right + --- 0.759573 (0.663915), N = 60 moving right + --- 0.879651 (0.647966), N = 55 moving right + + -- best stat: 0.712128, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 3.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.3400e+02 1.0000e+00 1.0000e+00 + 3.4800e+02 1.0000e+00 1.0000e+00 + 4.6000e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 1.3100e+02 9.9638e-01 3.6232e-03 + 1.7900e+02 9.9275e-01 7.2596e-03 + 1.8600e+02 9.8913e-01 1.0909e-02 + 1.9100e+02 9.8188e-01 1.8235e-02 + 1.9800e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 156 -------------- + +- N obs inbag: 276 +- N row inbag: 175 +- max nodes: 221 +- max leaves: 111 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 17 11 16 4 15 + + + -- linear combo weights (showing up to 5) + + 0.3690 0.7515 0.5887 0.2209 -0.0350 + + + -- cutpoint (score) + --- 0.313482 (0.626261), N = 211 moving right + --- 1.57053 (0.749733), N = 99 moving right + --- 1.86388 (0.732118), N = 78 moving right + --- 2.8139 (0.653946), N = 39 moving right + --- 3.37119 (0.540153), N = 15 moving right + + -- best stat: 0.749733, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 15 7 0 9 2 + + + -- linear combo weights (showing up to 5) + + -0.1192 12.1708 0.0633 0.3066 -0.8240 + + + -- cutpoint (score) + --- -1.10065 (0.522188), N = 267 moving right + --- -1.02128 (0.533529), N = 254 moving right + --- -1.01526 (0.542039), N = 248 moving right + --- -0.839921 (0.653535), N = 157 moving right + --- -0.729476 (0.680256), N = 102 moving right + + -- best stat: 0.680256, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 16 7 3 17 11 + + + -- linear combo weights (showing up to 5) + + 0.3564 10.9540 0.5343 0.4103 0.6845 + + + -- cutpoint (score) + --- 1.07656 (0.721906), N = 140 moving right + --- 1.08659 (0.72855), N = 137 moving right + --- 2.39816 (0.670187), N = 50 moving right + --- 2.39856 (0.672873), N = 49 moving right + --- 2.8952 (0.627615), N = 31 moving right + + -- best stat: 0.72855, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.9275e-01 7.2596e-03 + 7.7000e+01 9.8913e-01 1.0909e-02 + 1.1000e+02 9.8551e-01 1.4572e-02 + 1.3100e+02 9.8188e-01 1.8249e-02 + + +------------ Growing tree 157 -------------- + +- N obs inbag: 276 +- N row inbag: 181 +- max nodes: 207 +- max leaves: 104 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 12 10 5 15 16 + + + -- linear combo weights (showing up to 5) + + 0.1340 -0.7372 0.8458 -0.2084 0.9163 + + + -- cutpoint (score) + --- -0.0401216 (0.670408), N = 146 moving right + --- 0.289831 (0.699729), N = 122 moving right + --- 0.365673 (0.69369), N = 118 moving right + --- 0.711327 (0.729509), N = 91 moving right + --- 3.82527 (0.546956), N = 8 moving right + + -- best stat: 0.729509, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 13 16 14 2 9 + + + -- linear combo weights (showing up to 5) + + 0.2408 1.0519 0.2896 -0.3875 0.3663 + + + -- cutpoint (score) + --- -0.918542 (0.640541), N = 175 moving right + --- -0.483546 (0.684915), N = 138 moving right + --- -0.209344 (0.713514), N = 113 moving right + --- 0.189465 (0.703952), N = 74 moving right + --- 2.63161 (0.544156), N = 8 moving right + + -- best stat: 0.713514, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 5 0 6 17 4 + + + -- linear combo weights (showing up to 5) + + 1.0554 -0.7640 0.3114 0.5262 0.3040 + + + -- cutpoint (score) + --- 1.11846 (0.642948), N = 185 moving right + --- 1.36372 (0.658593), N = 168 moving right + --- 2.10469 (0.677498), N = 95 moving right + --- 2.17383 (0.680649), N = 81 moving right + --- 2.94526 (0.562361), N = 25 moving right + + -- best stat: 0.680649, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 4.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 3.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + 3.4800e+02 1.0000e+00 1.0000e+00 + 3.8800e+02 1.0000e+00 1.0000e+00 + 4.0000e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 1.1000e+02 9.9638e-01 3.6232e-03 + 1.4000e+02 9.8188e-01 1.8169e-02 + 1.9100e+02 9.7464e-01 2.5549e-02 + 2.1600e+02 9.7101e-01 2.9266e-02 + 2.2300e+02 9.6739e-01 3.2998e-02 + + +------------ Growing tree 158 -------------- + +- N obs inbag: 276 +- N row inbag: 174 +- max nodes: 233 +- max leaves: 117 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 12 17 1 7 2 + + + -- linear combo weights (showing up to 5) + + 0.0242 0.4384 0.3842 7.6914 -0.3306 + + + -- cutpoint (score) + --- 0.431598 (0.579975), N = 237 moving right + --- 0.747998 (0.63549), N = 193 moving right + --- 1.19529 (0.697556), N = 110 moving right + --- 1.42219 (0.689998), N = 80 moving right + --- 1.89188 (0.62138), N = 35 moving right + + -- best stat: 0.697556, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 4 1 0 7 16 + + + -- linear combo weights (showing up to 5) + + 0.8091 0.3664 -0.2062 6.9072 0.7107 + + + -- cutpoint (score) + --- -0.381902 (0.614253), N = 206 moving right + --- -0.337637 (0.626515), N = 199 moving right + --- 0.866544 (0.708256), N = 78 moving right + --- 0.908328 (0.706428), N = 72 moving right + --- 0.968961 (0.716964), N = 68 moving right + + -- best stat: 0.716964, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 6 3 14 17 0 + + + -- linear combo weights (showing up to 5) + + 0.7103 8.9329 0.1257 0.4600 -0.0767 + + + -- cutpoint (score) + --- 0.829845 (0.586219), N = 237 moving right + --- 1.2051 (0.634134), N = 201 moving right + --- 1.32259 (0.670672), N = 171 moving right + --- 1.34378 (0.669234), N = 164 moving right + --- 1.36657 (0.666379), N = 157 moving right + + -- best stat: 0.670672, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.1000e+01 9.8913e-01 1.0909e-02 + 7.7000e+01 9.8188e-01 1.8235e-02 + 1.1000e+02 9.7464e-01 2.5615e-02 + + +------------ Growing tree 159 -------------- + +- N obs inbag: 276 +- N row inbag: 170 +- max nodes: 203 +- max leaves: 102 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 7 8 17 3 11 + + + -- linear combo weights (showing up to 5) + + 8.4819 1.4062 0.2539 3.7387 0.3480 + + + -- cutpoint (score) + --- 0.0987888 (0.717432), N = 154 moving right + --- 0.134876 (0.728954), N = 146 moving right + --- 1.56132 (0.715774), N = 58 moving right + --- 3.33989 (0.651169), N = 27 moving right + --- 5.50197 (0.614753), N = 19 moving right + + -- best stat: 0.728954, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 11 8 6 12 5 + + + -- linear combo weights (showing up to 5) + + 0.6254 1.7907 0.6384 -0.1318 0.4048 + + + -- cutpoint (score) + --- -1.09386 (0.654039), N = 187 moving right + --- -0.891304 (0.704677), N = 153 moving right + --- -0.809673 (0.7179), N = 142 moving right + --- -0.401919 (0.764711), N = 114 moving right + --- 2.89874 (0.597173), N = 20 moving right + + -- best stat: 0.764711, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 4 6 13 0 17 + + + -- linear combo weights (showing up to 5) + + 0.7959 1.1010 0.2164 -0.2681 0.4750 + + + -- cutpoint (score) + --- 1.78102 (0.655123), N = 153 moving right + --- 2.11815 (0.660544), N = 119 moving right + --- 2.39211 (0.689753), N = 80 moving right + --- 2.57641 (0.64577), N = 42 moving right + --- 2.82581 (0.583822), N = 23 moving right + + -- best stat: 0.689753, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9275e-01 7.2464e-03 + 1.1000e+02 9.8913e-01 1.0896e-02 + 1.3100e+02 9.8188e-01 1.8222e-02 + 1.4000e+02 9.7826e-01 2.1912e-02 + 1.7900e+02 9.7464e-01 2.5616e-02 + + +------------ Growing tree 160 -------------- + +- N obs inbag: 276 +- N row inbag: 175 +- max nodes: 233 +- max leaves: 117 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 10 13 16 9 14 + + + -- linear combo weights (showing up to 5) + + -0.7411 0.4590 0.8966 0.0126 0.3806 + + + -- cutpoint (score) + --- -0.975005 (0.583172), N = 201 moving right + --- -0.775559 (0.63379), N = 180 moving right + --- -0.387267 (0.664896), N = 161 moving right + --- -0.281546 (0.687759), N = 145 moving right + --- 2.86281 (0.568608), N = 14 moving right + + -- best stat: 0.687759, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 9 14 0 2 12 + + + -- linear combo weights (showing up to 5) + + 0.3372 0.3261 -0.2445 -0.5351 0.0190 + + + -- cutpoint (score) + --- -0.936304 (0.562916), N = 206 moving right + --- -0.851161 (0.592994), N = 187 moving right + --- -0.514223 (0.610394), N = 100 moving right + --- -0.347021 (0.6083), N = 73 moving right + --- 0.869764 (0.518047), N = 10 moving right + + -- best stat: 0.610394, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 10 17 2 7 13 + + + -- linear combo weights (showing up to 5) + + -0.4162 0.3854 -0.5242 9.1022 0.2938 + + + -- cutpoint (score) + --- 0.213114 (0.594137), N = 205 moving right + --- 0.336876 (0.611536), N = 194 moving right + --- 0.590791 (0.660727), N = 166 moving right + --- 0.650579 (0.677822), N = 155 moving right + --- 0.754697 (0.693984), N = 142 moving right + + -- best stat: 0.693984, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 3.0000e+00 + 7.7000e+01 1.0000e+00 3.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 3.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.8913e-01 1.0870e-02 + 7.7000e+01 9.7826e-01 2.1859e-02 + 1.3100e+02 9.7464e-01 2.5562e-02 + 1.4000e+02 9.6377e-01 3.6715e-02 + 1.8600e+02 9.6014e-01 4.0474e-02 + + +------------ Growing tree 161 -------------- + +- N obs inbag: 276 +- N row inbag: 176 +- max nodes: 223 +- max leaves: 112 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 11 10 17 6 3 + + + -- linear combo weights (showing up to 5) + + 1.1116 -0.4610 0.3683 -0.1068 5.6203 + + + -- cutpoint (score) + --- -0.102838 (0.592757), N = 224 moving right + --- -0.0689861 (0.611196), N = 217 moving right + --- 0.212422 (0.679174), N = 178 moving right + --- 0.589592 (0.710838), N = 149 moving right + --- 1.4478 (0.705987), N = 78 moving right + + -- best stat: 0.710838, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 4 9 15 17 2 + + + -- linear combo weights (showing up to 5) + + 0.6387 0.5317 -0.1260 0.5427 -0.5277 + + + -- cutpoint (score) + --- 0.743265 (0.627078), N = 207 moving right + --- 1.61787 (0.700572), N = 119 moving right + --- 2.53972 (0.564918), N = 34 moving right + --- 2.62293 (0.570917), N = 31 moving right + --- 2.71963 (0.546781), N = 18 moving right + + -- best stat: 0.700572, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 4 3 13 15 7 + + + -- linear combo weights (showing up to 5) + + 0.9015 5.9386 0.5000 -0.0377 4.2765 + + + -- cutpoint (score) + --- -0.502026 (0.542695), N = 246 moving right + --- -0.493503 (0.5497), N = 244 moving right + --- -0.308127 (0.596441), N = 221 moving right + --- -0.176511 (0.601373), N = 200 moving right + --- 0.555587 (0.721627), N = 122 moving right + + -- best stat: 0.721627, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.1000e+01 9.8913e-01 1.0909e-02 + 7.7000e+01 9.8551e-01 1.4572e-02 + 1.4000e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 162 -------------- + +- N obs inbag: 276 +- N row inbag: 173 +- max nodes: 243 +- max leaves: 122 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 11 16 15 14 5 + + + -- linear combo weights (showing up to 5) + + 0.3955 0.7526 -0.2093 0.1972 0.5832 + + + -- cutpoint (score) + --- -0.86338 (0.584908), N = 225 moving right + --- -0.548324 (0.61959), N = 197 moving right + --- -0.387458 (0.646459), N = 173 moving right + --- -0.0653432 (0.68694), N = 137 moving right + --- 0.589592 (0.663464), N = 86 moving right + + -- best stat: 0.68694, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 13 10 7 4 0 + + + -- linear combo weights (showing up to 5) + + 0.4333 -0.5565 7.7555 0.4700 0.1462 + + + -- cutpoint (score) + --- -0.590308 (0.573052), N = 227 moving right + --- -0.441895 (0.584238), N = 205 moving right + --- -0.408544 (0.582758), N = 203 moving right + --- 0.179454 (0.673979), N = 139 moving right + --- 0.878715 (0.708325), N = 69 moving right + + -- best stat: 0.708325, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 11 4 13 16 10 + + + -- linear combo weights (showing up to 5) + + 0.3878 0.4121 0.3423 0.7505 -0.6513 + + + -- cutpoint (score) + --- -1.45914 (0.539751), N = 246 moving right + --- -0.892189 (0.60578), N = 204 moving right + --- 1.84387 (0.636122), N = 32 moving right + --- 2.40168 (0.578714), N = 19 moving right + --- 3.09327 (0.548945), N = 9 moving right + + -- best stat: 0.636122, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 3.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.4800e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9275e-01 7.2464e-03 + 7.1000e+01 9.8913e-01 1.0896e-02 + 1.1000e+02 9.7826e-01 2.1885e-02 + 1.3100e+02 9.7464e-01 2.5589e-02 + 1.4000e+02 9.6739e-01 3.3024e-02 + + +------------ Growing tree 163 -------------- + +- N obs inbag: 276 +- N row inbag: 182 +- max nodes: 217 +- max leaves: 109 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 2 9 14 10 13 + + + -- linear combo weights (showing up to 5) + + -0.3458 0.0464 0.4349 -0.7858 0.2749 + + + -- cutpoint (score) + --- -1.47421 (0.560963), N = 236 moving right + --- -1.056 (0.604174), N = 206 moving right + --- -1.03471 (0.608549), N = 204 moving right + --- -0.781874 (0.624463), N = 172 moving right + --- 0.389521 (0.650792), N = 58 moving right + + -- best stat: 0.650792, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 16 9 0 15 12 + + + -- linear combo weights (showing up to 5) + + 0.6448 0.5918 0.1544 -0.2238 0.1717 + + + -- cutpoint (score) + --- -0.289082 (0.666938), N = 151 moving right + --- 0.395591 (0.670306), N = 80 moving right + --- 0.483572 (0.65569), N = 67 moving right + --- 0.688567 (0.643222), N = 55 moving right + --- 0.746456 (0.63149), N = 46 moving right + + -- best stat: 0.670306, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 4 7 3 0 17 + + + -- linear combo weights (showing up to 5) + + 0.5909 4.0988 8.1615 -0.1355 0.2406 + + + -- cutpoint (score) + --- 0.345718 (0.569482), N = 239 moving right + --- 0.721815 (0.666144), N = 155 moving right + --- 1.55328 (0.619391), N = 23 moving right + --- 13.0873 (0.588706), N = 14 moving right + --- 13.6782 (0.534731), N = 5 moving right + + -- best stat: 0.666144, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 4.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.8551e-01 1.4559e-02 + 1.1000e+02 9.8188e-01 1.8235e-02 + 1.7900e+02 9.7826e-01 2.1926e-02 + + +------------ Growing tree 164 -------------- + +- N obs inbag: 276 +- N row inbag: 169 +- max nodes: 227 +- max leaves: 114 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 14 2 1 15 8 + + + -- linear combo weights (showing up to 5) + + -0.0418 0.2093 0.4313 -0.1741 1.6568 + + + -- cutpoint (score) + --- -0.774208 (0.622907), N = 207 moving right + --- -0.663008 (0.647484), N = 191 moving right + --- -0.230734 (0.781004), N = 127 moving right + --- 1.85318 (0.653764), N = 39 moving right + --- 2.81934 (0.624456), N = 27 moving right + + -- best stat: 0.781004, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 9 14 1 6 5 + + + -- linear combo weights (showing up to 5) + + 0.4506 0.4024 0.3691 1.9774 0.9599 + + + -- cutpoint (score) + --- -0.310479 (0.60731), N = 209 moving right + --- -0.0558706 (0.661238), N = 159 moving right + --- 0.137913 (0.706352), N = 138 moving right + --- 0.286236 (0.735765), N = 120 moving right + --- 3.78358 (0.51949), N = 5 moving right + + -- best stat: 0.735765, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 7 14 5 2 11 + + + -- linear combo weights (showing up to 5) + + 7.3247 0.3641 0.5217 0.6610 0.6507 + + + -- cutpoint (score) + --- 0.175536 (0.641706), N = 189 moving right + --- 0.18529 (0.646583), N = 187 moving right + --- 0.324147 (0.702416), N = 157 moving right + --- 0.354035 (0.703651), N = 155 moving right + --- 1.35354 (0.700929), N = 67 moving right + + -- best stat: 0.703651, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 3.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.1000e+01 9.8551e-01 1.4559e-02 + 7.7000e+01 9.7464e-01 2.5588e-02 + 1.1000e+02 9.6739e-01 3.3023e-02 + + +------------ Growing tree 165 -------------- + +- N obs inbag: 276 +- N row inbag: 183 +- max nodes: 209 +- max leaves: 105 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 13 16 5 1 14 + + + -- linear combo weights (showing up to 5) + + 0.6618 0.4515 1.2622 0.6964 0.3196 + + + -- cutpoint (score) + --- 0.401681 (0.705111), N = 116 moving right + --- 0.445648 (0.706118), N = 115 moving right + --- 1.222 (0.673272), N = 57 moving right + --- 2.24986 (0.597894), N = 27 moving right + --- 2.67872 (0.553911), N = 14 moving right + + -- best stat: 0.706118, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 8 13 16 5 2 + + + -- linear combo weights (showing up to 5) + + 1.8450 0.1667 0.4313 0.2279 0.1761 + + + -- cutpoint (score) + --- -1.32346 (0.54938), N = 252 moving right + --- -1.25467 (0.571129), N = 233 moving right + --- -1.00966 (0.627316), N = 201 moving right + --- -0.889974 (0.660283), N = 183 moving right + --- 1.9036 (0.650153), N = 30 moving right + + -- best stat: 0.660283, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 2 7 16 13 15 + + + -- linear combo weights (showing up to 5) + + 0.1159 6.1872 0.4857 0.4769 0.0264 + + + -- cutpoint (score) + --- -0.690521 (0.539653), N = 251 moving right + --- -0.672719 (0.534618), N = 247 moving right + --- 0.0602305 (0.66131), N = 132 moving right + --- 0.985963 (0.61046), N = 34 moving right + --- 1.12629 (0.590644), N = 28 moving right + + -- best stat: 0.66131, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 3.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 3.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 3.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.8913e-01 1.0870e-02 + 5.1000e+01 9.8551e-01 1.4533e-02 + 1.1000e+02 9.7464e-01 2.5562e-02 + 1.3100e+02 9.7101e-01 2.9279e-02 + 1.8600e+02 9.6377e-01 3.6742e-02 + + +------------ Growing tree 166 -------------- + +- N obs inbag: 276 +- N row inbag: 175 +- max nodes: 207 +- max leaves: 104 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 7 17 11 13 5 + + + -- linear combo weights (showing up to 5) + + 7.8873 0.4613 0.4300 0.3088 0.1981 + + + -- cutpoint (score) + --- 0.729107 (0.588869), N = 228 moving right + --- 1.22804 (0.659015), N = 175 moving right + --- 1.3715 (0.691156), N = 150 moving right + --- 1.5377 (0.742496), N = 122 moving right + --- 10.2477 (0.549936), N = 10 moving right + + -- best stat: 0.742496, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 11 2 13 0 12 + + + -- linear combo weights (showing up to 5) + + 0.7173 -0.0165 0.2311 -0.1814 -0.0019 + + + -- cutpoint (score) + --- -0.570865 (0.636142), N = 192 moving right + --- -0.233574 (0.67877), N = 131 moving right + --- 0.488949 (0.652719), N = 59 moving right + --- 0.57886 (0.651336), N = 53 moving right + --- 0.998711 (0.578981), N = 34 moving right + + -- best stat: 0.67877, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 15 14 4 16 12 + + + -- linear combo weights (showing up to 5) + + -0.3872 0.4888 0.4922 0.5876 0.0856 + + + -- cutpoint (score) + --- -1.2628 (0.506771), N = 264 moving right + --- -1.02874 (0.501259), N = 256 moving right + --- -0.385339 (0.591677), N = 203 moving right + --- 0.458053 (0.682404), N = 94 moving right + --- 0.773424 (0.693407), N = 69 moving right + + -- best stat: 0.693407, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 3.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + 3.2600e+02 1.0000e+00 2.0000e+00 + 3.3400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.1000e+01 9.8188e-01 1.8222e-02 + 1.4000e+02 9.7826e-01 2.1912e-02 + 1.8600e+02 9.6739e-01 3.3023e-02 + + +------------ Growing tree 167 -------------- + +- N obs inbag: 276 +- N row inbag: 178 +- max nodes: 237 +- max leaves: 119 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 12 15 10 2 17 + + + -- linear combo weights (showing up to 5) + + 0.0746 -0.0472 -0.5684 -0.1351 0.5713 + + + -- cutpoint (score) + --- 1.16686 (0.601824), N = 200 moving right + --- 1.4323 (0.64122), N = 162 moving right + --- 1.9862 (0.636558), N = 87 moving right + --- 2.44098 (0.663948), N = 50 moving right + --- 3.10919 (0.572828), N = 14 moving right + + -- best stat: 0.663948, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 17 14 16 5 10 + + + -- linear combo weights (showing up to 5) + + 0.3470 0.4033 0.7024 0.4011 -0.5223 + + + -- cutpoint (score) + --- 0.627943 (0.649016), N = 173 moving right + --- 0.673878 (0.662344), N = 167 moving right + --- 0.820874 (0.680202), N = 148 moving right + --- 1.32146 (0.703383), N = 109 moving right + --- 2.64653 (0.650527), N = 40 moving right + + -- best stat: 0.703383, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 8 11 10 4 15 + + + -- linear combo weights (showing up to 5) + + 1.4593 0.1873 -0.4149 0.0475 -0.1428 + + + -- cutpoint (score) + --- -1.01885 (0.608204), N = 210 moving right + --- -0.601685 (0.693831), N = 155 moving right + --- -0.473256 (0.727715), N = 137 moving right + --- -0.0529648 (0.713992), N = 99 moving right + --- 1.80447 (0.62055), N = 34 moving right + + -- best stat: 0.727715, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.1000e+01 9.8551e-01 1.4559e-02 + 7.7000e+01 9.8188e-01 1.8235e-02 + 1.1000e+02 9.7464e-01 2.5615e-02 + + +------------ Growing tree 168 -------------- + +- N obs inbag: 276 +- N row inbag: 172 +- max nodes: 217 +- max leaves: 109 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 13 2 15 8 3 + + + -- linear combo weights (showing up to 5) + + -0.0466 -1.5065 -0.1280 1.3335 3.3577 + + + -- cutpoint (score) + --- -2.43422 (0.523638), N = 265 moving right + --- -2.13934 (0.673473), N = 185 moving right + --- -1.8134 (0.763617), N = 140 moving right + --- -1.79051 (0.765874), N = 135 moving right + --- -0.0357491 (0.658279), N = 47 moving right + + -- best stat: 0.765874, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 16 6 4 14 12 + + + -- linear combo weights (showing up to 5) + + 0.9791 0.8096 0.7359 0.3938 0.0468 + + + -- cutpoint (score) + --- -0.517797 (0.590248), N = 224 moving right + --- -0.256103 (0.639761), N = 195 moving right + --- -0.206502 (0.653409), N = 189 moving right + --- 0.682214 (0.730615), N = 107 moving right + --- 2.41955 (0.591314), N = 17 moving right + + -- best stat: 0.730615, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 2 7 3 13 16 + + + -- linear combo weights (showing up to 5) + + -1.3636 2.2033 2.8274 0.2622 0.7722 + + + -- cutpoint (score) + --- -1.54675 (0.684341), N = 150 moving right + --- -1.50558 (0.696986), N = 143 moving right + --- -1.15638 (0.712682), N = 116 moving right + --- -1.01067 (0.704071), N = 105 moving right + --- -0.769555 (0.709443), N = 88 moving right + + -- best stat: 0.712682, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + 3.4800e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 7.1000e+01 9.9275e-01 7.2464e-03 + 7.7000e+01 9.8913e-01 1.0896e-02 + 1.4000e+02 9.8551e-01 1.4559e-02 + 1.8600e+02 9.8188e-01 1.8235e-02 + 1.9100e+02 9.7826e-01 2.1926e-02 + + +------------ Growing tree 169 -------------- + +- N obs inbag: 276 +- N row inbag: 181 +- max nodes: 217 +- max leaves: 109 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 6 0 10 7 17 + + + -- linear combo weights (showing up to 5) + + 0.6837 -0.0944 -0.5422 5.8702 0.5452 + + + -- cutpoint (score) + --- 0.148566 (0.508602), N = 271 moving right + --- 0.241709 (0.519657), N = 266 moving right + --- 0.710508 (0.561603), N = 245 moving right + --- 1.54707 (0.675443), N = 147 moving right + --- 8.67569 (0.555533), N = 7 moving right + + -- best stat: 0.675443, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 5 10 3 1 0 + + + -- linear combo weights (showing up to 5) + + 1.4522 -0.3927 8.5176 0.5630 0.2102 + + + -- cutpoint (score) + --- -0.0390485 (0.636592), N = 184 moving right + --- 0.847177 (0.698456), N = 98 moving right + --- 0.927816 (0.675162), N = 91 moving right + --- 1.98072 (0.635225), N = 28 moving right + --- 2.04333 (0.63828), N = 24 moving right + + -- best stat: 0.698456, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 7 9 15 11 2 + + + -- linear combo weights (showing up to 5) + + 5.2240 0.4762 -0.0638 1.2039 -0.2797 + + + -- cutpoint (score) + --- -1.5794 (0.546529), N = 253 moving right + --- -1.27936 (0.619287), N = 214 moving right + --- -0.919625 (0.704466), N = 164 moving right + --- 0.105675 (0.703883), N = 83 moving right + --- 0.533455 (0.68702), N = 66 moving right + + -- best stat: 0.704466, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 3.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 1.1000e+02 9.9275e-01 7.2596e-03 + 1.3100e+02 9.8913e-01 1.0909e-02 + 1.4000e+02 9.8551e-01 1.4572e-02 + 1.8600e+02 9.7464e-01 2.5602e-02 + + +------------ Growing tree 170 -------------- + +- N obs inbag: 276 +- N row inbag: 184 +- max nodes: 213 +- max leaves: 107 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 8 10 6 5 4 + + + -- linear combo weights (showing up to 5) + + 2.0873 -0.4238 0.7009 0.7407 -0.1466 + + + -- cutpoint (score) + --- -1.76005 (0.523151), N = 260 moving right + --- -1.50877 (0.549029), N = 241 moving right + --- -1.43198 (0.567589), N = 234 moving right + --- -1.34821 (0.583265), N = 228 moving right + --- 0.048615 (0.727624), N = 97 moving right + + -- best stat: 0.727624, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 3 1 4 17 15 + + + -- linear combo weights (showing up to 5) + + 8.5395 0.2882 0.2462 0.4179 0.0691 + + + -- cutpoint (score) + --- 0.906884 (0.588856), N = 223 moving right + --- 0.963237 (0.595213), N = 221 moving right + --- 0.991363 (0.602786), N = 213 moving right + --- 1.58069 (0.68507), N = 106 moving right + --- 1.70187 (0.668766), N = 87 moving right + + -- best stat: 0.68507, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 13 0 15 11 8 + + + -- linear combo weights (showing up to 5) + + -0.2937 -0.0531 -0.1077 0.4746 2.2994 + + + -- cutpoint (score) + --- -1.24411 (0.676849), N = 177 moving right + --- -1.19416 (0.69019), N = 169 moving right + --- -1.19007 (0.694683), N = 166 moving right + --- 0.395751 (0.672984), N = 54 moving right + --- 3.60011 (0.623877), N = 22 moving right + + -- best stat: 0.694683, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.1000e+01 9.8188e-01 1.8222e-02 + 7.7000e+01 9.7826e-01 2.1912e-02 + 1.1000e+02 9.7464e-01 2.5616e-02 + + +------------ Growing tree 171 -------------- + +- N obs inbag: 276 +- N row inbag: 172 +- max nodes: 217 +- max leaves: 109 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 0 15 16 1 14 + + + -- linear combo weights (showing up to 5) + + -0.5565 -0.1721 1.1117 0.3372 0.1975 + + + -- cutpoint (score) + --- -1.28377 (0.612685), N = 202 moving right + --- -0.504118 (0.663645), N = 121 moving right + --- -0.378986 (0.676425), N = 114 moving right + --- 0.830959 (0.676783), N = 37 moving right + --- 0.93182 (0.628038), N = 25 moving right + + -- best stat: 0.676783, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 9 11 15 8 17 + + + -- linear combo weights (showing up to 5) + + -0.5496 0.2053 -0.0892 2.5667 0.3464 + + + -- cutpoint (score) + --- 1.31991 (0.724699), N = 71 moving right + --- 2.8065 (0.669576), N = 39 moving right + --- 3.70753 (0.637572), N = 26 moving right + --- 5.03786 (0.620899), N = 19 moving right + --- 9.84796 (0.548767), N = 7 moving right + + -- best stat: 0.724699, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 15 13 10 6 4 + + + -- linear combo weights (showing up to 5) + + -0.0859 0.3680 -0.7349 0.5766 0.6254 + + + -- cutpoint (score) + --- -1.41738 (0.515622), N = 267 moving right + --- -1.22011 (0.529274), N = 262 moving right + --- -0.411119 (0.592073), N = 211 moving right + --- -0.334364 (0.608276), N = 204 moving right + --- -0.102162 (0.618124), N = 185 moving right + + -- best stat: 0.618124, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 3.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.8913e-01 1.0870e-02 + 7.1000e+01 9.8551e-01 1.4533e-02 + 7.7000e+01 9.8188e-01 1.8209e-02 + 1.1000e+02 9.7826e-01 2.1899e-02 + 1.3100e+02 9.7464e-01 2.5603e-02 + + +------------ Growing tree 172 -------------- + +- N obs inbag: 276 +- N row inbag: 167 +- max nodes: 239 +- max leaves: 120 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 15 7 1 13 4 + + + -- linear combo weights (showing up to 5) + + -0.1210 3.2575 0.6672 0.6463 0.2169 + + + -- cutpoint (score) + --- 0.0256039 (0.678947), N = 162 moving right + --- 0.572848 (0.688795), N = 94 moving right + --- 0.644882 (0.68227), N = 85 moving right + --- 0.763422 (0.689386), N = 75 moving right + --- 1.36844 (0.614092), N = 36 moving right + + -- best stat: 0.689386, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 2 9 17 0 4 + + + -- linear combo weights (showing up to 5) + + -0.2896 0.4727 0.6899 -0.0813 -0.0629 + + + -- cutpoint (score) + --- 1.42513 (0.608057), N = 203 moving right + --- 1.57782 (0.675155), N = 166 moving right + --- 1.76236 (0.688978), N = 132 moving right + --- 2.09572 (0.637804), N = 94 moving right + --- 2.30315 (0.597496), N = 53 moving right + + -- best stat: 0.688978, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 3 1 0 9 2 + + + -- linear combo weights (showing up to 5) + + 6.1990 0.4871 0.0753 0.6140 -0.0028 + + + -- cutpoint (score) + --- -0.461943 (0.572541), N = 219 moving right + --- -0.181169 (0.622023), N = 179 moving right + --- 0.256861 (0.699254), N = 85 moving right + --- 0.317634 (0.681761), N = 72 moving right + --- 6.61908 (0.533967), N = 8 moving right + + -- best stat: 0.699254, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 3.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 4.0000e+00 + 1.9800e+02 1.0000e+00 3.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 7.1000e+01 9.8551e-01 1.4546e-02 + 7.7000e+01 9.7464e-01 2.5575e-02 + 1.1000e+02 9.6739e-01 3.3010e-02 + 1.3100e+02 9.6377e-01 3.6755e-02 + + +------------ Growing tree 173 -------------- + +- N obs inbag: 276 +- N row inbag: 171 +- max nodes: 227 +- max leaves: 114 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 7 16 6 12 3 + + + -- linear combo weights (showing up to 5) + + 11.9527 0.3971 -0.1251 0.1061 7.2599 + + + -- cutpoint (score) + --- -0.321899 (0.612758), N = 200 moving right + --- -0.00170892 (0.633322), N = 133 moving right + --- 0.0208119 (0.636214), N = 116 moving right + --- 0.68423 (0.61038), N = 19 moving right + --- 7.18067 (0.598363), N = 14 moving right + + -- best stat: 0.636214, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 5 8 11 12 4 + + + -- linear combo weights (showing up to 5) + + 0.2664 1.8579 0.2887 -0.0526 -0.0101 + + + -- cutpoint (score) + --- -1.31134 (0.547811), N = 246 moving right + --- -1.1086 (0.62651), N = 206 moving right + --- -0.960407 (0.659712), N = 172 moving right + --- 0.386806 (0.687366), N = 62 moving right + --- 0.387458 (0.690301), N = 61 moving right + + -- best stat: 0.690301, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 14 15 6 0 12 + + + -- linear combo weights (showing up to 5) + + 0.4274 -0.0544 0.3249 -0.3460 0.0303 + + + -- cutpoint (score) + --- -0.787582 (0.500878), N = 269 moving right + --- -0.766015 (0.50452), N = 268 moving right + --- -0.300757 (0.573708), N = 162 moving right + --- -0.0331715 (0.597678), N = 71 moving right + --- 0.214113 (0.573965), N = 40 moving right + + -- best stat: 0.597678, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 3.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + 3.2600e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 7.1000e+01 9.8913e-01 1.0896e-02 + 1.1000e+02 9.8551e-01 1.4559e-02 + 1.3100e+02 9.8188e-01 1.8235e-02 + 1.8600e+02 9.7464e-01 2.5616e-02 + + +------------ Growing tree 174 -------------- + +- N obs inbag: 276 +- N row inbag: 168 +- max nodes: 237 +- max leaves: 119 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 11 4 2 14 0 + + + -- linear combo weights (showing up to 5) + + 0.7436 0.6162 0.2709 0.2110 -0.0404 + + + -- cutpoint (score) + --- -0.542089 (0.536027), N = 252 moving right + --- 0.258669 (0.659157), N = 155 moving right + --- 0.296529 (0.674061), N = 147 moving right + --- 0.880764 (0.663724), N = 75 moving right + --- 2.24542 (0.53458), N = 14 moving right + + -- best stat: 0.674061, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 10 7 16 9 3 + + + -- linear combo weights (showing up to 5) + + -0.5888 14.7157 0.5425 0.6022 -0.2125 + + + -- cutpoint (score) + --- -1.43787 (0.525078), N = 262 moving right + --- -1.07685 (0.540921), N = 244 moving right + --- -0.661581 (0.624455), N = 197 moving right + --- 0.104578 (0.716654), N = 101 moving right + --- 0.387994 (0.709212), N = 76 moving right + + -- best stat: 0.716654, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 16 13 3 11 10 + + + -- linear combo weights (showing up to 5) + + 0.5078 0.2538 2.4685 0.5137 -0.4822 + + + -- cutpoint (score) + --- -1.4384 (0.521674), N = 262 moving right + --- -0.561222 (0.655609), N = 173 moving right + --- -0.146061 (0.721669), N = 129 moving right + --- -0.0038131 (0.724565), N = 116 moving right + --- 0.566 (0.71435), N = 65 moving right + + -- best stat: 0.724565, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 3.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 3.0400e+02 1.0000e+00 3.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9275e-01 7.2464e-03 + 7.1000e+01 9.8551e-01 1.4546e-02 + 7.7000e+01 9.8188e-01 1.8222e-02 + 1.3100e+02 9.7826e-01 2.1912e-02 + 1.7900e+02 9.6739e-01 3.3023e-02 + + +------------ Growing tree 175 -------------- + +- N obs inbag: 276 +- N row inbag: 173 +- max nodes: 255 +- max leaves: 128 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 15 4 6 17 13 + + + -- linear combo weights (showing up to 5) + + -0.0111 0.3862 0.3789 0.4197 0.5170 + + + -- cutpoint (score) + --- 0.98937 (0.638018), N = 200 moving right + --- 1.6177 (0.678066), N = 128 moving right + --- 1.98417 (0.702752), N = 82 moving right + --- 2.19389 (0.636753), N = 60 moving right + --- 2.37161 (0.576832), N = 33 moving right + + -- best stat: 0.702752, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 14 16 13 4 15 + + + -- linear combo weights (showing up to 5) + + 0.4752 0.4097 0.4835 0.5337 -0.1198 + + + -- cutpoint (score) + --- 0.260013 (0.68671), N = 133 moving right + --- 0.417581 (0.699713), N = 116 moving right + --- 0.478318 (0.701789), N = 105 moving right + --- 0.563916 (0.697656), N = 98 moving right + --- 1.34574 (0.623127), N = 43 moving right + + -- best stat: 0.701789, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 0 12 7 2 14 + + + -- linear combo weights (showing up to 5) + + -0.0428 0.1753 5.5439 -0.3518 0.5241 + + + -- cutpoint (score) + --- -0.818289 (0.552995), N = 236 moving right + --- -0.797269 (0.566602), N = 228 moving right + --- -0.587282 (0.58959), N = 179 moving right + --- -0.216199 (0.619881), N = 105 moving right + --- -0.061518 (0.627505), N = 88 moving right + + -- best stat: 0.627505, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 3.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 3.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8551e-01 1.4532e-02 + 7.1000e+01 9.7826e-01 2.1885e-02 + 7.7000e+01 9.7464e-01 2.5589e-02 + 1.3100e+02 9.6739e-01 3.3024e-02 + + +------------ Growing tree 176 -------------- + +- N obs inbag: 276 +- N row inbag: 173 +- max nodes: 237 +- max leaves: 119 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 5 9 14 10 8 + + + -- linear combo weights (showing up to 5) + + 0.4434 -0.1597 -0.0180 -0.4755 1.6344 + + + -- cutpoint (score) + --- -1.33442 (0.538281), N = 247 moving right + --- -0.785806 (0.662046), N = 178 moving right + --- -0.681387 (0.688965), N = 165 moving right + --- 0.571746 (0.710823), N = 69 moving right + --- 7.5832 (0.518097), N = 5 moving right + + -- best stat: 0.710823, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 15 5 1 12 2 + + + -- linear combo weights (showing up to 5) + + -0.0926 0.8780 0.4053 0.1898 -0.3523 + + + -- cutpoint (score) + --- -0.873439 (0.525856), N = 245 moving right + --- -0.690281 (0.55049), N = 228 moving right + --- 0.198076 (0.658698), N = 86 moving right + --- 0.486228 (0.641586), N = 64 moving right + --- 0.570792 (0.622051), N = 51 moving right + + -- best stat: 0.658698, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 12 10 5 15 0 + + + -- linear combo weights (showing up to 5) + + 0.1015 -0.7459 0.8083 -0.0948 -0.0347 + + + -- cutpoint (score) + --- -0.356491 (0.605982), N = 194 moving right + --- -0.246265 (0.623114), N = 179 moving right + --- 0.155821 (0.644795), N = 132 moving right + --- 0.19014 (0.653361), N = 124 moving right + --- 1.29756 (0.628943), N = 32 moving right + + -- best stat: 0.653361, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 3.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 7.1000e+01 9.9275e-01 7.2464e-03 + 7.7000e+01 9.8913e-01 1.0896e-02 + 1.3100e+02 9.7826e-01 2.1885e-02 + 1.7900e+02 9.7464e-01 2.5589e-02 + 1.8600e+02 9.7101e-01 2.9306e-02 + + +------------ Growing tree 177 -------------- + +- N obs inbag: 276 +- N row inbag: 179 +- max nodes: 217 +- max leaves: 109 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 5 4 9 16 1 + + + -- linear combo weights (showing up to 5) + + 0.8970 0.7437 0.3275 0.3951 0.3836 + + + -- cutpoint (score) + --- 0.0879492 (0.672117), N = 191 moving right + --- 0.28294 (0.698122), N = 176 moving right + --- 0.803101 (0.747577), N = 119 moving right + --- 0.92161 (0.751277), N = 107 moving right + --- 1.37148 (0.66729), N = 71 moving right + + -- best stat: 0.751277, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 0 12 4 14 7 + + + -- linear combo weights (showing up to 5) + + -0.3457 0.0659 1.0698 0.3724 12.2261 + + + -- cutpoint (score) + --- -0.555861 (0.530671), N = 256 moving right + --- -0.406901 (0.570552), N = 234 moving right + --- 0.0292667 (0.640562), N = 182 moving right + --- 0.849383 (0.664776), N = 90 moving right + --- 1.07704 (0.632034), N = 59 moving right + + -- best stat: 0.664776, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 0 2 4 16 3 + + + -- linear combo weights (showing up to 5) + + -0.2905 0.1027 0.9812 0.3445 8.1862 + + + -- cutpoint (score) + --- -0.148593 (0.586964), N = 216 moving right + --- 1.07155 (0.698182), N = 65 moving right + --- 1.17428 (0.697357), N = 51 moving right + --- 1.1913 (0.68706), N = 49 moving right + --- 1.3793 (0.650376), N = 37 moving right + + -- best stat: 0.698182, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 3.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.8188e-01 1.8222e-02 + 1.1000e+02 9.7826e-01 2.1912e-02 + 1.3100e+02 9.7464e-01 2.5616e-02 + + +------------ Growing tree 178 -------------- + +- N obs inbag: 276 +- N row inbag: 178 +- max nodes: 215 +- max leaves: 108 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 3 4 2 10 0 + + + -- linear combo weights (showing up to 5) + + 7.3033 0.2872 -0.9102 -0.5254 -0.2445 + + + -- cutpoint (score) + --- -1.05495 (0.623511), N = 179 moving right + --- -0.925141 (0.661673), N = 155 moving right + --- -0.858646 (0.657937), N = 140 moving right + --- -0.47298 (0.658269), N = 79 moving right + --- -0.0279342 (0.640174), N = 36 moving right + + -- best stat: 0.661673, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 15 16 1 0 10 + + + -- linear combo weights (showing up to 5) + + -0.2258 0.6114 0.5274 -0.4146 -0.7913 + + + -- cutpoint (score) + --- -1.55274 (0.568728), N = 224 moving right + --- -0.62184 (0.675555), N = 151 moving right + --- 1.69256 (0.639137), N = 29 moving right + --- 2.36956 (0.591845), N = 18 moving right + --- 2.9595 (0.549097), N = 10 moving right + + -- best stat: 0.675555, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 8 15 10 17 9 + + + -- linear combo weights (showing up to 5) + + 1.9187 -0.2584 -0.5770 0.3314 -0.3390 + + + -- cutpoint (score) + --- -0.541544 (0.593941), N = 220 moving right + --- -0.474803 (0.595912), N = 219 moving right + --- 0.627956 (0.746877), N = 116 moving right + --- 1.5172 (0.760448), N = 77 moving right + --- 7.71648 (0.55082), N = 8 moving right + + -- best stat: 0.760448, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.7000e+01 9.8913e-01 1.0909e-02 + 1.3100e+02 9.8188e-01 1.8235e-02 + 1.4000e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 179 -------------- + +- N obs inbag: 276 +- N row inbag: 180 +- max nodes: 235 +- max leaves: 118 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 15 17 2 6 12 + + + -- linear combo weights (showing up to 5) + + -0.1553 0.7094 -0.1349 0.8246 0.3712 + + + -- cutpoint (score) + --- 1.09416 (0.570183), N = 243 moving right + --- 1.80811 (0.644837), N = 193 moving right + --- 1.87979 (0.672757), N = 170 moving right + --- 2.85626 (0.597657), N = 41 moving right + --- 2.86683 (0.593317), N = 40 moving right + + -- best stat: 0.672757, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 1 3 5 14 17 + + + -- linear combo weights (showing up to 5) + + 0.0867 2.9731 0.7559 0.1694 0.5067 + + + -- cutpoint (score) + --- 0.911103 (0.553401), N = 251 moving right + --- 1.26069 (0.618723), N = 221 moving right + --- 1.43745 (0.641745), N = 194 moving right + --- 1.46117 (0.638057), N = 190 moving right + --- 2.04212 (0.694923), N = 105 moving right + + -- best stat: 0.694923, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 1 0 15 2 10 + + + -- linear combo weights (showing up to 5) + + 0.3923 0.3384 -0.2172 -0.0856 -0.6947 + + + -- cutpoint (score) + --- -1.10687 (0.532801), N = 257 moving right + --- -0.766711 (0.570463), N = 233 moving right + --- -0.489484 (0.593913), N = 212 moving right + --- -0.193072 (0.678457), N = 167 moving right + --- 0.312639 (0.686802), N = 107 moving right + + -- best stat: 0.686802, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 3.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.1000e+01 9.8188e-01 1.8222e-02 + 7.7000e+01 9.7826e-01 2.1912e-02 + 1.1000e+02 9.6739e-01 3.3023e-02 + + +------------ Growing tree 180 -------------- + +- N obs inbag: 276 +- N row inbag: 182 +- max nodes: 207 +- max leaves: 104 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 9 17 13 8 16 + + + -- linear combo weights (showing up to 5) + + -0.1993 0.4509 0.0239 1.9980 0.3549 + + + -- cutpoint (score) + --- 0.013894 (0.633364), N = 210 moving right + --- 0.158778 (0.63738), N = 202 moving right + --- 0.222843 (0.666365), N = 184 moving right + --- 0.379374 (0.707774), N = 163 moving right + --- 1.81261 (0.71122), N = 64 moving right + + -- best stat: 0.71122, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 12 16 11 6 3 + + + -- linear combo weights (showing up to 5) + + 0.1391 0.3208 0.5929 1.4236 4.4464 + + + -- cutpoint (score) + --- -0.872764 (0.519789), N = 264 moving right + --- -0.566142 (0.599161), N = 225 moving right + --- -0.536111 (0.616253), N = 212 moving right + --- 1.01474 (0.704919), N = 65 moving right + --- 4.91216 (0.576596), N = 16 moving right + + -- best stat: 0.704919, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 1 15 8 13 16 + + + -- linear combo weights (showing up to 5) + + 0.3408 -0.1703 1.9806 -0.0291 0.3294 + + + -- cutpoint (score) + --- -1.33229 (0.614303), N = 215 moving right + --- -1.28376 (0.632832), N = 205 moving right + --- -0.406327 (0.780136), N = 110 moving right + --- 0.856727 (0.675737), N = 53 moving right + --- 1.71965 (0.642086), N = 33 moving right + + -- best stat: 0.780136, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.1000e+01 9.8551e-01 1.4559e-02 + 7.7000e+01 9.8188e-01 1.8235e-02 + 1.1000e+02 9.7464e-01 2.5615e-02 + + +------------ Growing tree 181 -------------- + +- N obs inbag: 276 +- N row inbag: 179 +- max nodes: 199 +- max leaves: 100 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 16 1 0 3 17 + + + -- linear combo weights (showing up to 5) + + 0.4327 0.2133 0.0707 4.2702 0.4058 + + + -- cutpoint (score) + --- 0.737748 (0.609454), N = 202 moving right + --- 0.741305 (0.613611), N = 200 moving right + --- 1.1218 (0.681466), N = 129 moving right + --- 1.15833 (0.690515), N = 122 moving right + --- 1.71363 (0.684601), N = 59 moving right + + -- best stat: 0.690515, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 7 12 11 15 10 + + + -- linear combo weights (showing up to 5) + + 5.3756 0.0947 0.8255 -0.0335 -0.5599 + + + -- cutpoint (score) + --- -0.821341 (0.62366), N = 202 moving right + --- -0.777473 (0.630019), N = 199 moving right + --- -0.0463259 (0.73198), N = 107 moving right + --- 0.016548 (0.738984), N = 100 moving right + --- 0.0513074 (0.729912), N = 95 moving right + + -- best stat: 0.738984, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 17 15 10 0 3 + + + -- linear combo weights (showing up to 5) + + 0.4968 0.0581 -0.4447 0.0407 4.4984 + + + -- cutpoint (score) + --- 0.521866 (0.535906), N = 256 moving right + --- 0.799299 (0.558095), N = 235 moving right + --- 0.825036 (0.577416), N = 228 moving right + --- 1.25499 (0.649518), N = 168 moving right + --- 1.33389 (0.665614), N = 156 moving right + + -- best stat: 0.665614, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.1000e+01 9.8188e-01 1.8222e-02 + 7.7000e+01 9.7464e-01 2.5602e-02 + 1.1000e+02 9.7101e-01 2.9319e-02 + + +------------ Growing tree 182 -------------- + +- N obs inbag: 276 +- N row inbag: 180 +- max nodes: 227 +- max leaves: 114 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 5 14 6 1 17 + + + -- linear combo weights (showing up to 5) + + 0.7830 0.2906 2.0188 0.1923 0.3712 + + + -- cutpoint (score) + --- 0.585508 (0.586175), N = 240 moving right + --- 1.06773 (0.664341), N = 185 moving right + --- 1.63386 (0.68916), N = 101 moving right + --- 1.67039 (0.682281), N = 95 moving right + --- 3.50612 (0.565915), N = 16 moving right + + -- best stat: 0.68916, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 4 14 10 5 1 + + + -- linear combo weights (showing up to 5) + + 0.1124 0.3063 -0.6308 0.6935 0.2643 + + + -- cutpoint (score) + --- -0.772374 (0.564349), N = 236 moving right + --- 0.243142 (0.701431), N = 122 moving right + --- 0.724258 (0.669574), N = 68 moving right + --- 0.742663 (0.672508), N = 66 moving right + --- 0.923077 (0.613809), N = 51 moving right + + -- best stat: 0.701431, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 12 15 6 2 16 + + + -- linear combo weights (showing up to 5) + + 0.2899 -0.2374 1.9112 -0.2611 0.5250 + + + -- cutpoint (score) + --- -0.966566 (0.548014), N = 249 moving right + --- -0.644176 (0.619955), N = 195 moving right + --- -0.179721 (0.658512), N = 127 moving right + --- 0.0714304 (0.680636), N = 84 moving right + --- 1.34079 (0.591587), N = 27 moving right + + -- best stat: 0.680636, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.7000e+01 9.8551e-01 1.4559e-02 + 1.1000e+02 9.8188e-01 1.8235e-02 + 1.4000e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 183 -------------- + +- N obs inbag: 276 +- N row inbag: 162 +- max nodes: 219 +- max leaves: 110 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 7 14 11 4 3 + + + -- linear combo weights (showing up to 5) + + 4.7569 0.1249 0.7346 0.4045 3.0905 + + + -- cutpoint (score) + --- -0.464582 (0.611001), N = 221 moving right + --- -0.0759936 (0.712351), N = 166 moving right + --- 0.0382627 (0.696434), N = 150 moving right + --- 0.65464 (0.736468), N = 77 moving right + --- 0.775232 (0.720727), N = 71 moving right + + -- best stat: 0.736468, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 10 7 3 12 1 + + + -- linear combo weights (showing up to 5) + + -0.3022 5.2551 4.0154 0.1280 0.3837 + + + -- cutpoint (score) + --- -0.991051 (0.498219), N = 271 moving right + --- -0.248752 (0.600668), N = 187 moving right + --- -0.0898826 (0.614475), N = 161 moving right + --- 0.11298 (0.654905), N = 116 moving right + --- 0.725372 (0.641714), N = 43 moving right + + -- best stat: 0.654905, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 12 17 13 1 10 + + + -- linear combo weights (showing up to 5) + + 0.0069 0.5464 0.4362 0.3374 -0.4829 + + + -- cutpoint (score) + --- 1.2676 (0.651211), N = 194 moving right + --- 1.54277 (0.656708), N = 156 moving right + --- 1.84065 (0.69971), N = 120 moving right + --- 2.01205 (0.704393), N = 100 moving right + --- 3.59618 (0.556259), N = 16 moving right + + -- best stat: 0.704393, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 3.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 2.0000e+00 + 3.3400e+02 1.0000e+00 1.0000e+00 + 3.8800e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 7.7000e+01 9.8913e-01 1.0896e-02 + 1.3100e+02 9.7826e-01 2.1885e-02 + 1.4000e+02 9.7101e-01 2.9292e-02 + 1.9800e+02 9.6739e-01 3.3024e-02 + + +------------ Growing tree 184 -------------- + +- N obs inbag: 276 +- N row inbag: 167 +- max nodes: 203 +- max leaves: 102 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 0 7 13 16 9 + + + -- linear combo weights (showing up to 5) + + -0.2865 23.3447 0.2338 0.8336 0.3736 + + + -- cutpoint (score) + --- -1.01679 (0.600362), N = 221 moving right + --- -0.980914 (0.603191), N = 220 moving right + --- -0.811278 (0.629487), N = 188 moving right + --- -0.331931 (0.689616), N = 134 moving right + --- 2.19936 (0.571074), N = 12 moving right + + -- best stat: 0.689616, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 5 9 12 13 3 + + + -- linear combo weights (showing up to 5) + + 0.7576 0.3407 0.1220 0.2936 20.8467 + + + -- cutpoint (score) + --- -0.363181 (0.608316), N = 217 moving right + --- -0.30722 (0.627168), N = 206 moving right + --- -0.193349 (0.643099), N = 186 moving right + --- 0.525611 (0.642426), N = 76 moving right + --- 0.604462 (0.660421), N = 66 moving right + + -- best stat: 0.660421, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 7 3 10 1 8 + + + -- linear combo weights (showing up to 5) + + 12.1361 12.6535 -0.1866 0.2975 1.5512 + + + -- cutpoint (score) + --- -0.887989 (0.632548), N = 186 moving right + --- -0.0376083 (0.759276), N = 76 moving right + --- 0.786821 (0.707843), N = 49 moving right + --- 1.25092 (0.654183), N = 36 moving right + --- 2.39899 (0.637696), N = 25 moving right + + -- best stat: 0.759276, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 3.2600e+02 1.0000e+00 2.0000e+00 + 3.4800e+02 1.0000e+00 2.0000e+00 + 4.0000e+02 1.0000e+00 1.0000e+00 + 5.1500e+02 1.0000e+00 1.0000e+00 + 5.4900e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9275e-01 7.2464e-03 + 7.7000e+01 9.8913e-01 1.0896e-02 + 1.4000e+02 9.8551e-01 1.4559e-02 + 1.7900e+02 9.7826e-01 2.1912e-02 + 1.9800e+02 9.7101e-01 2.9319e-02 + + +------------ Growing tree 185 -------------- + +- N obs inbag: 276 +- N row inbag: 176 +- max nodes: 187 +- max leaves: 94 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 10 7 16 9 15 + + + -- linear combo weights (showing up to 5) + + -0.6002 16.8764 0.5894 0.3905 0.0278 + + + -- cutpoint (score) + --- -1.18343 (0.522474), N = 252 moving right + --- -0.374425 (0.68101), N = 148 moving right + --- -0.296527 (0.692914), N = 142 moving right + --- -0.248129 (0.701239), N = 135 moving right + --- 0.705533 (0.739008), N = 51 moving right + + -- best stat: 0.739008, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 12 2 11 13 0 + + + -- linear combo weights (showing up to 5) + + 0.0113 -0.2729 0.8593 0.2126 -0.0607 + + + -- cutpoint (score) + --- -0.296284 (0.670861), N = 103 moving right + --- -0.157789 (0.67479), N = 83 moving right + --- 0.0997298 (0.654607), N = 63 moving right + --- 0.10208 (0.647989), N = 62 moving right + --- 0.963453 (0.548386), N = 18 moving right + + -- best stat: 0.67479, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 11 16 14 3 13 + + + -- linear combo weights (showing up to 5) + + 0.5078 0.5027 0.2324 6.6366 0.2605 + + + -- cutpoint (score) + --- -1.34636 (0.512091), N = 267 moving right + --- -0.911106 (0.564102), N = 241 moving right + --- -0.613231 (0.666955), N = 173 moving right + --- -0.516905 (0.693405), N = 162 moving right + --- -0.430229 (0.702011), N = 151 moving right + + -- best stat: 0.702011, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + 3.2600e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 7.1000e+01 9.9638e-01 3.6232e-03 + 1.1000e+02 9.9275e-01 7.2596e-03 + 1.3100e+02 9.8913e-01 1.0909e-02 + 1.7900e+02 9.8551e-01 1.4572e-02 + 1.8600e+02 9.8188e-01 1.8249e-02 + + +------------ Growing tree 186 -------------- + +- N obs inbag: 276 +- N row inbag: 175 +- max nodes: 187 +- max leaves: 94 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 0 17 16 8 6 + + + -- linear combo weights (showing up to 5) + + -0.1055 0.6444 0.7120 1.4063 -0.1363 + + + -- cutpoint (score) + --- 0.0356565 (0.559759), N = 246 moving right + --- 0.715237 (0.68472), N = 176 moving right + --- 0.834436 (0.706936), N = 166 moving right + --- 1.29342 (0.771071), N = 132 moving right + --- 1.49194 (0.781623), N = 120 moving right + + -- best stat: 0.781623, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 8 10 9 2 17 + + + -- linear combo weights (showing up to 5) + + 1.7535 -0.8006 -0.4800 -1.4180 0.6643 + + + -- cutpoint (score) + --- -1.01112 (0.617608), N = 219 moving right + --- -0.529572 (0.675945), N = 188 moving right + --- -0.201025 (0.72453), N = 155 moving right + --- 0.993029 (0.789399), N = 86 moving right + --- 3.23783 (0.655596), N = 25 moving right + + -- best stat: 0.789399, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 17 0 15 11 3 + + + -- linear combo weights (showing up to 5) + + 0.3368 0.4143 -0.2061 0.9626 7.6390 + + + -- cutpoint (score) + --- -0.0334885 (0.539143), N = 259 moving right + --- 0.41704 (0.632603), N = 210 moving right + --- 0.697622 (0.688652), N = 172 moving right + --- 1.16764 (0.75201), N = 119 moving right + --- 1.17728 (0.760786), N = 115 moving right + + -- best stat: 0.760786, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 3.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + 3.3400e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 7.7000e+01 9.8913e-01 1.0896e-02 + 1.1000e+02 9.8188e-01 1.8222e-02 + 1.4000e+02 9.7826e-01 2.1912e-02 + 1.7900e+02 9.7464e-01 2.5616e-02 + + +------------ Growing tree 187 -------------- + +- N obs inbag: 276 +- N row inbag: 188 +- max nodes: 239 +- max leaves: 120 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 10 4 7 1 3 + + + -- linear combo weights (showing up to 5) + + -0.4850 0.4159 4.0048 0.3801 3.7213 + + + -- cutpoint (score) + --- -1.01033 (0.503709), N = 267 moving right + --- -0.509528 (0.573184), N = 225 moving right + --- 0.0684178 (0.658824), N = 157 moving right + --- 0.686812 (0.684693), N = 69 moving right + --- 9.40673 (0.529633), N = 5 moving right + + -- best stat: 0.684693, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 11 9 7 4 0 + + + -- linear combo weights (showing up to 5) + + 1.1910 0.1002 4.3714 0.0936 -0.3135 + + + -- cutpoint (score) + --- -1.01349 (0.595549), N = 226 moving right + --- -0.462575 (0.664706), N = 148 moving right + --- -0.412501 (0.664088), N = 144 moving right + --- 0.547347 (0.677369), N = 58 moving right + --- 0.923903 (0.676132), N = 50 moving right + + -- best stat: 0.677369, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 13 12 17 15 0 + + + -- linear combo weights (showing up to 5) + + 0.2329 0.1331 0.6074 0.1218 -0.4602 + + + -- cutpoint (score) + --- 0.787831 (0.561945), N = 248 moving right + --- 1.45924 (0.62758), N = 174 moving right + --- 1.73706 (0.634698), N = 124 moving right + --- 1.92237 (0.615948), N = 89 moving right + --- 2.37508 (0.579122), N = 26 moving right + + -- best stat: 0.634698, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 3.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.9275e-01 7.2596e-03 + 1.3100e+02 9.8551e-01 1.4559e-02 + 1.4000e+02 9.8188e-01 1.8235e-02 + 1.7900e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 188 -------------- + +- N obs inbag: 276 +- N row inbag: 177 +- max nodes: 215 +- max leaves: 108 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 2 17 9 5 7 + + + -- linear combo weights (showing up to 5) + + -0.8917 0.5659 0.6150 -0.0832 4.7983 + + + -- cutpoint (score) + --- 0.0796516 (0.608396), N = 220 moving right + --- 0.205381 (0.611847), N = 214 moving right + --- 0.684862 (0.713519), N = 147 moving right + --- 1.75222 (0.677315), N = 63 moving right + --- 2.49222 (0.611275), N = 28 moving right + + -- best stat: 0.713519, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 6 4 10 8 0 + + + -- linear combo weights (showing up to 5) + + 0.1095 0.3905 -0.6382 1.7128 -0.0568 + + + -- cutpoint (score) + --- -1.91742 (0.507316), N = 269 moving right + --- -1.88413 (0.515696), N = 265 moving right + --- -0.184465 (0.748718), N = 115 moving right + --- 0.204779 (0.730419), N = 92 moving right + --- 0.497979 (0.730794), N = 77 moving right + + -- best stat: 0.748718, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 3 5 17 15 14 + + + -- linear combo weights (showing up to 5) + + 5.3405 0.2958 0.4958 -0.2787 0.3765 + + + -- cutpoint (score) + --- 0.0567396 (0.506566), N = 271 moving right + --- 0.886118 (0.607233), N = 218 moving right + --- 1.60011 (0.67203), N = 129 moving right + --- 1.97548 (0.653356), N = 75 moving right + --- 3.35452 (0.571541), N = 11 moving right + + -- best stat: 0.67203, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 3.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + 3.3400e+02 1.0000e+00 1.0000e+00 + 3.8800e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.1000e+01 9.8913e-01 1.0909e-02 + 1.1000e+02 9.8551e-01 1.4572e-02 + 1.4000e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 189 -------------- + +- N obs inbag: 276 +- N row inbag: 179 +- max nodes: 231 +- max leaves: 116 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 7 15 9 11 16 + + + -- linear combo weights (showing up to 5) + + 3.7025 -0.2689 0.4805 0.7995 0.5955 + + + -- cutpoint (score) + --- -1.5741 (0.508961), N = 269 moving right + --- -1.14067 (0.570264), N = 238 moving right + --- -0.76394 (0.663026), N = 191 moving right + --- -0.753024 (0.672814), N = 187 moving right + --- -0.508022 (0.72131), N = 165 moving right + + -- best stat: 0.72131, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 12 14 10 3 15 + + + -- linear combo weights (showing up to 5) + + 0.0066 0.1601 -0.6181 6.1522 -0.2843 + + + -- cutpoint (score) + --- -0.451475 (0.618279), N = 205 moving right + --- -0.371643 (0.617587), N = 194 moving right + --- -0.263753 (0.633201), N = 178 moving right + --- -0.119597 (0.648989), N = 159 moving right + --- 0.109867 (0.665103), N = 114 moving right + + -- best stat: 0.665103, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 1 4 12 3 17 + + + -- linear combo weights (showing up to 5) + + 0.3453 0.2198 0.0311 6.5962 0.5720 + + + -- cutpoint (score) + --- 1.70404 (0.682659), N = 174 moving right + --- 2.39724 (0.722329), N = 89 moving right + --- 2.63012 (0.658161), N = 55 moving right + --- 2.78622 (0.647162), N = 40 moving right + --- 9.22451 (0.56861), N = 14 moving right + + -- best stat: 0.722329, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8551e-01 1.4546e-02 + 7.1000e+01 9.8188e-01 1.8222e-02 + 7.7000e+01 9.7826e-01 2.1912e-02 + 1.1000e+02 9.7464e-01 2.5616e-02 + + +------------ Growing tree 190 -------------- + +- N obs inbag: 276 +- N row inbag: 168 +- max nodes: 221 +- max leaves: 111 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 9 12 1 11 15 + + + -- linear combo weights (showing up to 5) + + 0.2152 -0.2381 0.6228 1.5343 -0.1109 + + + -- cutpoint (score) + --- -1.88017 (0.531017), N = 259 moving right + --- -0.639521 (0.682673), N = 169 moving right + --- -0.0390775 (0.740832), N = 104 moving right + --- 0.496092 (0.714558), N = 74 moving right + --- 2.90201 (0.575478), N = 15 moving right + + -- best stat: 0.740832, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 1 16 5 0 6 + + + -- linear combo weights (showing up to 5) + + 0.6400 0.8878 1.4374 -0.0474 -0.5761 + + + -- cutpoint (score) + --- -0.792794 (0.552486), N = 222 moving right + --- -0.387575 (0.630801), N = 175 moving right + --- 0.138505 (0.662686), N = 111 moving right + --- 0.567783 (0.694847), N = 85 moving right + --- 3.27221 (0.551639), N = 8 moving right + + -- best stat: 0.694847, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 10 6 2 3 14 + + + -- linear combo weights (showing up to 5) + + -0.6178 -0.1350 -1.2560 8.7686 0.1477 + + + -- cutpoint (score) + --- -2.02166 (0.526846), N = 255 moving right + --- -1.99963 (0.531462), N = 252 moving right + --- -1.53606 (0.601859), N = 196 moving right + --- -1.36143 (0.642107), N = 164 moving right + --- -1.29015 (0.661691), N = 155 moving right + + -- best stat: 0.661691, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 3.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.8551e-01 1.4559e-02 + 1.3100e+02 9.7826e-01 2.1912e-02 + 1.4000e+02 9.7101e-01 2.9319e-02 + + +------------ Growing tree 191 -------------- + +- N obs inbag: 276 +- N row inbag: 177 +- max nodes: 219 +- max leaves: 110 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 10 3 2 8 9 + + + -- linear combo weights (showing up to 5) + + -0.4418 9.9634 -1.0318 1.2598 0.0346 + + + -- cutpoint (score) + --- -2.12992 (0.566107), N = 240 moving right + --- -1.7794 (0.659268), N = 195 moving right + --- -1.72594 (0.671165), N = 188 moving right + --- -1.23399 (0.746097), N = 120 moving right + --- -0.98082 (0.737854), N = 101 moving right + + -- best stat: 0.746097, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 2 9 8 6 13 + + + -- linear combo weights (showing up to 5) + + -0.6360 -0.2438 1.5000 -0.3140 0.2789 + + + -- cutpoint (score) + --- -1.46513 (0.647621), N = 189 moving right + --- -1.14322 (0.708205), N = 137 moving right + --- -1.03545 (0.731044), N = 128 moving right + --- 0.132143 (0.618429), N = 41 moving right + --- 0.755014 (0.618304), N = 28 moving right + + -- best stat: 0.731044, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 11 3 17 4 0 + + + -- linear combo weights (showing up to 5) + + 1.0798 11.1390 0.2057 0.4964 -0.1796 + + + -- cutpoint (score) + --- -0.331962 (0.604082), N = 223 moving right + --- 0.786098 (0.740345), N = 114 moving right + --- 0.890069 (0.739266), N = 101 moving right + --- 1.09477 (0.72604), N = 79 moving right + --- 1.31371 (0.724192), N = 69 moving right + + -- best stat: 0.740345, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 3.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 3.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 1.1000e+02 9.7826e-01 2.1885e-02 + 1.4000e+02 9.7464e-01 2.5589e-02 + 1.8600e+02 9.6377e-01 3.6741e-02 + + +------------ Growing tree 192 -------------- + +- N obs inbag: 276 +- N row inbag: 173 +- max nodes: 225 +- max leaves: 113 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 1 7 10 12 0 + + + -- linear combo weights (showing up to 5) + + 0.3974 7.2607 -0.3935 0.1439 0.0242 + + + -- cutpoint (score) + --- -0.908545 (0.511307), N = 262 moving right + --- -0.68364 (0.543464), N = 248 moving right + --- -0.276752 (0.60907), N = 183 moving right + --- -0.103811 (0.624153), N = 168 moving right + --- 8.53959 (0.552904), N = 8 moving right + + -- best stat: 0.624153, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 14 10 6 12 8 + + + -- linear combo weights (showing up to 5) + + -0.1160 -0.4042 0.6621 0.1519 1.5422 + + + -- cutpoint (score) + --- -1.36146 (0.511697), N = 261 moving right + --- -1.29211 (0.531254), N = 251 moving right + --- -0.942076 (0.606793), N = 212 moving right + --- -0.0981908 (0.718367), N = 104 moving right + --- 0.258674 (0.728176), N = 76 moving right + + -- best stat: 0.728176, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 14 0 12 13 17 + + + -- linear combo weights (showing up to 5) + + 0.1678 -0.1130 0.0942 0.2371 0.6874 + + + -- cutpoint (score) + --- 1.3439 (0.627457), N = 215 moving right + --- 1.62588 (0.63347), N = 194 moving right + --- 2.16997 (0.649333), N = 129 moving right + --- 2.27955 (0.6567), N = 117 moving right + --- 2.62598 (0.610712), N = 56 moving right + + -- best stat: 0.6567, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 4.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 3.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.3400e+02 1.0000e+00 1.0000e+00 + 3.8800e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.7000e+01 9.9275e-01 7.2596e-03 + 1.1000e+02 9.7826e-01 2.1858e-02 + 1.3100e+02 9.7464e-01 2.5562e-02 + 1.4000e+02 9.6377e-01 3.6714e-02 + + +------------ Growing tree 193 -------------- + +- N obs inbag: 276 +- N row inbag: 179 +- max nodes: 249 +- max leaves: 125 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 10 7 9 6 1 + + + -- linear combo weights (showing up to 5) + + -0.5291 8.4108 0.4884 0.6010 0.1680 + + + -- cutpoint (score) + --- -1.03755 (0.527365), N = 263 moving right + --- -0.451373 (0.625147), N = 211 moving right + --- -0.325273 (0.663884), N = 184 moving right + --- -0.293091 (0.671757), N = 179 moving right + --- 0.138762 (0.708934), N = 108 moving right + + -- best stat: 0.708934, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 1 5 9 12 7 + + + -- linear combo weights (showing up to 5) + + 0.2279 0.6034 0.5361 0.1083 8.4433 + + + -- cutpoint (score) + --- -0.411729 (0.554577), N = 250 moving right + --- -0.239709 (0.603716), N = 214 moving right + --- 0.585466 (0.638269), N = 62 moving right + --- 0.865469 (0.623417), N = 35 moving right + --- 1.03034 (0.62549), N = 30 moving right + + -- best stat: 0.638269, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 15 7 17 2 14 + + + -- linear combo weights (showing up to 5) + + 0.0358 8.7394 0.5914 0.2844 0.3725 + + + -- cutpoint (score) + --- 1.78727 (0.64753), N = 189 moving right + --- 2.20963 (0.67904), N = 126 moving right + --- 2.34947 (0.65506), N = 99 moving right + --- 2.38552 (0.652987), N = 90 moving right + --- 11.0678 (0.565892), N = 10 moving right + + -- best stat: 0.67904, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 3.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.1000e+01 9.8913e-01 1.0909e-02 + 7.7000e+01 9.8188e-01 1.8235e-02 + 1.3100e+02 9.7101e-01 2.9305e-02 + + +------------ Growing tree 194 -------------- + +- N obs inbag: 276 +- N row inbag: 165 +- max nodes: 259 +- max leaves: 130 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 2 16 10 8 5 + + + -- linear combo weights (showing up to 5) + + -0.3143 0.4838 -0.5697 1.3727 0.1034 + + + -- cutpoint (score) + --- -1.78161 (0.555018), N = 246 moving right + --- -1.62015 (0.590866), N = 228 moving right + --- -1.4395 (0.631341), N = 210 moving right + --- -1.22833 (0.672129), N = 183 moving right + --- -0.996019 (0.708977), N = 165 moving right + + -- best stat: 0.708977, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 5 2 15 16 3 + + + -- linear combo weights (showing up to 5) + + 0.4284 -0.1893 0.1067 0.7524 5.0856 + + + -- cutpoint (score) + --- -0.809132 (0.560898), N = 233 moving right + --- -0.697717 (0.589475), N = 208 moving right + --- -0.65417 (0.580851), N = 203 moving right + --- -0.233978 (0.651333), N = 133 moving right + --- 0.25421 (0.694806), N = 72 moving right + + -- best stat: 0.694806, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 17 15 4 6 1 + + + -- linear combo weights (showing up to 5) + + 0.4840 0.1141 0.8243 1.3538 0.1864 + + + -- cutpoint (score) + --- 0.825763 (0.531693), N = 256 moving right + --- 1.10557 (0.587279), N = 228 moving right + --- 1.22703 (0.61174), N = 217 moving right + --- 1.64605 (0.689063), N = 164 moving right + --- 2.70865 (0.672227), N = 61 moving right + + -- best stat: 0.689063, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + 3.3400e+02 1.0000e+00 4.0000e+00 + 3.8800e+02 1.0000e+00 2.0000e+00 + 4.6000e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.1000e+01 9.8551e-01 1.4559e-02 + 1.7900e+02 9.8188e-01 1.8235e-02 + 1.9100e+02 9.7826e-01 2.1926e-02 + + +------------ Growing tree 195 -------------- + +- N obs inbag: 276 +- N row inbag: 168 +- max nodes: 207 +- max leaves: 104 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 11 14 9 2 6 + + + -- linear combo weights (showing up to 5) + + 1.0147 0.1484 0.0501 0.0372 0.8722 + + + -- cutpoint (score) + --- -0.752214 (0.598165), N = 226 moving right + --- 0.0423713 (0.710512), N = 112 moving right + --- 0.114508 (0.71931), N = 105 moving right + --- 0.118721 (0.722329), N = 104 moving right + --- 0.198883 (0.736088), N = 89 moving right + + -- best stat: 0.736088, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 17 10 12 2 15 + + + -- linear combo weights (showing up to 5) + + 0.6217 -0.7712 0.1699 -0.7279 -0.0481 + + + -- cutpoint (score) + --- 0.0365224 (0.587939), N = 232 moving right + --- 0.165975 (0.598961), N = 229 moving right + --- 1.44563 (0.693897), N = 106 moving right + --- 1.48753 (0.674498), N = 103 moving right + --- 2.66805 (0.634623), N = 33 moving right + + -- best stat: 0.693897, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 8 15 5 16 0 + + + -- linear combo weights (showing up to 5) + + 1.9724 -0.2627 0.4837 0.4644 -0.1397 + + + -- cutpoint (score) + --- -1.2278 (0.611621), N = 208 moving right + --- 0.433771 (0.757406), N = 81 moving right + --- 0.578564 (0.758459), N = 71 moving right + --- 0.797882 (0.742687), N = 60 moving right + --- 3.24577 (0.628422), N = 25 moving right + + -- best stat: 0.758459, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 3.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 4.0000e+00 + 3.2600e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.1000e+01 9.8551e-01 1.4559e-02 + 7.7000e+01 9.7826e-01 2.1912e-02 + 1.1000e+02 9.7464e-01 2.5616e-02 + + +------------ Growing tree 196 -------------- + +- N obs inbag: 276 +- N row inbag: 171 +- max nodes: 213 +- max leaves: 107 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 14 2 11 7 9 + + + -- linear combo weights (showing up to 5) + + 0.2621 0.1736 1.2707 15.6669 0.0222 + + + -- cutpoint (score) + --- -0.159896 (0.723246), N = 121 moving right + --- -0.0313106 (0.720031), N = 107 moving right + --- 0.06203 (0.715805), N = 97 moving right + --- 0.240596 (0.726729), N = 85 moving right + --- 1.54549 (0.706406), N = 44 moving right + + -- best stat: 0.726729, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 17 13 15 0 3 + + + -- linear combo weights (showing up to 5) + + 0.5450 0.5516 -0.0665 -0.1262 7.0966 + + + -- cutpoint (score) + --- 1.24053 (0.669511), N = 179 moving right + --- 1.70086 (0.733449), N = 128 moving right + --- 1.7953 (0.700697), N = 109 moving right + --- 2.29561 (0.681569), N = 55 moving right + --- 3.49777 (0.622619), N = 23 moving right + + -- best stat: 0.733449, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 13 17 1 2 14 + + + -- linear combo weights (showing up to 5) + + 0.5511 0.5543 0.5239 -0.7377 0.2618 + + + -- cutpoint (score) + --- 0.467808 (0.675798), N = 187 moving right + --- 0.526773 (0.6853), N = 177 moving right + --- 2.18299 (0.645972), N = 47 moving right + --- 2.30544 (0.621424), N = 37 moving right + --- 2.59439 (0.549695), N = 15 moving right + + -- best stat: 0.6853, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 5.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.8188e-01 1.8222e-02 + 1.1000e+02 9.7826e-01 2.1912e-02 + 1.3100e+02 9.7464e-01 2.5616e-02 + + +------------ Growing tree 197 -------------- + +- N obs inbag: 276 +- N row inbag: 172 +- max nodes: 207 +- max leaves: 104 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 10 15 5 2 17 + + + -- linear combo weights (showing up to 5) + + -0.6978 -0.0062 0.7131 -0.7498 0.4209 + + + -- cutpoint (score) + --- 0.243938 (0.61106), N = 187 moving right + --- 0.263 (0.615414), N = 184 moving right + --- 1.28831 (0.683489), N = 78 moving right + --- 1.47773 (0.655658), N = 61 moving right + --- 3.24696 (0.550683), N = 8 moving right + + -- best stat: 0.683489, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 7 4 5 13 17 + + + -- linear combo weights (showing up to 5) + + 2.3535 -0.0127 0.5344 0.5022 0.5375 + + + -- cutpoint (score) + --- 1.10149 (0.61183), N = 221 moving right + --- 1.90623 (0.687025), N = 122 moving right + --- 1.99605 (0.691331), N = 108 moving right + --- 2.27283 (0.722073), N = 69 moving right + --- 3.00109 (0.580703), N = 21 moving right + + -- best stat: 0.722073, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 9 4 5 8 6 + + + -- linear combo weights (showing up to 5) + + -0.1275 -0.0174 0.7395 1.8088 2.7973 + + + -- cutpoint (score) + --- -0.678372 (0.695083), N = 155 moving right + --- -0.656442 (0.700712), N = 150 moving right + --- 0.746473 (0.744732), N = 67 moving right + --- 0.949179 (0.711921), N = 51 moving right + --- 4.92281 (0.576686), N = 14 moving right + + -- best stat: 0.744732, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 7.1000e+01 9.8551e-01 1.4546e-02 + 1.1000e+02 9.8188e-01 1.8222e-02 + 1.3100e+02 9.7826e-01 2.1912e-02 + 1.4000e+02 9.7101e-01 2.9320e-02 + + +------------ Growing tree 198 -------------- + +- N obs inbag: 276 +- N row inbag: 175 +- max nodes: 215 +- max leaves: 108 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 11 1 6 3 9 + + + -- linear combo weights (showing up to 5) + + 1.0207 0.3511 0.1813 3.1264 0.0746 + + + -- cutpoint (score) + --- -0.943858 (0.58778), N = 236 moving right + --- -0.764161 (0.612567), N = 218 moving right + --- -0.487185 (0.687285), N = 156 moving right + --- -0.364688 (0.703825), N = 137 moving right + --- -0.233416 (0.72723), N = 118 moving right + + -- best stat: 0.72723, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 4 1 3 11 10 + + + -- linear combo weights (showing up to 5) + + 0.5295 0.3032 2.4784 0.9710 -0.3944 + + + -- cutpoint (score) + --- -1.11087 (0.560942), N = 241 moving right + --- -1.08785 (0.568811), N = 238 moving right + --- 0.698954 (0.71847), N = 65 moving right + --- 0.878344 (0.730462), N = 58 moving right + --- 4.26506 (0.539365), N = 7 moving right + + -- best stat: 0.730462, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 14 15 6 1 12 + + + -- linear combo weights (showing up to 5) + + 0.2479 -0.1642 -0.0729 0.3993 0.2548 + + + -- cutpoint (score) + --- -0.286407 (0.607485), N = 173 moving right + --- -0.15333 (0.61814), N = 149 moving right + --- 0.477032 (0.578084), N = 51 moving right + --- 0.682391 (0.527729), N = 27 moving right + --- 0.920609 (0.524408), N = 18 moving right + + -- best stat: 0.61814, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 3.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + 3.8800e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9275e-01 7.2464e-03 + 7.1000e+01 9.8551e-01 1.4546e-02 + 1.1000e+02 9.7826e-01 2.1899e-02 + 1.3100e+02 9.7101e-01 2.9306e-02 + 1.8600e+02 9.6014e-01 4.0500e-02 + + +------------ Growing tree 199 -------------- + +- N obs inbag: 276 +- N row inbag: 175 +- max nodes: 231 +- max leaves: 116 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 17 4 10 9 3 + + + -- linear combo weights (showing up to 5) + + 0.3124 -0.1068 -0.6326 0.3756 3.7579 + + + -- cutpoint (score) + --- 0.18076 (0.598357), N = 216 moving right + --- 0.368617 (0.623947), N = 192 moving right + --- 1.1615 (0.694878), N = 91 moving right + --- 1.65726 (0.698203), N = 54 moving right + --- 6.05531 (0.551624), N = 12 moving right + + -- best stat: 0.698203, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 5 2 9 17 6 + + + -- linear combo weights (showing up to 5) + + 1.2831 -0.6894 0.2510 0.4525 0.4963 + + + -- cutpoint (score) + --- 0.519304 (0.627658), N = 210 moving right + --- 1.01672 (0.65516), N = 145 moving right + --- 1.30808 (0.664476), N = 108 moving right + --- 1.37377 (0.663317), N = 104 moving right + --- 2.24426 (0.600754), N = 48 moving right + + -- best stat: 0.664476, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 6 17 14 4 1 + + + -- linear combo weights (showing up to 5) + + 0.2928 0.4591 0.3447 0.1509 0.4584 + + + -- cutpoint (score) + --- 0.739167 (0.606745), N = 217 moving right + --- 0.898164 (0.643255), N = 191 moving right + --- 1.52055 (0.69453), N = 128 moving right + --- 2.4975 (0.620468), N = 36 moving right + --- 2.62624 (0.583089), N = 29 moving right + + -- best stat: 0.69453, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 3.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 3.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.8913e-01 1.0870e-02 + 5.1000e+01 9.8188e-01 1.8196e-02 + 7.7000e+01 9.7826e-01 2.1886e-02 + 1.3100e+02 9.7101e-01 2.9293e-02 + 1.4000e+02 9.6377e-01 3.6756e-02 + + +------------ Growing tree 200 -------------- + +- N obs inbag: 276 +- N row inbag: 173 +- max nodes: 243 +- max leaves: 122 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 11 13 17 4 12 + + + -- linear combo weights (showing up to 5) + + 1.0096 0.1551 0.3519 0.2511 -0.0626 + + + -- cutpoint (score) + --- 0.750039 (0.659777), N = 171 moving right + --- 1.02333 (0.676868), N = 135 moving right + --- 1.03681 (0.689246), N = 128 moving right + --- 1.047 (0.691479), N = 126 moving right + --- 1.62604 (0.690457), N = 76 moving right + + -- best stat: 0.691479, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 2 17 14 7 4 + + + -- linear combo weights (showing up to 5) + + -0.3116 0.5896 0.5729 6.0051 -0.1795 + + + -- cutpoint (score) + --- 0.869329 (0.58973), N = 230 moving right + --- 1.24673 (0.655746), N = 185 moving right + --- 1.31455 (0.657677), N = 174 moving right + --- 2.15278 (0.617742), N = 43 moving right + --- 2.64378 (0.59062), N = 23 moving right + + -- best stat: 0.657677, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 14 1 7 12 15 + + + -- linear combo weights (showing up to 5) + + 0.5162 0.5431 6.0605 -0.0358 -0.2303 + + + -- cutpoint (score) + --- -0.990505 (0.540597), N = 248 moving right + --- 0.368932 (0.696116), N = 89 moving right + --- 0.547494 (0.668843), N = 71 moving right + --- 0.71302 (0.67331), N = 55 moving right + --- 6.93261 (0.541335), N = 6 moving right + + -- best stat: 0.696116, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 3.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.8188e-01 1.8222e-02 + 1.3100e+02 9.7464e-01 2.5602e-02 + 1.4000e+02 9.7101e-01 2.9319e-02 + + +------------ Growing tree 201 -------------- + +- N obs inbag: 276 +- N row inbag: 179 +- max nodes: 215 +- max leaves: 108 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 1 9 16 2 8 + + + -- linear combo weights (showing up to 5) + + 0.4575 -0.3666 0.1000 -0.0380 2.0206 + + + -- cutpoint (score) + --- -1.39208 (0.546534), N = 247 moving right + --- -0.50022 (0.758438), N = 125 moving right + --- -0.259975 (0.767553), N = 108 moving right + --- -0.0884426 (0.785761), N = 94 moving right + --- 1.11441 (0.677515), N = 48 moving right + + -- best stat: 0.785761, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 9 14 2 6 10 + + + -- linear combo weights (showing up to 5) + + 0.2518 0.5246 -0.4407 0.3713 -0.8722 + + + -- cutpoint (score) + --- -1.35441 (0.602491), N = 218 moving right + --- -0.742741 (0.663137), N = 158 moving right + --- -0.427312 (0.704879), N = 130 moving right + --- 0.555278 (0.656235), N = 57 moving right + --- 1.68333 (0.561793), N = 14 moving right + + -- best stat: 0.704879, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 17 10 1 4 15 + + + -- linear combo weights (showing up to 5) + + 0.4872 -0.8264 0.3545 0.4666 0.0114 + + + -- cutpoint (score) + --- 0.893831 (0.677577), N = 188 moving right + --- 1.51565 (0.718151), N = 138 moving right + --- 2.96159 (0.654883), N = 46 moving right + --- 3.36738 (0.612793), N = 31 moving right + --- 3.88988 (0.585368), N = 19 moving right + + -- best stat: 0.718151, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 3.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8551e-01 1.4532e-02 + 7.1000e+01 9.7826e-01 2.1885e-02 + 7.7000e+01 9.7464e-01 2.5589e-02 + 1.4000e+02 9.7101e-01 2.9306e-02 + + +------------ Growing tree 202 -------------- + +- N obs inbag: 276 +- N row inbag: 175 +- max nodes: 227 +- max leaves: 114 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 15 12 11 2 4 + + + -- linear combo weights (showing up to 5) + + 0.1977 -0.2530 1.0335 0.2288 0.7143 + + + -- cutpoint (score) + --- -0.140171 (0.597851), N = 215 moving right + --- -0.0231413 (0.610126), N = 201 moving right + --- 0.57535 (0.67051), N = 115 moving right + --- 0.647585 (0.66281), N = 108 moving right + --- 3.19928 (0.521243), N = 7 moving right + + -- best stat: 0.67051, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 3 15 6 4 10 + + + -- linear combo weights (showing up to 5) + + 6.6410 0.1383 0.5818 0.4057 -0.4666 + + + -- cutpoint (score) + --- -0.129809 (0.600431), N = 201 moving right + --- 0.0688902 (0.65882), N = 161 moving right + --- 0.102241 (0.667365), N = 158 moving right + --- 0.613738 (0.690946), N = 86 moving right + --- 0.737855 (0.688286), N = 62 moving right + + -- best stat: 0.690946, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 11 13 17 3 1 + + + -- linear combo weights (showing up to 5) + + 0.5756 0.5575 0.2525 7.0079 0.4113 + + + -- cutpoint (score) + --- 0.242057 (0.663274), N = 186 moving right + --- 0.389485 (0.689798), N = 168 moving right + --- 0.942997 (0.74224), N = 118 moving right + --- 1.80128 (0.709469), N = 65 moving right + --- 2.21208 (0.656965), N = 41 moving right + + -- best stat: 0.74224, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 3.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.7000e+01 9.8913e-01 1.0896e-02 + 1.3100e+02 9.8551e-01 1.4559e-02 + 1.4000e+02 9.7826e-01 2.1912e-02 + 1.7900e+02 9.7101e-01 2.9319e-02 + + +------------ Growing tree 203 -------------- + +- N obs inbag: 276 +- N row inbag: 177 +- max nodes: 197 +- max leaves: 99 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 8 0 1 10 12 + + + -- linear combo weights (showing up to 5) + + 1.5541 -0.3757 0.4944 -0.7466 -0.0782 + + + -- cutpoint (score) + --- -1.55446 (0.608213), N = 212 moving right + --- -1.09793 (0.661774), N = 170 moving right + --- -1.08168 (0.666885), N = 168 moving right + --- -1.06288 (0.677392), N = 163 moving right + --- 0.62648 (0.729838), N = 58 moving right + + -- best stat: 0.729838, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 6 1 4 14 16 + + + -- linear combo weights (showing up to 5) + + -0.3057 0.5065 0.6508 0.2837 0.4734 + + + -- cutpoint (score) + --- -0.0859128 (0.637724), N = 156 moving right + --- 0.067173 (0.660987), N = 140 moving right + --- 0.120681 (0.671844), N = 136 moving right + --- 0.383117 (0.680581), N = 104 moving right + --- 0.893027 (0.657667), N = 65 moving right + + -- best stat: 0.680581, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 14 4 1 15 17 + + + -- linear combo weights (showing up to 5) + + 0.1871 0.0257 0.5620 -0.2027 0.6834 + + + -- cutpoint (score) + --- 1.28838 (0.612866), N = 197 moving right + --- 1.56384 (0.626431), N = 170 moving right + --- 2.21017 (0.676081), N = 93 moving right + --- 3.10021 (0.68163), N = 47 moving right + --- 3.27488 (0.656007), N = 37 moving right + + -- best stat: 0.68163, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 4.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.1000e+01 9.8551e-01 1.4559e-02 + 1.3100e+02 9.8188e-01 1.8235e-02 + 1.4000e+02 9.6739e-01 3.2995e-02 + + +------------ Growing tree 204 -------------- + +- N obs inbag: 276 +- N row inbag: 176 +- max nodes: 203 +- max leaves: 102 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 13 15 12 4 2 + + + -- linear combo weights (showing up to 5) + + 0.3776 -0.1139 0.0652 1.1169 -0.8156 + + + -- cutpoint (score) + --- -1.27649 (0.546292), N = 248 moving right + --- -1.17944 (0.570591), N = 235 moving right + --- 0.1418 (0.68629), N = 99 moving right + --- 0.255027 (0.687699), N = 86 moving right + --- 1.47443 (0.495283), N = 7 moving right + + -- best stat: 0.687699, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 3 8 5 10 16 + + + -- linear combo weights (showing up to 5) + + 4.0710 1.0319 0.2288 -0.5170 0.4490 + + + -- cutpoint (score) + --- -0.377005 (0.713857), N = 125 moving right + --- 0.134178 (0.745773), N = 88 moving right + --- 0.698107 (0.710488), N = 63 moving right + --- 0.861006 (0.685228), N = 58 moving right + --- 2.2162 (0.612227), N = 25 moving right + + -- best stat: 0.745773, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 16 7 5 17 0 + + + -- linear combo weights (showing up to 5) + + 0.4329 9.3997 0.3207 0.5945 -0.3738 + + + -- cutpoint (score) + --- 1.33899 (0.656906), N = 165 moving right + --- 1.34557 (0.661827), N = 163 moving right + --- 1.67235 (0.674528), N = 123 moving right + --- 2.43864 (0.641428), N = 53 moving right + --- 2.52451 (0.655967), N = 44 moving right + + -- best stat: 0.674528, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 3.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + 3.4800e+02 1.0000e+00 3.0000e+00 + 3.8800e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.9275e-01 7.2596e-03 + 1.1000e+02 9.8913e-01 1.0909e-02 + 1.4000e+02 9.7826e-01 2.1898e-02 + 1.9800e+02 9.7464e-01 2.5602e-02 + + +------------ Growing tree 205 -------------- + +- N obs inbag: 276 +- N row inbag: 170 +- max nodes: 227 +- max leaves: 114 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 14 13 8 15 7 + + + -- linear combo weights (showing up to 5) + + 0.1842 -0.1336 1.5443 -0.1290 4.2633 + + + -- cutpoint (score) + --- -0.983749 (0.58519), N = 219 moving right + --- -0.76311 (0.643382), N = 188 moving right + --- -0.54759 (0.694876), N = 148 moving right + --- 3.71071 (0.637853), N = 29 moving right + --- 8.13264 (0.546048), N = 9 moving right + + -- best stat: 0.694876, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 6 12 11 10 9 + + + -- linear combo weights (showing up to 5) + + 0.9145 -0.1690 0.8079 -0.6967 0.2590 + + + -- cutpoint (score) + --- -0.104316 (0.692476), N = 129 moving right + --- 0.588852 (0.716074), N = 82 moving right + --- 1.3666 (0.649161), N = 41 moving right + --- 2.50542 (0.552412), N = 11 moving right + --- 2.68749 (0.522033), N = 5 moving right + + -- best stat: 0.716074, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 17 1 8 15 11 + + + -- linear combo weights (showing up to 5) + + 0.4487 0.4654 1.6084 -0.0409 0.2536 + + + -- cutpoint (score) + --- 0.383617 (0.688136), N = 178 moving right + --- 0.761836 (0.727383), N = 148 moving right + --- 1.12521 (0.754695), N = 124 moving right + --- 1.53407 (0.762289), N = 88 moving right + --- 1.70956 (0.75966), N = 79 moving right + + -- best stat: 0.762289, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 3.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + 3.3400e+02 1.0000e+00 1.0000e+00 + 3.4800e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.7000e+01 9.8551e-01 1.4532e-02 + 1.1000e+02 9.7826e-01 2.1885e-02 + 1.4000e+02 9.7464e-01 2.5589e-02 + 1.9800e+02 9.7101e-01 2.9306e-02 + + +------------ Growing tree 206 -------------- + +- N obs inbag: 276 +- N row inbag: 171 +- max nodes: 231 +- max leaves: 116 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 0 17 7 16 2 + + + -- linear combo weights (showing up to 5) + + -0.3280 0.5114 7.7292 0.4163 -0.6050 + + + -- cutpoint (score) + --- 0.0156373 (0.542786), N = 257 moving right + --- 0.625584 (0.660349), N = 164 moving right + --- 0.666874 (0.65881), N = 155 moving right + --- 1.61654 (0.640033), N = 55 moving right + --- 1.78561 (0.621367), N = 41 moving right + + -- best stat: 0.660349, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 10 4 17 9 2 + + + -- linear combo weights (showing up to 5) + + -0.7397 0.1609 0.4368 0.8274 -0.7508 + + + -- cutpoint (score) + --- -0.777674 (0.534013), N = 255 moving right + --- -0.342951 (0.591619), N = 228 moving right + --- -0.0161181 (0.642716), N = 202 moving right + --- 1.13178 (0.693571), N = 93 moving right + --- 1.33292 (0.683567), N = 67 moving right + + -- best stat: 0.693571, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 6 17 1 0 13 + + + -- linear combo weights (showing up to 5) + + 1.1392 0.5667 0.3997 -0.1588 0.6211 + + + -- cutpoint (score) + --- 1.18273 (0.644936), N = 201 moving right + --- 1.63526 (0.665318), N = 155 moving right + --- 2.76906 (0.613693), N = 37 moving right + --- 2.77869 (0.60325), N = 35 moving right + --- 2.88014 (0.573238), N = 29 moving right + + -- best stat: 0.665318, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 3.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + 3.3400e+02 1.0000e+00 2.0000e+00 + 3.4800e+02 1.0000e+00 2.0000e+00 + 3.8800e+02 1.0000e+00 2.0000e+00 + 4.0000e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 7.1000e+01 9.8913e-01 1.0896e-02 + 1.3100e+02 9.7826e-01 2.1885e-02 + 1.4000e+02 9.7101e-01 2.9292e-02 + 1.9800e+02 9.6377e-01 3.6755e-02 + + +------------ Growing tree 207 -------------- + +- N obs inbag: 276 +- N row inbag: 174 +- max nodes: 233 +- max leaves: 117 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 12 5 7 1 16 + + + -- linear combo weights (showing up to 5) + + -0.0549 0.8295 9.7564 0.3801 0.5432 + + + -- cutpoint (score) + --- 0.44337 (0.711008), N = 98 moving right + --- 0.745228 (0.729075), N = 79 moving right + --- 0.821654 (0.702923), N = 67 moving right + --- 1.01226 (0.689511), N = 58 moving right + --- 1.07527 (0.693145), N = 55 moving right + + -- best stat: 0.729075, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 17 9 5 11 7 + + + -- linear combo weights (showing up to 5) + + 0.5276 0.1193 0.6278 0.5208 10.1147 + + + -- cutpoint (score) + --- 1.15086 (0.620305), N = 213 moving right + --- 1.16202 (0.621632), N = 212 moving right + --- 1.30569 (0.682651), N = 182 moving right + --- 1.36147 (0.687959), N = 180 moving right + --- 2.44012 (0.744427), N = 72 moving right + + -- best stat: 0.744427, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 17 0 4 1 2 + + + -- linear combo weights (showing up to 5) + + 0.6167 0.0531 0.3945 0.3865 -0.5349 + + + -- cutpoint (score) + --- 0.732613 (0.575167), N = 238 moving right + --- 1.00944 (0.604912), N = 218 moving right + --- 1.24825 (0.620468), N = 204 moving right + --- 1.37092 (0.642945), N = 178 moving right + --- 1.72925 (0.682692), N = 138 moving right + + -- best stat: 0.682692, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 3.0400e+02 1.0000e+00 3.0000e+00 + 3.2600e+02 1.0000e+00 3.0000e+00 + 3.3400e+02 1.0000e+00 1.0000e+00 + 3.8800e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.7000e+01 9.9275e-01 7.2596e-03 + 1.1000e+02 9.8913e-01 1.0909e-02 + 1.3100e+02 9.8551e-01 1.4572e-02 + 2.1600e+02 9.8188e-01 1.8249e-02 + + +------------ Growing tree 208 -------------- + +- N obs inbag: 276 +- N row inbag: 185 +- max nodes: 217 +- max leaves: 109 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 12 2 8 15 7 + + + -- linear combo weights (showing up to 5) + + 0.1394 -0.4605 1.7013 -0.2407 10.7897 + + + -- cutpoint (score) + --- -1.76804 (0.531317), N = 263 moving right + --- -1.61069 (0.574371), N = 245 moving right + --- -1.43665 (0.615469), N = 216 moving right + --- -1.40853 (0.620739), N = 212 moving right + --- -1.30553 (0.653413), N = 193 moving right + + -- best stat: 0.653413, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 13 12 10 15 17 + + + -- linear combo weights (showing up to 5) + + 0.4901 0.1534 -0.7669 -0.1636 0.3689 + + + -- cutpoint (score) + --- -0.579081 (0.546487), N = 257 moving right + --- -0.124742 (0.575729), N = 242 moving right + --- 0.138362 (0.611078), N = 225 moving right + --- 0.705822 (0.668523), N = 168 moving right + --- 1.36254 (0.675968), N = 99 moving right + + -- best stat: 0.675968, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 3 1 7 6 4 + + + -- linear combo weights (showing up to 5) + + 4.1674 0.2273 13.2202 0.5556 1.1075 + + + -- cutpoint (score) + --- -0.00421829 (0.62978), N = 206 moving right + --- 0.0488311 (0.646587), N = 195 moving right + --- 1.03653 (0.67988), N = 97 moving right + --- 1.74459 (0.611118), N = 22 moving right + --- 14.4168 (0.54505), N = 7 moving right + + -- best stat: 0.67988, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.7000e+01 9.9275e-01 7.2596e-03 + 1.3100e+02 9.8551e-01 1.4559e-02 + 1.7900e+02 9.8188e-01 1.8235e-02 + 1.8600e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 209 -------------- + +- N obs inbag: 276 +- N row inbag: 183 +- max nodes: 205 +- max leaves: 103 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 13 17 8 1 10 + + + -- linear combo weights (showing up to 5) + + 0.0217 0.5599 1.9114 0.3251 -0.4036 + + + -- cutpoint (score) + --- -0.301402 (0.551058), N = 240 moving right + --- 0.0454776 (0.592902), N = 216 moving right + --- 0.197268 (0.613195), N = 208 moving right + --- 0.71854 (0.68305), N = 161 moving right + --- 1.81758 (0.774694), N = 76 moving right + + -- best stat: 0.774694, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 13 12 8 15 11 + + + -- linear combo weights (showing up to 5) + + -0.0745 0.1152 2.0638 -0.1621 0.2242 + + + -- cutpoint (score) + --- -1.38801 (0.577855), N = 222 moving right + --- -1.254 (0.628155), N = 193 moving right + --- -1.18793 (0.663147), N = 177 moving right + --- -1.11339 (0.701565), N = 160 moving right + --- -0.802099 (0.733674), N = 128 moving right + + -- best stat: 0.733674, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 10 6 4 13 11 + + + -- linear combo weights (showing up to 5) + + -0.5138 0.8869 0.5003 0.2653 0.6764 + + + -- cutpoint (score) + --- -0.876898 (0.564262), N = 230 moving right + --- 0.218926 (0.714487), N = 116 moving right + --- 0.270634 (0.715571), N = 111 moving right + --- 0.581465 (0.731181), N = 88 moving right + --- 1.60448 (0.70098), N = 47 moving right + + -- best stat: 0.731181, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 3.3400e+02 1.0000e+00 1.0000e+00 + 3.4800e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.1000e+01 9.8551e-01 1.4559e-02 + 7.7000e+01 9.8188e-01 1.8235e-02 + 1.7900e+02 9.7826e-01 2.1926e-02 + + +------------ Growing tree 210 -------------- + +- N obs inbag: 276 +- N row inbag: 167 +- max nodes: 227 +- max leaves: 114 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 7 15 10 5 6 + + + -- linear combo weights (showing up to 5) + + 6.9862 0.0814 -0.5420 0.5319 0.7944 + + + -- cutpoint (score) + --- -0.83945 (0.492607), N = 263 moving right + --- -0.216339 (0.601582), N = 209 moving right + --- -0.07433 (0.621837), N = 182 moving right + --- 0.15121 (0.651597), N = 133 moving right + --- 8.49657 (0.535207), N = 6 moving right + + -- best stat: 0.651597, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 1 2 10 9 16 + + + -- linear combo weights (showing up to 5) + + -0.0183 -0.9822 -0.7444 0.5875 0.3674 + + + -- cutpoint (score) + --- -2.39016 (0.509009), N = 255 moving right + --- -2.23329 (0.533654), N = 244 moving right + --- -1.3201 (0.646171), N = 177 moving right + --- -1.29794 (0.661993), N = 170 moving right + --- 0.213633 (0.644721), N = 39 moving right + + -- best stat: 0.661993, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 12 1 16 4 17 + + + -- linear combo weights (showing up to 5) + + 0.1879 0.0951 0.2991 0.4593 0.4165 + + + -- cutpoint (score) + --- 0.870312 (0.603343), N = 210 moving right + --- 0.87747 (0.595245), N = 207 moving right + --- 0.933602 (0.613594), N = 194 moving right + --- 1.45661 (0.68173), N = 142 moving right + --- 2.4179 (0.587665), N = 31 moving right + + -- best stat: 0.68173, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 3.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 3.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.8913e-01 1.0870e-02 + 7.1000e+01 9.8188e-01 1.8196e-02 + 7.7000e+01 9.7464e-01 2.5576e-02 + 1.1000e+02 9.6377e-01 3.6728e-02 + 1.3100e+02 9.6014e-01 4.0487e-02 + + +------------ Growing tree 211 -------------- + +- N obs inbag: 276 +- N row inbag: 169 +- max nodes: 211 +- max leaves: 106 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 1 2 16 14 17 + + + -- linear combo weights (showing up to 5) + + 0.2516 -0.6735 0.2618 0.4665 0.5126 + + + -- cutpoint (score) + --- 0.500018 (0.644959), N = 190 moving right + --- 0.714804 (0.657679), N = 156 moving right + --- 1.56466 (0.657721), N = 58 moving right + --- 1.99586 (0.628492), N = 38 moving right + --- 2.0435 (0.61609), N = 33 moving right + + -- best stat: 0.657721, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 14 12 1 9 2 + + + -- linear combo weights (showing up to 5) + + 0.2132 0.0373 0.4681 1.0053 -0.7748 + + + -- cutpoint (score) + --- -1.68444 (0.553653), N = 237 moving right + --- -1.4585 (0.580025), N = 206 moving right + --- -0.836663 (0.633254), N = 113 moving right + --- -0.590967 (0.667584), N = 87 moving right + --- 0.47223 (0.581929), N = 29 moving right + + -- best stat: 0.667584, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 7 11 6 12 4 + + + -- linear combo weights (showing up to 5) + + 8.9814 1.0693 0.8413 -0.1222 0.3126 + + + -- cutpoint (score) + --- -0.456527 (0.657552), N = 195 moving right + --- -0.454968 (0.661933), N = 193 moving right + --- 0.262493 (0.74164), N = 98 moving right + --- 0.900763 (0.717131), N = 64 moving right + --- 1.97781 (0.67169), N = 38 moving right + + -- best stat: 0.74164, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 3.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.8551e-01 1.4559e-02 + 1.1000e+02 9.7464e-01 2.5588e-02 + 1.4000e+02 9.7101e-01 2.9306e-02 + + +------------ Growing tree 212 -------------- + +- N obs inbag: 276 +- N row inbag: 175 +- max nodes: 201 +- max leaves: 101 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 12 6 0 3 17 + + + -- linear combo weights (showing up to 5) + + 0.2596 0.4295 0.2250 7.4128 0.1941 + + + -- cutpoint (score) + --- 0.476629 (0.580029), N = 209 moving right + --- 0.707192 (0.658122), N = 133 moving right + --- 0.73247 (0.660373), N = 118 moving right + --- 0.77284 (0.677072), N = 105 moving right + --- 8.15496 (0.605167), N = 19 moving right + + -- best stat: 0.677072, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 11 13 0 10 7 + + + -- linear combo weights (showing up to 5) + + 0.8965 0.1122 -0.2488 -0.5126 4.3231 + + + -- cutpoint (score) + --- -1.33964 (0.562992), N = 246 moving right + --- -1.2779 (0.584215), N = 237 moving right + --- -0.624826 (0.670253), N = 171 moving right + --- 0.743665 (0.725683), N = 49 moving right + --- 5.94466 (0.563105), N = 10 moving right + + -- best stat: 0.725683, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 17 14 9 5 2 + + + -- linear combo weights (showing up to 5) + + 0.3866 0.4418 0.4187 0.8620 -0.9014 + + + -- cutpoint (score) + --- -0.16574 (0.626862), N = 213 moving right + --- 0.854656 (0.706779), N = 108 moving right + --- 0.911222 (0.708872), N = 101 moving right + --- 1.11861 (0.626885), N = 72 moving right + --- 1.20865 (0.622586), N = 59 moving right + + -- best stat: 0.708872, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 7.7000e+01 9.9638e-01 3.6232e-03 + 1.1000e+02 9.8913e-01 1.0896e-02 + 1.3100e+02 9.8551e-01 1.4559e-02 + 1.4000e+02 9.7826e-01 2.1912e-02 + 1.7900e+02 9.7101e-01 2.9319e-02 + + +------------ Growing tree 213 -------------- + +- N obs inbag: 276 +- N row inbag: 171 +- max nodes: 233 +- max leaves: 117 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 1 4 5 6 14 + + + -- linear combo weights (showing up to 5) + + 0.5636 0.6511 1.2429 0.6246 0.5073 + + + -- cutpoint (score) + --- -0.512806 (0.570277), N = 238 moving right + --- 0.0230181 (0.636604), N = 198 moving right + --- 0.451029 (0.681297), N = 168 moving right + --- 0.564947 (0.700485), N = 146 moving right + --- 1.09739 (0.718651), N = 114 moving right + + -- best stat: 0.718651, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 8 0 16 3 17 + + + -- linear combo weights (showing up to 5) + + 1.1802 -0.2447 0.3274 4.3407 0.5319 + + + -- cutpoint (score) + --- 0.789272 (0.663291), N = 188 moving right + --- 1.62669 (0.75809), N = 99 moving right + --- 2.25939 (0.737037), N = 57 moving right + --- 6.75322 (0.585977), N = 18 moving right + --- 9.80823 (0.533625), N = 5 moving right + + -- best stat: 0.75809, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 9 16 0 2 10 + + + -- linear combo weights (showing up to 5) + + 0.2144 0.8059 -0.1592 -0.5324 -0.7404 + + + -- cutpoint (score) + --- -1.63065 (0.577455), N = 222 moving right + --- -1.44796 (0.613867), N = 200 moving right + --- -0.311274 (0.713157), N = 98 moving right + --- 0.179251 (0.71019), N = 64 moving right + --- 1.05659 (0.620644), N = 35 moving right + + -- best stat: 0.713157, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 3.0000e+00 + 7.1000e+01 1.0000e+00 4.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 4.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.8913e-01 1.0870e-02 + 7.1000e+01 9.7464e-01 2.5522e-02 + 7.7000e+01 9.7101e-01 2.9239e-02 + 1.1000e+02 9.5652e-01 4.4164e-02 + 1.3100e+02 9.4928e-01 5.1740e-02 + + +------------ Growing tree 214 -------------- + +- N obs inbag: 276 +- N row inbag: 174 +- max nodes: 229 +- max leaves: 115 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 9 10 14 12 16 + + + -- linear combo weights (showing up to 5) + + 0.3070 -0.5746 0.5080 0.0130 0.5219 + + + -- cutpoint (score) + --- -1.47977 (0.522768), N = 265 moving right + --- -1.29371 (0.542735), N = 256 moving right + --- -0.830804 (0.599594), N = 216 moving right + --- -0.391698 (0.656717), N = 162 moving right + --- 0.601776 (0.673539), N = 67 moving right + + -- best stat: 0.673539, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 0 2 11 12 7 + + + -- linear combo weights (showing up to 5) + + 0.0047 -0.6892 0.3685 -0.0084 9.3504 + + + -- cutpoint (score) + --- -1.01667 (0.533847), N = 256 moving right + --- -0.96712 (0.569988), N = 236 moving right + --- -0.887357 (0.667208), N = 179 moving right + --- -0.72871 (0.734659), N = 117 moving right + --- 0.456252 (0.61388), N = 30 moving right + + -- best stat: 0.734659, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 11 0 10 14 8 + + + -- linear combo weights (showing up to 5) + + 0.2556 -0.1309 -0.4359 -0.1281 1.8532 + + + -- cutpoint (score) + --- -1.35307 (0.626258), N = 212 moving right + --- -1.12502 (0.682325), N = 180 moving right + --- -0.796117 (0.751116), N = 144 moving right + --- -0.607284 (0.762378), N = 118 moving right + --- 0.395416 (0.719399), N = 75 moving right + + -- best stat: 0.762378, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 3.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 3.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9275e-01 7.2464e-03 + 7.1000e+01 9.8551e-01 1.4546e-02 + 7.7000e+01 9.7826e-01 2.1899e-02 + 1.1000e+02 9.6739e-01 3.3010e-02 + 1.4000e+02 9.6377e-01 3.6755e-02 + + +------------ Growing tree 215 -------------- + +- N obs inbag: 276 +- N row inbag: 167 +- max nodes: 233 +- max leaves: 117 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 9 17 12 11 13 + + + -- linear combo weights (showing up to 5) + + -0.0288 0.5399 -0.1258 1.1276 0.2397 + + + -- cutpoint (score) + --- 0.445349 (0.587666), N = 232 moving right + --- 0.591804 (0.602476), N = 220 moving right + --- 0.707712 (0.62711), N = 207 moving right + --- 1.57713 (0.714714), N = 119 moving right + --- 1.70095 (0.708115), N = 107 moving right + + -- best stat: 0.714714, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 2 17 15 5 14 + + + -- linear combo weights (showing up to 5) + + -0.9964 0.7064 0.0315 0.4767 0.5450 + + + -- cutpoint (score) + --- 0.669732 (0.612573), N = 220 moving right + --- 0.995113 (0.665529), N = 181 moving right + --- 1.50546 (0.705182), N = 129 moving right + --- 1.8326 (0.702501), N = 91 moving right + --- 2.11301 (0.679563), N = 69 moving right + + -- best stat: 0.705182, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 7 12 16 11 10 + + + -- linear combo weights (showing up to 5) + + 7.9961 -0.0826 0.2152 0.9832 -0.4797 + + + -- cutpoint (score) + --- -1.23288 (0.53603), N = 249 moving right + --- -0.674387 (0.643135), N = 186 moving right + --- -0.0724041 (0.749214), N = 109 moving right + --- 0.0843242 (0.740877), N = 95 moving right + --- 0.14937 (0.735263), N = 91 moving right + + -- best stat: 0.749214, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 4.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 3.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8188e-01 1.8169e-02 + 7.1000e+01 9.7464e-01 2.5549e-02 + 7.7000e+01 9.6377e-01 3.6701e-02 + 1.1000e+02 9.5652e-01 4.4220e-02 + + +------------ Growing tree 216 -------------- + +- N obs inbag: 276 +- N row inbag: 175 +- max nodes: 237 +- max leaves: 119 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 2 5 17 16 13 + + + -- linear combo weights (showing up to 5) + + -0.2069 0.3574 0.5106 0.5183 0.4363 + + + -- cutpoint (score) + --- 0.453296 (0.573594), N = 236 moving right + --- 0.881568 (0.63712), N = 194 moving right + --- 1.22331 (0.674727), N = 166 moving right + --- 2.16167 (0.671657), N = 76 moving right + --- 3.16863 (0.572698), N = 17 moving right + + -- best stat: 0.674727, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 6 8 5 0 4 + + + -- linear combo weights (showing up to 5) + + -0.1044 1.9954 0.2263 -0.2638 0.2014 + + + -- cutpoint (score) + --- -1.40599 (0.550576), N = 254 moving right + --- -1.31925 (0.564765), N = 248 moving right + --- -1.24792 (0.575749), N = 239 moving right + --- -1.11782 (0.627508), N = 213 moving right + --- -1.07446 (0.634602), N = 209 moving right + + -- best stat: 0.634602, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 0 2 9 6 4 + + + -- linear combo weights (showing up to 5) + + -0.1979 -0.4897 0.3378 0.3466 0.8093 + + + -- cutpoint (score) + --- -0.735417 (0.55418), N = 225 moving right + --- -0.520282 (0.615875), N = 191 moving right + --- -0.449244 (0.625753), N = 187 moving right + --- 0.412782 (0.580555), N = 56 moving right + --- 0.55738 (0.569571), N = 33 moving right + + -- best stat: 0.625753, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 3.0000e+00 + 5.1000e+01 1.0000e+00 3.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 3.0000e+00 + 2.6400e+02 1.0000e+00 4.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.8913e-01 1.0870e-02 + 5.1000e+01 9.7826e-01 2.1859e-02 + 7.1000e+01 9.7464e-01 2.5562e-02 + 7.7000e+01 9.6739e-01 3.2997e-02 + 1.1000e+02 9.6377e-01 3.6743e-02 + + +------------ Growing tree 217 -------------- + +- N obs inbag: 276 +- N row inbag: 170 +- max nodes: 213 +- max leaves: 107 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 7 8 9 12 1 + + + -- linear combo weights (showing up to 5) + + 7.3360 1.4958 -0.1287 -0.0062 0.3930 + + + -- cutpoint (score) + --- -0.766456 (0.622907), N = 195 moving right + --- -0.702986 (0.666284), N = 176 moving right + --- -0.365748 (0.76297), N = 124 moving right + --- 0.952223 (0.677388), N = 52 moving right + --- 1.11503 (0.6796), N = 51 moving right + + -- best stat: 0.76297, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 1 3 17 6 4 + + + -- linear combo weights (showing up to 5) + + 0.3706 5.5795 0.4631 0.2773 0.1763 + + + -- cutpoint (score) + --- 1.12526 (0.611065), N = 205 moving right + --- 1.30544 (0.635031), N = 178 moving right + --- 1.31855 (0.638327), N = 175 moving right + --- 1.84441 (0.72855), N = 106 moving right + --- 2.62093 (0.628199), N = 24 moving right + + -- best stat: 0.72855, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 9 8 11 15 10 + + + -- linear combo weights (showing up to 5) + + -0.4077 1.7027 0.4719 -0.2915 -0.4416 + + + -- cutpoint (score) + --- -1.90317 (0.51876), N = 258 moving right + --- -0.858592 (0.718227), N = 162 moving right + --- -0.762708 (0.699293), N = 154 moving right + --- -0.391728 (0.725145), N = 126 moving right + --- -0.236935 (0.732931), N = 114 moving right + + -- best stat: 0.732931, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 3.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 3.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8551e-01 1.4546e-02 + 7.1000e+01 9.7464e-01 2.5575e-02 + 7.7000e+01 9.7101e-01 2.9293e-02 + 1.1000e+02 9.6739e-01 3.3024e-02 + + +------------ Growing tree 218 -------------- + +- N obs inbag: 276 +- N row inbag: 176 +- max nodes: 241 +- max leaves: 121 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 4 12 1 10 14 + + + -- linear combo weights (showing up to 5) + + 1.2042 -0.1499 0.2290 -0.7234 0.3029 + + + -- cutpoint (score) + --- -1.46908 (0.514307), N = 266 moving right + --- -1.01043 (0.546514), N = 250 moving right + --- -0.650587 (0.601948), N = 222 moving right + --- -0.603259 (0.621762), N = 214 moving right + --- 0.0600867 (0.693479), N = 171 moving right + + -- best stat: 0.693479, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 16 8 4 13 7 + + + -- linear combo weights (showing up to 5) + + 0.2817 0.9603 0.6888 0.1623 6.0498 + + + -- cutpoint (score) + --- -0.689918 (0.608213), N = 214 moving right + --- -0.232772 (0.702478), N = 161 moving right + --- 0.379508 (0.764297), N = 107 moving right + --- 0.692019 (0.746259), N = 84 moving right + --- 1.5211 (0.687413), N = 49 moving right + + -- best stat: 0.764297, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 3 0 7 11 4 + + + -- linear combo weights (showing up to 5) + + 8.1764 0.0361 1.8327 0.6981 0.8113 + + + -- cutpoint (score) + --- -0.436606 (0.608553), N = 220 moving right + --- 0.441249 (0.747017), N = 132 moving right + --- 0.441436 (0.750848), N = 131 moving right + --- 2.88173 (0.617332), N = 25 moving right + --- 3.27271 (0.622481), N = 23 moving right + + -- best stat: 0.750848, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 3.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 3.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 3.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9275e-01 7.2464e-03 + 1.1000e+02 9.8188e-01 1.8195e-02 + 1.3100e+02 9.7464e-01 2.5575e-02 + 1.7900e+02 9.7101e-01 2.9293e-02 + 1.8600e+02 9.6739e-01 3.3024e-02 + + +------------ Growing tree 219 -------------- + +- N obs inbag: 276 +- N row inbag: 174 +- max nodes: 219 +- max leaves: 110 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 2 8 13 9 3 + + + -- linear combo weights (showing up to 5) + + -0.1174 1.7144 0.2007 -0.4017 8.2139 + + + -- cutpoint (score) + --- -0.814976 (0.684889), N = 162 moving right + --- -0.458114 (0.726789), N = 121 moving right + --- -0.13142 (0.751626), N = 94 moving right + --- -0.101127 (0.759994), N = 90 moving right + --- 9.01996 (0.580118), N = 15 moving right + + -- best stat: 0.759994, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 10 8 12 3 13 + + + -- linear combo weights (showing up to 5) + + -0.4974 1.4348 0.0937 7.7607 0.0260 + + + -- cutpoint (score) + --- -1.62927 (0.51248), N = 268 moving right + --- -1.09518 (0.586235), N = 228 moving right + --- -0.87241 (0.658047), N = 193 moving right + --- -0.619112 (0.705409), N = 155 moving right + --- -0.269123 (0.747207), N = 115 moving right + + -- best stat: 0.747207, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 10 9 15 14 8 + + + -- linear combo weights (showing up to 5) + + -0.8137 -0.5785 -0.2281 -0.0548 2.2166 + + + -- cutpoint (score) + --- 0.132944 (0.74107), N = 89 moving right + --- 0.779179 (0.706003), N = 57 moving right + --- 0.99471 (0.696673), N = 42 moving right + --- 2.35562 (0.660911), N = 32 moving right + --- 4.38645 (0.599288), N = 18 moving right + + -- best stat: 0.74107, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 3.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8551e-01 1.4546e-02 + 7.7000e+01 9.8188e-01 1.8222e-02 + 1.1000e+02 9.7826e-01 2.1912e-02 + 1.3100e+02 9.7464e-01 2.5616e-02 + + +------------ Growing tree 220 -------------- + +- N obs inbag: 276 +- N row inbag: 178 +- max nodes: 213 +- max leaves: 107 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 5 2 17 9 8 + + + -- linear combo weights (showing up to 5) + + 0.1286 -0.2528 0.2803 -0.6202 2.6785 + + + -- cutpoint (score) + --- -0.423892 (0.707954), N = 162 moving right + --- -0.1779 (0.726725), N = 143 moving right + --- 1.03009 (0.709366), N = 64 moving right + --- 1.30211 (0.705369), N = 51 moving right + --- 3.7813 (0.612885), N = 23 moving right + + -- best stat: 0.726725, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 11 15 14 16 13 + + + -- linear combo weights (showing up to 5) + + 0.8484 0.0558 0.2123 0.8551 0.1941 + + + -- cutpoint (score) + --- -0.813659 (0.671923), N = 172 moving right + --- -0.029927 (0.752078), N = 102 moving right + --- 0.220135 (0.720819), N = 87 moving right + --- 0.856553 (0.685584), N = 60 moving right + --- 2.18306 (0.551044), N = 18 moving right + + -- best stat: 0.752078, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 14 7 17 15 5 + + + -- linear combo weights (showing up to 5) + + 0.4599 4.2995 0.5662 0.0932 0.0702 + + + -- cutpoint (score) + --- 0.779172 (0.543368), N = 254 moving right + --- 1.1937 (0.5965), N = 222 moving right + --- 1.9393 (0.696659), N = 116 moving right + --- 2.24827 (0.654524), N = 59 moving right + --- 6.32823 (0.55522), N = 8 moving right + + -- best stat: 0.696659, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 4.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.1000e+01 9.8913e-01 1.0909e-02 + 7.7000e+01 9.8551e-01 1.4572e-02 + 1.1000e+02 9.8188e-01 1.8249e-02 + + +------------ Growing tree 221 -------------- + +- N obs inbag: 276 +- N row inbag: 178 +- max nodes: 233 +- max leaves: 117 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 8 13 7 12 9 + + + -- linear combo weights (showing up to 5) + + 1.4221 0.1115 5.0268 0.0546 -0.4191 + + + -- cutpoint (score) + --- -0.690313 (0.63959), N = 189 moving right + --- -0.65561 (0.659443), N = 177 moving right + --- -0.420955 (0.734974), N = 131 moving right + --- 0.804956 (0.683439), N = 48 moving right + --- 6.49567 (0.536125), N = 8 moving right + + -- best stat: 0.734974, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 1 13 12 7 9 + + + -- linear combo weights (showing up to 5) + + 0.6264 0.3700 0.1292 6.9741 0.0388 + + + -- cutpoint (score) + --- -0.788806 (0.564939), N = 244 moving right + --- -0.0545157 (0.647145), N = 158 moving right + --- 0.53304 (0.651325), N = 73 moving right + --- 0.569122 (0.640508), N = 64 moving right + --- 0.994387 (0.604552), N = 32 moving right + + -- best stat: 0.651325, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 13 7 2 16 0 + + + -- linear combo weights (showing up to 5) + + 0.3325 6.4833 -0.5205 0.4565 -0.1239 + + + -- cutpoint (score) + --- -1.00002 (0.622155), N = 205 moving right + --- -0.792148 (0.688069), N = 164 moving right + --- -0.754228 (0.691913), N = 158 moving right + --- -0.560766 (0.694181), N = 139 moving right + --- 0.169681 (0.622361), N = 53 moving right + + -- best stat: 0.694181, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 3.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.7000e+01 9.9275e-01 7.2596e-03 + 1.1000e+02 9.8551e-01 1.4559e-02 + 1.4000e+02 9.7826e-01 2.1912e-02 + 1.7900e+02 9.7101e-01 2.9319e-02 + + +------------ Growing tree 222 -------------- + +- N obs inbag: 276 +- N row inbag: 180 +- max nodes: 201 +- max leaves: 101 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 11 8 0 5 1 + + + -- linear combo weights (showing up to 5) + + 0.8222 1.5344 0.2315 0.6202 0.5463 + + + -- cutpoint (score) + --- -1.45826 (0.558505), N = 236 moving right + --- -1.41117 (0.573649), N = 229 moving right + --- -1.15945 (0.626123), N = 204 moving right + --- 0.0521813 (0.768863), N = 101 moving right + --- 2.03432 (0.62839), N = 31 moving right + + -- best stat: 0.768863, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 12 11 9 0 15 + + + -- linear combo weights (showing up to 5) + + -0.0049 1.2564 0.2000 0.1880 -0.1755 + + + -- cutpoint (score) + --- -1.00201 (0.545959), N = 239 moving right + --- -0.820347 (0.601933), N = 210 moving right + --- -0.720547 (0.62029), N = 192 moving right + --- 1.49256 (0.627333), N = 32 moving right + --- 2.4215 (0.550339), N = 14 moving right + + -- best stat: 0.627333, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 8 0 17 4 15 + + + -- linear combo weights (showing up to 5) + + 1.9765 -0.1754 0.5320 -0.3989 -0.2939 + + + -- cutpoint (score) + --- -0.342072 (0.566847), N = 244 moving right + --- -0.182727 (0.590773), N = 231 moving right + --- 0.487433 (0.680049), N = 150 moving right + --- 0.707112 (0.71027), N = 130 moving right + --- 4.93347 (0.560992), N = 11 moving right + + -- best stat: 0.71027, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 4.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 7.7000e+01 9.9275e-01 7.2464e-03 + 1.1000e+02 9.7826e-01 2.1845e-02 + 1.7900e+02 9.7464e-01 2.5549e-02 + 1.9800e+02 9.7101e-01 2.9266e-02 + 2.1600e+02 9.6377e-01 3.6729e-02 + + +------------ Growing tree 223 -------------- + +- N obs inbag: 276 +- N row inbag: 179 +- max nodes: 229 +- max leaves: 115 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 11 4 13 1 15 + + + -- linear combo weights (showing up to 5) + + 1.4272 0.2495 0.3082 0.5497 -0.0048 + + + -- cutpoint (score) + --- -1.5058 (0.561635), N = 248 moving right + --- -1.44205 (0.564867), N = 247 moving right + --- -1.39071 (0.570365), N = 244 moving right + --- -0.959022 (0.633399), N = 206 moving right + --- 1.40606 (0.68802), N = 52 moving right + + -- best stat: 0.68802, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 3 10 7 16 9 + + + -- linear combo weights (showing up to 5) + + 6.2837 -0.3498 2.5402 0.2997 0.9933 + + + -- cutpoint (score) + --- -0.687125 (0.601576), N = 218 moving right + --- -0.649795 (0.616709), N = 210 moving right + --- -0.515173 (0.641222), N = 191 moving right + --- 0.144838 (0.718759), N = 82 moving right + --- 3.09495 (0.610227), N = 21 moving right + + -- best stat: 0.718759, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 8 14 6 3 17 + + + -- linear combo weights (showing up to 5) + + 1.8775 -0.2101 0.5933 7.2230 0.1327 + + + -- cutpoint (score) + --- -0.91368 (0.504315), N = 270 moving right + --- -0.567854 (0.625025), N = 210 moving right + --- -0.385082 (0.696217), N = 161 moving right + --- 0.103556 (0.752276), N = 105 moving right + --- 0.595701 (0.732217), N = 72 moving right + + -- best stat: 0.752276, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.9275e-01 7.2596e-03 + 7.7000e+01 9.8551e-01 1.4559e-02 + 1.3100e+02 9.7826e-01 2.1912e-02 + 1.8600e+02 9.7464e-01 2.5615e-02 + + +------------ Growing tree 224 -------------- + +- N obs inbag: 276 +- N row inbag: 178 +- max nodes: 209 +- max leaves: 105 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 7 0 11 13 2 + + + -- linear combo weights (showing up to 5) + + 11.0088 -0.1990 0.9509 0.3721 0.1622 + + + -- cutpoint (score) + --- -0.244576 (0.706409), N = 138 moving right + --- 0.634344 (0.721712), N = 80 moving right + --- 0.677533 (0.728817), N = 76 moving right + --- 0.694235 (0.731104), N = 71 moving right + --- 11.4533 (0.571536), N = 12 moving right + + -- best stat: 0.731104, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 8 17 5 14 10 + + + -- linear combo weights (showing up to 5) + + 1.5963 0.3880 0.5066 -0.1436 -0.4674 + + + -- cutpoint (score) + --- -0.0619709 (0.608862), N = 216 moving right + --- 0.583602 (0.686308), N = 153 moving right + --- 1.25679 (0.751468), N = 102 moving right + --- 1.59934 (0.726732), N = 72 moving right + --- 1.76053 (0.707967), N = 66 moving right + + -- best stat: 0.751468, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 2 10 6 16 13 + + + -- linear combo weights (showing up to 5) + + -0.6618 -0.7552 0.0691 0.7145 0.7197 + + + -- cutpoint (score) + --- -1.20449 (0.662746), N = 170 moving right + --- -0.110221 (0.711712), N = 92 moving right + --- -0.100797 (0.717866), N = 89 moving right + --- 0.614802 (0.704364), N = 52 moving right + --- 0.965121 (0.632545), N = 33 moving right + + -- best stat: 0.717866, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 3.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 3.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8551e-01 1.4532e-02 + 7.7000e+01 9.8188e-01 1.8209e-02 + 1.1000e+02 9.7826e-01 2.1899e-02 + 1.3100e+02 9.6739e-01 3.3010e-02 + + +------------ Growing tree 225 -------------- + +- N obs inbag: 276 +- N row inbag: 170 +- max nodes: 201 +- max leaves: 101 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 11 2 17 3 7 + + + -- linear combo weights (showing up to 5) + + 1.1402 0.3879 0.3039 2.3235 5.9940 + + + -- cutpoint (score) + --- 0.527553 (0.669521), N = 194 moving right + --- 0.947702 (0.739278), N = 128 moving right + --- 1.14759 (0.743571), N = 108 moving right + --- 1.16051 (0.745469), N = 107 moving right + --- 3.91873 (0.62957), N = 25 moving right + + -- best stat: 0.745469, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 2 8 14 0 17 + + + -- linear combo weights (showing up to 5) + + -0.0357 1.7467 0.1759 -0.2528 0.3432 + + + -- cutpoint (score) + --- 0.26474 (0.699553), N = 142 moving right + --- 0.344837 (0.708478), N = 134 moving right + --- 0.623697 (0.740385), N = 97 moving right + --- 1.56845 (0.644077), N = 53 moving right + --- 7.83772 (0.535839), N = 5 moving right + + -- best stat: 0.740385, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 0 2 7 8 15 + + + -- linear combo weights (showing up to 5) + + -0.2711 -0.1828 6.4450 1.5463 0.0252 + + + -- cutpoint (score) + --- -1.27583 (0.565079), N = 245 moving right + --- -0.978461 (0.701202), N = 160 moving right + --- -0.528628 (0.766507), N = 105 moving right + --- 0.559841 (0.686944), N = 55 moving right + --- 8.97872 (0.535341), N = 6 moving right + + -- best stat: 0.766507, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 3.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 3.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 7.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.8551e-01 1.4559e-02 + 1.3100e+02 9.7464e-01 2.5588e-02 + 1.4000e+02 9.6739e-01 3.3023e-02 + + +------------ Growing tree 226 -------------- + +- N obs inbag: 276 +- N row inbag: 161 +- max nodes: 205 +- max leaves: 103 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 3 8 1 10 17 + + + -- linear combo weights (showing up to 5) + + 1.0408 2.0786 0.1693 -0.3933 0.0999 + + + -- cutpoint (score) + --- -0.757579 (0.689087), N = 169 moving right + --- -0.547466 (0.725248), N = 147 moving right + --- 0.22756 (0.741446), N = 81 moving right + --- 0.667117 (0.735759), N = 68 moving right + --- 1.13839 (0.701972), N = 55 moving right + + -- best stat: 0.741446, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 0 9 2 14 8 + + + -- linear combo weights (showing up to 5) + + -0.2156 -0.4582 -0.1574 -0.1069 2.6183 + + + -- cutpoint (score) + --- -1.66177 (0.565005), N = 237 moving right + --- -1.14176 (0.746917), N = 119 moving right + --- -0.973981 (0.758866), N = 103 moving right + --- 0.693351 (0.652637), N = 44 moving right + --- 6.31095 (0.575755), N = 11 moving right + + -- best stat: 0.758866, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 13 15 7 4 8 + + + -- linear combo weights (showing up to 5) + + 0.3315 -0.0701 10.9429 0.0372 1.8155 + + + -- cutpoint (score) + --- -1.53182 (0.518741), N = 264 moving right + --- -1.4262 (0.548471), N = 250 moving right + --- -1.1133 (0.632481), N = 199 moving right + --- -0.907027 (0.716778), N = 152 moving right + --- 0.00435325 (0.719513), N = 79 moving right + + -- best stat: 0.719513, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 3.0000e+00 + 1.3100e+02 1.0000e+00 3.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.9275e-01 7.2596e-03 + 7.7000e+01 9.8188e-01 1.8208e-02 + 1.3100e+02 9.7101e-01 2.9279e-02 + 1.7900e+02 9.6377e-01 3.6741e-02 + + +------------ Growing tree 227 -------------- + +- N obs inbag: 276 +- N row inbag: 173 +- max nodes: 217 +- max leaves: 109 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 12 16 14 10 7 + + + -- linear combo weights (showing up to 5) + + 0.0843 0.3882 0.4440 -0.5269 9.1889 + + + -- cutpoint (score) + --- -1.20214 (0.521798), N = 260 moving right + --- -0.852742 (0.547017), N = 235 moving right + --- -0.709828 (0.569696), N = 217 moving right + --- -0.374592 (0.665697), N = 172 moving right + --- -0.141537 (0.692309), N = 124 moving right + + -- best stat: 0.692309, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 3 13 8 6 17 + + + -- linear combo weights (showing up to 5) + + 5.4870 0.0043 1.0221 -0.4538 0.3456 + + + -- cutpoint (score) + --- 0.582997 (0.666557), N = 162 moving right + --- 0.797046 (0.701836), N = 137 moving right + --- 0.949403 (0.727485), N = 104 moving right + --- 2.53297 (0.691838), N = 43 moving right + --- 4.29226 (0.64771), N = 30 moving right + + -- best stat: 0.727485, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 7 16 13 0 2 + + + -- linear combo weights (showing up to 5) + + 9.6589 0.4419 0.3381 -0.0365 -0.9106 + + + -- cutpoint (score) + --- -1.2197 (0.663505), N = 180 moving right + --- -0.788548 (0.703106), N = 109 moving right + --- 0.0353564 (0.626383), N = 31 moving right + --- 1.14732 (0.595755), N = 18 moving right + --- 9.4725 (0.536528), N = 7 moving right + + -- best stat: 0.703106, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 3.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.1000e+01 9.8551e-01 1.4559e-02 + 1.1000e+02 9.8188e-01 1.8235e-02 + 1.7900e+02 9.7464e-01 2.5615e-02 + + +------------ Growing tree 228 -------------- + +- N obs inbag: 276 +- N row inbag: 174 +- max nodes: 237 +- max leaves: 119 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 14 8 16 6 12 + + + -- linear combo weights (showing up to 5) + + -0.0254 1.3970 0.4899 0.4887 -0.1027 + + + -- cutpoint (score) + --- -1.06708 (0.552984), N = 236 moving right + --- -0.318908 (0.734939), N = 127 moving right + --- 0.0104103 (0.74433), N = 99 moving right + --- 0.623254 (0.716641), N = 65 moving right + --- 1.06221 (0.681493), N = 50 moving right + + -- best stat: 0.74433, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 8 5 13 6 0 + + + -- linear combo weights (showing up to 5) + + 1.3910 0.6244 -0.0030 0.5369 -0.0964 + + + -- cutpoint (score) + --- -0.867451 (0.566255), N = 243 moving right + --- -0.823307 (0.60637), N = 221 moving right + --- 0.191765 (0.711695), N = 109 moving right + --- 1.3104 (0.648737), N = 50 moving right + --- 2.06335 (0.612081), N = 30 moving right + + -- best stat: 0.711695, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 16 3 0 11 6 + + + -- linear combo weights (showing up to 5) + + 0.4861 4.3932 0.1190 0.5699 0.5613 + + + -- cutpoint (score) + --- -0.573019 (0.573373), N = 221 moving right + --- -0.343847 (0.639749), N = 180 moving right + --- -0.211286 (0.684891), N = 153 moving right + --- 0.0112384 (0.70156), N = 124 moving right + --- 1.25087 (0.684248), N = 51 moving right + + -- best stat: 0.70156, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 3.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.7000e+01 9.8913e-01 1.0909e-02 + 1.3100e+02 9.8551e-01 1.4572e-02 + 1.4000e+02 9.8188e-01 1.8249e-02 + + +------------ Growing tree 229 -------------- + +- N obs inbag: 276 +- N row inbag: 178 +- max nodes: 227 +- max leaves: 114 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 13 7 2 6 10 + + + -- linear combo weights (showing up to 5) + + 0.4295 10.9425 -0.8008 1.1233 -0.5727 + + + -- cutpoint (score) + --- -2.01166 (0.51436), N = 266 moving right + --- -1.22131 (0.606485), N = 213 moving right + --- 0.0437855 (0.699165), N = 64 moving right + --- 0.195065 (0.673058), N = 53 moving right + --- 11.2864 (0.554641), N = 9 moving right + + -- best stat: 0.699165, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 4 8 14 5 3 + + + -- linear combo weights (showing up to 5) + + 0.4957 1.5496 -0.1537 0.1486 5.8371 + + + -- cutpoint (score) + --- -0.893575 (0.550547), N = 249 moving right + --- -0.65608 (0.652341), N = 200 moving right + --- -0.627557 (0.644482), N = 198 moving right + --- -0.477662 (0.685278), N = 181 moving right + --- 0.680069 (0.743129), N = 76 moving right + + -- best stat: 0.743129, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 1 5 6 10 0 + + + -- linear combo weights (showing up to 5) + + 0.4867 0.9965 0.5950 -0.7896 0.0421 + + + -- cutpoint (score) + --- -1.40003 (0.516067), N = 262 moving right + --- -0.329116 (0.593503), N = 214 moving right + --- 1.25309 (0.675197), N = 67 moving right + --- 1.42639 (0.667956), N = 55 moving right + --- 1.53099 (0.650325), N = 47 moving right + + -- best stat: 0.675197, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 3.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.1000e+01 9.8188e-01 1.8222e-02 + 7.7000e+01 9.7464e-01 2.5602e-02 + 1.7900e+02 9.6377e-01 3.6755e-02 + + +------------ Growing tree 230 -------------- + +- N obs inbag: 276 +- N row inbag: 168 +- max nodes: 247 +- max leaves: 124 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 11 14 13 6 9 + + + -- linear combo weights (showing up to 5) + + 1.0604 0.1403 0.1485 0.8533 0.0310 + + + -- cutpoint (score) + --- -0.796188 (0.60251), N = 224 moving right + --- -0.557682 (0.66342), N = 175 moving right + --- -0.362131 (0.672299), N = 160 moving right + --- -0.118961 (0.668185), N = 123 moving right + --- 0.952194 (0.609437), N = 40 moving right + + -- best stat: 0.672299, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 8 11 3 15 17 + + + -- linear combo weights (showing up to 5) + + 0.9896 0.5051 9.8550 -0.2446 0.3732 + + + -- cutpoint (score) + --- -0.160362 (0.586034), N = 237 moving right + --- 0.304382 (0.656578), N = 195 moving right + --- 0.767022 (0.711905), N = 152 moving right + --- 0.78595 (0.722798), N = 147 moving right + --- 1.78917 (0.729389), N = 64 moving right + + -- best stat: 0.729389, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 6 9 17 4 7 + + + -- linear combo weights (showing up to 5) + + 1.3373 0.3438 0.6635 -0.2511 3.7616 + + + -- cutpoint (score) + --- 1.63803 (0.653975), N = 194 moving right + --- 1.83199 (0.693372), N = 165 moving right + --- 1.87521 (0.707539), N = 157 moving right + --- 3.4529 (0.639892), N = 34 moving right + --- 6.04259 (0.538242), N = 5 moving right + + -- best stat: 0.707539, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 4.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 4.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.8551e-01 1.4559e-02 + 1.3100e+02 9.8188e-01 1.8235e-02 + 1.4000e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 231 -------------- + +- N obs inbag: 276 +- N row inbag: 173 +- max nodes: 207 +- max leaves: 104 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 8 17 7 12 6 + + + -- linear combo weights (showing up to 5) + + 1.5620 0.1167 5.2781 0.1084 -0.0792 + + + -- cutpoint (score) + --- -0.543626 (0.638772), N = 198 moving right + --- -0.426148 (0.683347), N = 178 moving right + --- -0.349644 (0.682263), N = 165 moving right + --- 0.22806 (0.73817), N = 90 moving right + --- 0.3436 (0.733035), N = 82 moving right + + -- best stat: 0.73817, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 5 15 14 3 16 + + + -- linear combo weights (showing up to 5) + + 0.4476 0.0109 0.3086 3.4602 0.3151 + + + -- cutpoint (score) + --- -0.181763 (0.606171), N = 198 moving right + --- -0.0585425 (0.651985), N = 143 moving right + --- 0.166666 (0.65577), N = 100 moving right + --- 0.283935 (0.66916), N = 86 moving right + --- 0.354246 (0.662897), N = 77 moving right + + -- best stat: 0.66916, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 0 3 2 17 8 + + + -- linear combo weights (showing up to 5) + + 0.2748 3.3591 -0.1551 0.0478 1.5569 + + + -- cutpoint (score) + --- -1.03236 (0.506197), N = 271 moving right + --- -1.01843 (0.510579), N = 269 moving right + --- -0.719853 (0.61602), N = 197 moving right + --- 0.0584047 (0.743194), N = 91 moving right + --- 2.74076 (0.606967), N = 25 moving right + + -- best stat: 0.743194, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + 3.8800e+02 1.0000e+00 3.0000e+00 + 4.0000e+02 1.0000e+00 2.0000e+00 + 5.1500e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 1.7900e+02 9.9638e-01 3.6232e-03 + 1.9100e+02 9.8913e-01 1.0896e-02 + 1.9800e+02 9.8188e-01 1.8222e-02 + 2.6400e+02 9.7826e-01 2.1912e-02 + 3.0400e+02 9.7101e-01 2.9319e-02 + + +------------ Growing tree 232 -------------- + +- N obs inbag: 276 +- N row inbag: 173 +- max nodes: 211 +- max leaves: 106 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 7 12 17 13 9 + + + -- linear combo weights (showing up to 5) + + 9.0149 0.0555 0.6621 0.0955 0.4671 + + + -- cutpoint (score) + --- 1.76824 (0.666416), N = 163 moving right + --- 2.36224 (0.714948), N = 81 moving right + --- 2.6074 (0.646154), N = 40 moving right + --- 11.2717 (0.565403), N = 12 moving right + --- 11.3332 (0.542801), N = 9 moving right + + -- best stat: 0.714948, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 11 8 4 2 9 + + + -- linear combo weights (showing up to 5) + + 0.3971 1.9629 0.7664 0.1838 -0.2624 + + + -- cutpoint (score) + --- -1.01407 (0.615523), N = 205 moving right + --- -0.243857 (0.727505), N = 134 moving right + --- -0.0136321 (0.750322), N = 109 moving right + --- 0.262868 (0.740985), N = 94 moving right + --- 2.39333 (0.626363), N = 28 moving right + + -- best stat: 0.750322, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 8 5 13 2 16 + + + -- linear combo weights (showing up to 5) + + 2.1330 -0.0759 -0.1047 0.1362 0.5786 + + + -- cutpoint (score) + --- -1.38342 (0.584678), N = 228 moving right + --- -1.0941 (0.64991), N = 175 moving right + --- -1.04253 (0.671332), N = 165 moving right + --- -0.688086 (0.743754), N = 119 moving right + --- -0.574493 (0.739804), N = 111 moving right + + -- best stat: 0.743754, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + 3.3400e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 1.1000e+02 9.9275e-01 7.2596e-03 + 1.7900e+02 9.8551e-01 1.4559e-02 + 1.8600e+02 9.7826e-01 2.1912e-02 + 1.9100e+02 9.7464e-01 2.5615e-02 + + +------------ Growing tree 233 -------------- + +- N obs inbag: 276 +- N row inbag: 176 +- max nodes: 239 +- max leaves: 120 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 12 0 7 8 5 + + + -- linear combo weights (showing up to 5) + + 0.0265 -0.1459 11.2189 1.3743 0.2981 + + + -- cutpoint (score) + --- -0.863008 (0.596377), N = 224 moving right + --- -0.436596 (0.723932), N = 124 moving right + --- -0.409855 (0.72704), N = 122 moving right + --- 1.00024 (0.665828), N = 40 moving right + --- 1.24805 (0.650191), N = 33 moving right + + -- best stat: 0.72704, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 7 6 16 1 2 + + + -- linear combo weights (showing up to 5) + + 13.2878 1.0604 0.2512 0.2963 -1.6894 + + + -- cutpoint (score) + --- -1.84944 (0.628223), N = 180 moving right + --- -1.59863 (0.676087), N = 125 moving right + --- -1.5258 (0.67664), N = 107 moving right + --- -0.227297 (0.626354), N = 44 moving right + --- 0.737096 (0.59405), N = 16 moving right + + -- best stat: 0.67664, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 11 17 7 1 15 + + + -- linear combo weights (showing up to 5) + + 1.1696 0.2673 11.4895 0.2924 -0.1004 + + + -- cutpoint (score) + --- -0.620972 (0.547826), N = 254 moving right + --- 0.0707241 (0.683066), N = 161 moving right + --- 0.335706 (0.706217), N = 136 moving right + --- 0.552891 (0.727975), N = 116 moving right + --- 2.24433 (0.675953), N = 40 moving right + + -- best stat: 0.727975, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 3.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 3.0000e+00 + 3.3400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 7.1000e+01 9.9638e-01 3.6232e-03 + 1.1000e+02 9.9275e-01 7.2596e-03 + 1.4000e+02 9.8551e-01 1.4559e-02 + 1.7900e+02 9.8188e-01 1.8235e-02 + 1.9800e+02 9.7101e-01 2.9305e-02 + + +------------ Growing tree 234 -------------- + +- N obs inbag: 276 +- N row inbag: 172 +- max nodes: 235 +- max leaves: 118 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 8 14 15 5 9 + + + -- linear combo weights (showing up to 5) + + 1.6806 0.1438 -0.2507 0.5356 -0.2517 + + + -- cutpoint (score) + --- -0.835621 (0.620591), N = 206 moving right + --- -0.53234 (0.699459), N = 156 moving right + --- 0.117692 (0.743053), N = 97 moving right + --- 1.13919 (0.671081), N = 46 moving right + --- 2.54752 (0.614813), N = 25 moving right + + -- best stat: 0.743053, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 14 4 6 10 15 + + + -- linear combo weights (showing up to 5) + + 0.5299 0.8202 -0.4258 -0.8596 -0.2610 + + + -- cutpoint (score) + --- -0.444709 (0.621364), N = 204 moving right + --- -0.356415 (0.641788), N = 197 moving right + --- 0.35245 (0.719883), N = 134 moving right + --- 0.95339 (0.717137), N = 88 moving right + --- 1.5046 (0.678954), N = 51 moving right + + -- best stat: 0.719883, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 4 3 10 5 6 + + + -- linear combo weights (showing up to 5) + + 0.8202 4.4874 -0.6122 0.4269 -0.1245 + + + -- cutpoint (score) + --- -0.851738 (0.522906), N = 260 moving right + --- -0.12581 (0.641116), N = 197 moving right + --- -0.065316 (0.652101), N = 192 moving right + --- 0.951508 (0.701168), N = 88 moving right + --- 1.20507 (0.68109), N = 67 moving right + + -- best stat: 0.701168, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 4.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.8551e-01 1.4493e-02 + 7.1000e+01 9.7826e-01 2.1846e-02 + 7.7000e+01 9.7464e-01 2.5549e-02 + 1.1000e+02 9.7101e-01 2.9267e-02 + 1.4000e+02 9.6739e-01 3.2998e-02 + + +------------ Growing tree 235 -------------- + +- N obs inbag: 276 +- N row inbag: 177 +- max nodes: 217 +- max leaves: 109 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 12 0 3 8 10 + + + -- linear combo weights (showing up to 5) + + -0.0571 0.0308 3.1115 2.1959 -0.4980 + + + -- cutpoint (score) + --- -1.33903 (0.604308), N = 205 moving right + --- -1.32667 (0.613886), N = 200 moving right + --- -1.05632 (0.696037), N = 159 moving right + --- -0.877634 (0.727176), N = 139 moving right + --- -0.616296 (0.739179), N = 121 moving right + + -- best stat: 0.739179, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 5 13 0 8 14 + + + -- linear combo weights (showing up to 5) + + 0.7264 0.1279 -0.0333 2.4265 -0.1686 + + + -- cutpoint (score) + --- -1.37499 (0.586858), N = 223 moving right + --- -1.33217 (0.604555), N = 212 moving right + --- -0.506492 (0.738192), N = 113 moving right + --- 0.493523 (0.716467), N = 80 moving right + --- 1.77277 (0.649813), N = 31 moving right + + -- best stat: 0.738192, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 6 2 4 10 7 + + + -- linear combo weights (showing up to 5) + + 0.4687 -0.7254 0.5720 -0.7697 6.7116 + + + -- cutpoint (score) + --- -0.595487 (0.660932), N = 168 moving right + --- -0.446265 (0.678916), N = 152 moving right + --- -0.156559 (0.705554), N = 107 moving right + --- 0.518401 (0.654622), N = 42 moving right + --- 7.92117 (0.548937), N = 7 moving right + + -- best stat: 0.705554, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 3.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.1000e+01 9.8551e-01 1.4559e-02 + 1.1000e+02 9.8188e-01 1.8235e-02 + 1.3100e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 236 -------------- + +- N obs inbag: 276 +- N row inbag: 173 +- max nodes: 253 +- max leaves: 127 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 11 8 15 0 12 + + + -- linear combo weights (showing up to 5) + + 0.4356 1.4819 -0.0567 0.1883 -0.0281 + + + -- cutpoint (score) + --- -1.00553 (0.606178), N = 214 moving right + --- -0.635749 (0.718966), N = 148 moving right + --- -0.0566772 (0.738891), N = 97 moving right + --- 0.0693244 (0.736887), N = 94 moving right + --- 1.55375 (0.617316), N = 40 moving right + + -- best stat: 0.738891, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 7 17 9 15 13 + + + -- linear combo weights (showing up to 5) + + 5.1332 0.5701 0.5884 -0.0091 0.2318 + + + -- cutpoint (score) + --- 0.753943 (0.581801), N = 236 moving right + --- 1.11943 (0.609068), N = 213 moving right + --- 2.0032 (0.686977), N = 94 moving right + --- 2.13047 (0.650056), N = 74 moving right + --- 2.27871 (0.64466), N = 49 moving right + + -- best stat: 0.686977, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 4 9 17 7 12 + + + -- linear combo weights (showing up to 5) + + 0.2789 0.6882 0.5152 5.1709 0.1005 + + + -- cutpoint (score) + --- 1.00172 (0.599337), N = 223 moving right + --- 1.84164 (0.680907), N = 118 moving right + --- 1.95754 (0.665067), N = 99 moving right + --- 2.07965 (0.669827), N = 79 moving right + --- 2.14686 (0.672255), N = 71 moving right + + -- best stat: 0.680907, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 3.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + 3.0400e+02 1.0000e+00 3.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 7.7000e+01 9.9638e-01 3.6232e-03 + 1.1000e+02 9.9275e-01 7.2596e-03 + 1.3100e+02 9.8913e-01 1.0909e-02 + 1.4000e+02 9.8551e-01 1.4572e-02 + 1.8600e+02 9.8188e-01 1.8249e-02 + + +------------ Growing tree 237 -------------- + +- N obs inbag: 276 +- N row inbag: 174 +- max nodes: 243 +- max leaves: 122 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 10 3 2 9 5 + + + -- linear combo weights (showing up to 5) + + -0.7245 6.3964 -0.6921 0.2430 0.6686 + + + -- cutpoint (score) + --- -0.959705 (0.634792), N = 207 moving right + --- -0.787483 (0.682943), N = 183 moving right + --- -0.764759 (0.689451), N = 178 moving right + --- -0.264103 (0.719197), N = 119 moving right + --- 1.6097 (0.645153), N = 33 moving right + + -- best stat: 0.719197, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 9 11 8 14 4 + + + -- linear combo weights (showing up to 5) + + -0.3546 0.6189 1.3942 -0.1014 0.1595 + + + -- cutpoint (score) + --- -1.20202 (0.520402), N = 265 moving right + --- -1.18029 (0.527449), N = 262 moving right + --- -1.0307 (0.584305), N = 223 moving right + --- -0.863602 (0.641799), N = 189 moving right + --- -0.857518 (0.650204), N = 185 moving right + + -- best stat: 0.650204, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 13 8 9 10 1 + + + -- linear combo weights (showing up to 5) + + 0.2473 1.3104 -0.4105 -0.8087 0.3748 + + + -- cutpoint (score) + --- -1.02309 (0.622255), N = 203 moving right + --- -0.731716 (0.667592), N = 169 moving right + --- 0.464033 (0.746726), N = 85 moving right + --- 0.631594 (0.737164), N = 73 moving right + --- 4.89368 (0.560269), N = 12 moving right + + -- best stat: 0.746726, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 3.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 3.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.8913e-01 1.0870e-02 + 5.1000e+01 9.8188e-01 1.8196e-02 + 7.1000e+01 9.7464e-01 2.5576e-02 + 1.1000e+02 9.6739e-01 3.3011e-02 + 1.4000e+02 9.5652e-01 4.4247e-02 + + +------------ Growing tree 238 -------------- + +- N obs inbag: 276 +- N row inbag: 172 +- max nodes: 215 +- max leaves: 108 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 13 11 7 12 6 + + + -- linear combo weights (showing up to 5) + + 0.3037 0.4879 6.9951 0.0174 1.2912 + + + -- cutpoint (score) + --- -0.361725 (0.636131), N = 192 moving right + --- -0.257482 (0.675034), N = 174 moving right + --- -0.0283215 (0.68024), N = 114 moving right + --- 0.303732 (0.715156), N = 86 moving right + --- 1.62511 (0.62859), N = 33 moving right + + -- best stat: 0.715156, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 6 15 13 12 17 + + + -- linear combo weights (showing up to 5) + + 1.0651 -0.1104 0.4266 0.0937 0.6244 + + + -- cutpoint (score) + --- 1.21443 (0.614995), N = 215 moving right + --- 1.92696 (0.700074), N = 140 moving right + --- 2.1615 (0.661605), N = 114 moving right + --- 2.88477 (0.570576), N = 32 moving right + --- 3.36108 (0.549172), N = 12 moving right + + -- best stat: 0.700074, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 15 13 3 4 9 + + + -- linear combo weights (showing up to 5) + + -0.0826 0.3659 9.9157 0.8229 0.2417 + + + -- cutpoint (score) + --- -0.587055 (0.531073), N = 259 moving right + --- -0.194155 (0.619148), N = 207 moving right + --- 0.588709 (0.724887), N = 126 moving right + --- 0.942204 (0.694806), N = 71 moving right + --- 10.9718 (0.538552), N = 6 moving right + + -- best stat: 0.724887, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 4.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 3.0000e+00 + 1.7900e+02 1.0000e+00 3.0000e+00 + 1.9100e+02 1.0000e+00 4.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 3.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.8551e-01 1.4493e-02 + 7.1000e+01 9.8188e-01 1.8169e-02 + 1.3100e+02 9.7101e-01 2.9239e-02 + 1.7900e+02 9.6014e-01 4.0433e-02 + 1.9100e+02 9.4565e-01 5.5528e-02 + + +------------ Growing tree 239 -------------- + +- N obs inbag: 276 +- N row inbag: 172 +- max nodes: 237 +- max leaves: 119 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 2 3 4 13 0 + + + -- linear combo weights (showing up to 5) + + -0.0453 4.9695 0.3314 0.4423 0.0378 + + + -- cutpoint (score) + --- -0.398353 (0.550234), N = 244 moving right + --- 0.0932705 (0.641869), N = 148 moving right + --- 0.16551 (0.654807), N = 131 moving right + --- 0.356176 (0.663358), N = 104 moving right + --- 0.66137 (0.630529), N = 64 moving right + + -- best stat: 0.663358, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 16 15 17 9 7 + + + -- linear combo weights (showing up to 5) + + 0.5123 0.0626 0.2620 0.6558 9.4575 + + + -- cutpoint (score) + --- 0.176909 (0.610637), N = 206 moving right + --- 0.29756 (0.631701), N = 186 moving right + --- 0.435677 (0.673648), N = 162 moving right + --- 1.01263 (0.723255), N = 84 moving right + --- 3.08733 (0.602147), N = 22 moving right + + -- best stat: 0.723255, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 3 0 6 17 13 + + + -- linear combo weights (showing up to 5) + + 4.6548 0.1304 1.4072 0.2275 0.4949 + + + -- cutpoint (score) + --- 0.0083183 (0.54132), N = 254 moving right + --- 0.311437 (0.588845), N = 224 moving right + --- 0.365538 (0.592181), N = 217 moving right + --- 1.79923 (0.636836), N = 47 moving right + --- 4.99087 (0.59681), N = 17 moving right + + -- best stat: 0.636836, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 3.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 3.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.1000e+01 9.8551e-01 1.4559e-02 + 7.7000e+01 9.8188e-01 1.8235e-02 + 1.4000e+02 9.7101e-01 2.9305e-02 + + +------------ Growing tree 240 -------------- + +- N obs inbag: 276 +- N row inbag: 176 +- max nodes: 209 +- max leaves: 105 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 1 6 16 11 4 + + + -- linear combo weights (showing up to 5) + + 0.1489 0.3474 1.0177 0.8861 0.3941 + + + -- cutpoint (score) + --- -0.845823 (0.638028), N = 197 moving right + --- -0.778279 (0.659067), N = 188 moving right + --- -0.388286 (0.714274), N = 152 moving right + --- -0.276958 (0.732428), N = 141 moving right + --- 2.55355 (0.618579), N = 23 moving right + + -- best stat: 0.732428, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 17 13 0 15 12 + + + -- linear combo weights (showing up to 5) + + 0.7106 0.2895 -0.3862 -0.1604 0.0611 + + + -- cutpoint (score) + --- 1.08668 (0.588611), N = 226 moving right + --- 1.17241 (0.605917), N = 217 moving right + --- 1.67788 (0.670986), N = 174 moving right + --- 1.83404 (0.680191), N = 158 moving right + --- 2.70514 (0.64456), N = 55 moving right + + -- best stat: 0.680191, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 7 15 3 4 6 + + + -- linear combo weights (showing up to 5) + + 12.8285 0.0031 3.9725 0.9121 1.2456 + + + -- cutpoint (score) + --- -0.0019793 (0.510774), N = 256 moving right + --- -0.000430122 (0.540551), N = 227 moving right + --- 0.00246616 (0.613277), N = 181 moving right + --- 0.91124 (0.643775), N = 109 moving right + --- 0.914608 (0.662036), N = 54 moving right + + -- best stat: 0.662036, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 3.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.1000e+01 9.8913e-01 1.0909e-02 + 7.7000e+01 9.7826e-01 2.1898e-02 + 1.1000e+02 9.7101e-01 2.9306e-02 + + +------------ Growing tree 241 -------------- + +- N obs inbag: 276 +- N row inbag: 173 +- max nodes: 203 +- max leaves: 102 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 10 9 6 7 5 + + + -- linear combo weights (showing up to 5) + + -0.3344 0.1658 1.4726 11.2771 1.1808 + + + -- cutpoint (score) + --- -0.194182 (0.618029), N = 202 moving right + --- 0.0103177 (0.70313), N = 151 moving right + --- 0.464863 (0.696992), N = 102 moving right + --- 0.886314 (0.699272), N = 83 moving right + --- 1.01653 (0.697475), N = 75 moving right + + -- best stat: 0.70313, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 16 9 6 1 3 + + + -- linear combo weights (showing up to 5) + + 0.6096 0.3684 0.7633 0.5942 13.8501 + + + -- cutpoint (score) + --- -0.928262 (0.587119), N = 229 moving right + --- -0.718045 (0.628749), N = 204 moving right + --- -0.068013 (0.698658), N = 140 moving right + --- 0.454297 (0.741604), N = 90 moving right + --- 0.902763 (0.715166), N = 51 moving right + + -- best stat: 0.741604, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 10 2 15 17 1 + + + -- linear combo weights (showing up to 5) + + -0.5543 -0.6354 -0.1510 0.6174 0.6168 + + + -- cutpoint (score) + --- 0.230322 (0.613995), N = 219 moving right + --- 0.31117 (0.622786), N = 211 moving right + --- 0.717235 (0.673229), N = 168 moving right + --- 0.962765 (0.702539), N = 148 moving right + --- 2.26974 (0.687412), N = 55 moving right + + -- best stat: 0.702539, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 3.0000e+00 + 1.1000e+02 1.0000e+00 4.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 7.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.7826e-01 2.1885e-02 + 1.1000e+02 9.6377e-01 3.6700e-02 + 1.4000e+02 9.5652e-01 4.4219e-02 + + +------------ Growing tree 242 -------------- + +- N obs inbag: 276 +- N row inbag: 174 +- max nodes: 207 +- max leaves: 104 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 9 3 16 15 14 + + + -- linear combo weights (showing up to 5) + + 0.7164 6.3791 0.1414 -0.3238 0.0297 + + + -- cutpoint (score) + --- -0.811339 (0.523333), N = 262 moving right + --- -0.343926 (0.610817), N = 190 moving right + --- -0.105406 (0.673914), N = 134 moving right + --- -0.0875707 (0.698301), N = 120 moving right + --- 0.11263 (0.700879), N = 81 moving right + + -- best stat: 0.700879, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 16 12 6 11 2 + + + -- linear combo weights (showing up to 5) + + 0.7437 0.0630 0.9140 1.1773 0.4324 + + + -- cutpoint (score) + --- -0.33995 (0.676357), N = 160 moving right + --- -0.282697 (0.684449), N = 157 moving right + --- 0.282302 (0.701305), N = 100 moving right + --- 0.91917 (0.678307), N = 58 moving right + --- 1.39886 (0.658851), N = 46 moving right + + -- best stat: 0.701305, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 14 5 11 10 7 + + + -- linear combo weights (showing up to 5) + + -0.0647 0.6174 0.8875 -0.5221 18.9966 + + + -- cutpoint (score) + --- -0.480593 (0.681625), N = 172 moving right + --- -0.239393 (0.730555), N = 141 moving right + --- 0.035719 (0.698077), N = 114 moving right + --- 2.00135 (0.643341), N = 27 moving right + --- 20.9927 (0.551038), N = 8 moving right + + -- best stat: 0.730555, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 4.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + 3.3400e+02 1.0000e+00 1.0000e+00 + 3.8800e+02 1.0000e+00 3.0000e+00 + 4.0000e+02 1.0000e+00 3.0000e+00 + 5.1500e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.7000e+01 9.8188e-01 1.8169e-02 + 1.1000e+02 9.7826e-01 2.1859e-02 + 1.4000e+02 9.7101e-01 2.9266e-02 + 1.9800e+02 9.6739e-01 3.2997e-02 + + +------------ Growing tree 243 -------------- + +- N obs inbag: 276 +- N row inbag: 173 +- max nodes: 219 +- max leaves: 110 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 8 5 1 16 6 + + + -- linear combo weights (showing up to 5) + + 3.4730 0.0126 0.4059 0.2001 0.0823 + + + -- cutpoint (score) + --- -0.678288 (0.789823), N = 99 moving right + --- 0.0596075 (0.740789), N = 65 moving right + --- 0.207276 (0.747456), N = 62 moving right + --- 0.510428 (0.719502), N = 58 moving right + --- 5.57234 (0.596179), N = 16 moving right + + -- best stat: 0.789823, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 2 8 17 6 4 + + + -- linear combo weights (showing up to 5) + + -0.2626 3.4257 0.3126 0.2455 -0.1436 + + + -- cutpoint (score) + --- -1.57817 (0.56704), N = 240 moving right + --- -0.481789 (0.755846), N = 121 moving right + --- -0.406987 (0.760332), N = 111 moving right + --- 1.95818 (0.662575), N = 45 moving right + --- 8.47324 (0.559855), N = 9 moving right + + -- best stat: 0.760332, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 6 5 17 15 9 + + + -- linear combo weights (showing up to 5) + + 0.3411 0.3873 0.6398 -0.1232 0.5661 + + + -- cutpoint (score) + --- 0.971477 (0.542492), N = 248 moving right + --- 1.30368 (0.585836), N = 223 moving right + --- 1.66154 (0.652066), N = 192 moving right + --- 1.67066 (0.659086), N = 188 moving right + --- 1.85765 (0.699647), N = 160 moving right + + -- best stat: 0.699647, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 3.0000e+00 + 5.1000e+01 1.0000e+00 3.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.8913e-01 1.0870e-02 + 5.1000e+01 9.7826e-01 2.1859e-02 + 7.1000e+01 9.7464e-01 2.5562e-02 + 7.7000e+01 9.7101e-01 2.9280e-02 + 1.1000e+02 9.6739e-01 3.3011e-02 + + +------------ Growing tree 244 -------------- + +- N obs inbag: 276 +- N row inbag: 161 +- max nodes: 213 +- max leaves: 107 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 12 16 11 15 6 + + + -- linear combo weights (showing up to 5) + + 0.1513 0.7554 1.1308 -0.2236 -0.5028 + + + -- cutpoint (score) + --- -0.811308 (0.683807), N = 162 moving right + --- -0.702877 (0.699012), N = 153 moving right + --- -0.0636924 (0.755688), N = 104 moving right + --- -0.0400258 (0.7629), N = 102 moving right + --- 1.81912 (0.617582), N = 33 moving right + + -- best stat: 0.7629, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 7 11 4 2 3 + + + -- linear combo weights (showing up to 5) + + 5.9683 0.9121 0.5796 -0.1987 4.7346 + + + -- cutpoint (score) + --- -0.950634 (0.540203), N = 256 moving right + --- -0.712965 (0.619162), N = 211 moving right + --- -0.54763 (0.649192), N = 193 moving right + --- 0.537379 (0.704399), N = 68 moving right + --- 1.93335 (0.63539), N = 33 moving right + + -- best stat: 0.704399, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 7 2 1 5 6 + + + -- linear combo weights (showing up to 5) + + 8.7824 -1.1169 0.6924 1.0882 0.1563 + + + -- cutpoint (score) + --- -2.0386 (0.518788), N = 259 moving right + --- -0.744918 (0.68009), N = 146 moving right + --- -0.582363 (0.684876), N = 119 moving right + --- 0.408664 (0.646432), N = 42 moving right + --- 0.447757 (0.651641), N = 39 moving right + + -- best stat: 0.684876, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 5.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 3.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.7826e-01 2.1805e-02 + 1.1000e+02 9.7464e-01 2.5509e-02 + 1.4000e+02 9.6739e-01 3.2944e-02 + 1.8600e+02 9.6014e-01 4.0434e-02 + + +------------ Growing tree 245 -------------- + +- N obs inbag: 276 +- N row inbag: 177 +- max nodes: 227 +- max leaves: 114 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 12 6 9 13 3 + + + -- linear combo weights (showing up to 5) + + 0.0500 1.6093 0.3592 0.4496 8.3315 + + + -- cutpoint (score) + --- -0.6567 (0.559365), N = 248 moving right + --- -0.51771 (0.586873), N = 236 moving right + --- -0.0890965 (0.716516), N = 158 moving right + --- 0.355193 (0.665145), N = 92 moving right + --- 0.495449 (0.67453), N = 80 moving right + + -- best stat: 0.716516, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 7 10 8 17 13 + + + -- linear combo weights (showing up to 5) + + 2.8123 -0.4502 1.6006 0.3556 0.0899 + + + -- cutpoint (score) + --- 0.746249 (0.712108), N = 118 moving right + --- 1.07202 (0.733484), N = 84 moving right + --- 2.84686 (0.656975), N = 37 moving right + --- 3.04985 (0.651607), N = 36 moving right + --- 3.82286 (0.639577), N = 24 moving right + + -- best stat: 0.733484, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 16 6 13 5 15 + + + -- linear combo weights (showing up to 5) + + 0.7400 1.5825 0.5603 0.8923 -0.0497 + + + -- cutpoint (score) + --- -0.871606 (0.565811), N = 240 moving right + --- -0.626795 (0.623629), N = 210 moving right + --- -0.280458 (0.628821), N = 176 moving right + --- 1.04689 (0.709287), N = 70 moving right + --- 1.5712 (0.648002), N = 48 moving right + + -- best stat: 0.709287, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + 3.4800e+02 1.0000e+00 1.0000e+00 + 4.0000e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.8551e-01 1.4559e-02 + 1.4000e+02 9.8188e-01 1.8235e-02 + 1.7900e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 246 -------------- + +- N obs inbag: 276 +- N row inbag: 180 +- max nodes: 233 +- max leaves: 117 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 15 14 12 7 6 + + + -- linear combo weights (showing up to 5) + + -0.4654 0.5203 0.4395 5.0249 1.6492 + + + -- cutpoint (score) + --- -1.04232 (0.544789), N = 256 moving right + --- -0.687287 (0.585531), N = 221 moving right + --- -0.244611 (0.646663), N = 177 moving right + --- 0.246164 (0.692441), N = 92 moving right + --- 0.248957 (0.686493), N = 91 moving right + + -- best stat: 0.692441, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 9 15 17 13 6 + + + -- linear combo weights (showing up to 5) + + 0.1367 -0.3042 0.6168 0.4608 1.5940 + + + -- cutpoint (score) + --- 0.708651 (0.560562), N = 246 moving right + --- 0.842835 (0.571906), N = 240 moving right + --- 0.945735 (0.588268), N = 231 moving right + --- 2.1688 (0.741677), N = 105 moving right + --- 3.40809 (0.609038), N = 30 moving right + + -- best stat: 0.741677, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 0 11 5 8 1 + + + -- linear combo weights (showing up to 5) + + 0.0300 0.5946 0.7130 1.6148 0.3211 + + + -- cutpoint (score) + --- -1.37551 (0.588021), N = 237 moving right + --- -0.879585 (0.710664), N = 170 moving right + --- -0.442312 (0.752717), N = 137 moving right + --- -0.17993 (0.75534), N = 121 moving right + --- 0.562026 (0.751748), N = 84 moving right + + -- best stat: 0.75534, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 3.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 3.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.8913e-01 1.0870e-02 + 5.1000e+01 9.8551e-01 1.4533e-02 + 7.1000e+01 9.8188e-01 1.8209e-02 + 7.7000e+01 9.7101e-01 2.9279e-02 + 1.1000e+02 9.6377e-01 3.6742e-02 + + +------------ Growing tree 247 -------------- + +- N obs inbag: 276 +- N row inbag: 181 +- max nodes: 239 +- max leaves: 120 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 7 14 15 4 3 + + + -- linear combo weights (showing up to 5) + + 4.5574 0.5906 0.0147 0.6843 3.1880 + + + -- cutpoint (score) + --- -0.188807 (0.594479), N = 211 moving right + --- 0.207599 (0.653311), N = 163 moving right + --- 0.483881 (0.677888), N = 119 moving right + --- 0.523067 (0.683166), N = 106 moving right + --- 1.45923 (0.635688), N = 44 moving right + + -- best stat: 0.683166, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 6 13 0 11 3 + + + -- linear combo weights (showing up to 5) + + 1.0375 0.3275 -0.1964 0.5823 4.8400 + + + -- cutpoint (score) + --- -1.04088 (0.516232), N = 268 moving right + --- -0.817036 (0.564548), N = 241 moving right + --- -0.366722 (0.652321), N = 183 moving right + --- 0.484597 (0.699246), N = 78 moving right + --- 0.841022 (0.706657), N = 63 moving right + + -- best stat: 0.706657, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 14 15 6 9 4 + + + -- linear combo weights (showing up to 5) + + 0.5181 -0.0579 0.7367 0.1826 0.8391 + + + -- cutpoint (score) + --- -0.435663 (0.542048), N = 238 moving right + --- -0.224496 (0.594021), N = 210 moving right + --- 0.389183 (0.656398), N = 153 moving right + --- 0.533885 (0.675678), N = 130 moving right + --- 0.876566 (0.6443), N = 85 moving right + + -- best stat: 0.675678, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 3.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.1000e+01 9.8551e-01 1.4559e-02 + 1.1000e+02 9.7464e-01 2.5588e-02 + 1.3100e+02 9.7101e-01 2.9306e-02 + + +------------ Growing tree 248 -------------- + +- N obs inbag: 276 +- N row inbag: 175 +- max nodes: 221 +- max leaves: 111 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 6 13 11 10 5 + + + -- linear combo weights (showing up to 5) + + 0.8602 0.2126 0.9211 -0.7220 0.6075 + + + -- cutpoint (score) + --- -0.278515 (0.678693), N = 166 moving right + --- -0.0492621 (0.691385), N = 138 moving right + --- 1.13595 (0.716749), N = 62 moving right + --- 1.25926 (0.709095), N = 58 moving right + --- 1.70783 (0.677589), N = 46 moving right + + -- best stat: 0.716749, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 7 15 11 9 16 + + + -- linear combo weights (showing up to 5) + + 9.5291 -0.0058 0.7609 0.2213 0.6958 + + + -- cutpoint (score) + --- -1.21764 (0.539161), N = 255 moving right + --- -0.777032 (0.59919), N = 215 moving right + --- -0.742711 (0.617656), N = 208 moving right + --- -0.469301 (0.718028), N = 146 moving right + --- 2.73975 (0.592544), N = 20 moving right + + -- best stat: 0.718028, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 10 4 17 2 16 + + + -- linear combo weights (showing up to 5) + + -0.7794 0.4835 0.1878 -0.6669 0.8523 + + + -- cutpoint (score) + --- -1.48219 (0.509359), N = 260 moving right + --- -0.754742 (0.598647), N = 209 moving right + --- -0.178983 (0.698535), N = 152 moving right + --- 0.00254125 (0.707836), N = 132 moving right + --- 0.446334 (0.709076), N = 109 moving right + + -- best stat: 0.709076, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 2.0000e+00 + 3.3400e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 7.1000e+01 9.9638e-01 3.6232e-03 + 7.7000e+01 9.9275e-01 7.2596e-03 + 1.3100e+02 9.8551e-01 1.4559e-02 + 1.7900e+02 9.8188e-01 1.8235e-02 + 1.8600e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 249 -------------- + +- N obs inbag: 276 +- N row inbag: 176 +- max nodes: 233 +- max leaves: 117 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 9 0 4 3 5 + + + -- linear combo weights (showing up to 5) + + 0.2617 0.0373 0.2413 8.6439 1.0089 + + + -- cutpoint (score) + --- -0.02315 (0.592258), N = 214 moving right + --- 0.0358493 (0.621789), N = 201 moving right + --- 0.335724 (0.691588), N = 108 moving right + --- 1.16345 (0.663928), N = 60 moving right + --- 8.4251 (0.623444), N = 25 moving right + + -- best stat: 0.691588, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 1 5 12 8 0 + + + -- linear combo weights (showing up to 5) + + 0.4794 0.6207 0.1360 1.5639 0.1329 + + + -- cutpoint (score) + --- -1.06353 (0.555516), N = 243 moving right + --- -0.768301 (0.625611), N = 205 moving right + --- -0.621522 (0.690662), N = 172 moving right + --- 0.36859 (0.731659), N = 91 moving right + --- 1.04302 (0.662372), N = 56 moving right + + -- best stat: 0.731659, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 3 5 2 11 13 + + + -- linear combo weights (showing up to 5) + + 8.0211 1.0220 -0.2093 0.4649 0.2050 + + + -- cutpoint (score) + --- -0.337184 (0.675827), N = 179 moving right + --- 0.230931 (0.747203), N = 116 moving right + --- 0.525269 (0.731915), N = 91 moving right + --- 3.94389 (0.632309), N = 26 moving right + --- 7.59437 (0.604177), N = 20 moving right + + -- best stat: 0.747203, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 3.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 3.0000e+00 + 1.9100e+02 1.0000e+00 3.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.1000e+01 9.8913e-01 1.0909e-02 + 7.7000e+01 9.8188e-01 1.8235e-02 + 1.1000e+02 9.7101e-01 2.9305e-02 + + +------------ Growing tree 250 -------------- + +- N obs inbag: 276 +- N row inbag: 182 +- max nodes: 219 +- max leaves: 110 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 4 0 6 12 5 + + + -- linear combo weights (showing up to 5) + + 0.6474 -0.2763 0.4925 0.0553 0.7276 + + + -- cutpoint (score) + --- -0.0423025 (0.56933), N = 226 moving right + --- -0.020441 (0.61766), N = 192 moving right + --- 0.375018 (0.624488), N = 127 moving right + --- 1.07757 (0.596081), N = 52 moving right + --- 1.0964 (0.603199), N = 48 moving right + + -- best stat: 0.624488, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 15 17 14 2 9 + + + -- linear combo weights (showing up to 5) + + 0.0197 0.6564 0.3384 -0.7404 0.4634 + + + -- cutpoint (score) + --- 0.370852 (0.586006), N = 228 moving right + --- 0.867409 (0.628833), N = 198 moving right + --- 1.85399 (0.637377), N = 71 moving right + --- 1.94841 (0.601626), N = 60 moving right + --- 2.02271 (0.595771), N = 49 moving right + + -- best stat: 0.637377, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 7 8 11 16 10 + + + -- linear combo weights (showing up to 5) + + 2.3531 1.7572 0.7296 0.3049 -0.4568 + + + -- cutpoint (score) + --- -1.08442 (0.710514), N = 141 moving right + --- -1.06883 (0.723238), N = 136 moving right + --- 0.51424 (0.773989), N = 70 moving right + --- 1.69579 (0.705259), N = 43 moving right + --- 2.69211 (0.650101), N = 29 moving right + + -- best stat: 0.773989, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.1000e+01 9.8551e-01 1.4559e-02 + 1.4000e+02 9.8188e-01 1.8235e-02 + 1.7900e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 251 -------------- + +- N obs inbag: 276 +- N row inbag: 182 +- max nodes: 219 +- max leaves: 110 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 12 11 15 17 14 + + + -- linear combo weights (showing up to 5) + + -0.1087 0.9293 -0.0464 0.4236 0.1570 + + + -- cutpoint (score) + --- 0.0831442 (0.545353), N = 255 moving right + --- 0.853945 (0.655253), N = 175 moving right + --- 1.43459 (0.715769), N = 99 moving right + --- 1.78343 (0.695827), N = 64 moving right + --- 2.83346 (0.583881), N = 24 moving right + + -- best stat: 0.715769, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 10 2 6 15 16 + + + -- linear combo weights (showing up to 5) + + -0.7334 -0.1803 0.6999 0.0581 0.8557 + + + -- cutpoint (score) + --- -0.748135 (0.603863), N = 187 moving right + --- -0.296448 (0.65486), N = 133 moving right + --- -0.158085 (0.676041), N = 110 moving right + --- 0.0498457 (0.69624), N = 90 moving right + --- 0.557945 (0.677064), N = 57 moving right + + -- best stat: 0.69624, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 9 0 8 10 3 + + + -- linear combo weights (showing up to 5) + + -0.3807 -0.0354 1.6007 -0.5076 4.7378 + + + -- cutpoint (score) + --- -0.582334 (0.6856), N = 157 moving right + --- -0.240562 (0.748436), N = 102 moving right + --- 0.299344 (0.715907), N = 67 moving right + --- 0.897653 (0.671046), N = 45 moving right + --- 1.13519 (0.677634), N = 41 moving right + + -- best stat: 0.748436, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 1.1000e+02 9.8551e-01 1.4559e-02 + 1.3100e+02 9.8188e-01 1.8235e-02 + 1.4000e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 252 -------------- + +- N obs inbag: 276 +- N row inbag: 168 +- max nodes: 231 +- max leaves: 116 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 15 3 14 8 11 + + + -- linear combo weights (showing up to 5) + + -0.1542 6.4478 -0.2020 1.1298 0.5105 + + + -- cutpoint (score) + --- -0.754717 (0.654856), N = 189 moving right + --- -0.618047 (0.716306), N = 160 moving right + --- -0.588473 (0.71949), N = 159 moving right + --- 0.670936 (0.722498), N = 74 moving right + --- 0.898364 (0.708278), N = 64 moving right + + -- best stat: 0.722498, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 4 14 5 10 6 + + + -- linear combo weights (showing up to 5) + + 0.6829 0.1939 0.3520 -0.7196 0.5016 + + + -- cutpoint (score) + --- -0.210636 (0.608348), N = 206 moving right + --- -0.133236 (0.641495), N = 192 moving right + --- 0.130287 (0.646886), N = 177 moving right + --- 0.668499 (0.678998), N = 121 moving right + --- 1.34397 (0.644406), N = 56 moving right + + -- best stat: 0.678998, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 3 11 1 17 4 + + + -- linear combo weights (showing up to 5) + + 6.6988 0.7751 0.3838 0.1397 0.5282 + + + -- cutpoint (score) + --- -0.445396 (0.558227), N = 249 moving right + --- -0.158723 (0.586979), N = 229 moving right + --- -0.0970718 (0.60495), N = 217 moving right + --- 0.632669 (0.727283), N = 129 moving right + --- 1.48791 (0.695523), N = 71 moving right + + -- best stat: 0.727283, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 3.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.8913e-01 1.0870e-02 + 7.1000e+01 9.8188e-01 1.8196e-02 + 7.7000e+01 9.7464e-01 2.5576e-02 + 1.3100e+02 9.7101e-01 2.9293e-02 + 1.4000e+02 9.6377e-01 3.6756e-02 + + +------------ Growing tree 253 -------------- + +- N obs inbag: 276 +- N row inbag: 176 +- max nodes: 207 +- max leaves: 104 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 17 7 10 2 15 + + + -- linear combo weights (showing up to 5) + + 0.5769 3.5902 -0.7625 -0.6553 -0.0288 + + + -- cutpoint (score) + --- 0.811084 (0.684719), N = 172 moving right + --- 0.898458 (0.711467), N = 161 moving right + --- 1.06907 (0.71822), N = 145 moving right + --- 1.40033 (0.688692), N = 113 moving right + --- 1.97779 (0.708422), N = 62 moving right + + -- best stat: 0.71822, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 5 10 7 12 17 + + + -- linear combo weights (showing up to 5) + + 0.3626 -0.6935 3.4154 0.1212 0.5233 + + + -- cutpoint (score) + --- 0.511338 (0.550671), N = 254 moving right + --- 1.24655 (0.659825), N = 194 moving right + --- 1.3612 (0.691141), N = 172 moving right + --- 2.22857 (0.680328), N = 83 moving right + --- 2.57515 (0.679621), N = 61 moving right + + -- best stat: 0.691141, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 10 12 7 9 13 + + + -- linear combo weights (showing up to 5) + + -0.7339 0.0970 3.9405 0.4834 0.1818 + + + -- cutpoint (score) + --- -1.33642 (0.540188), N = 258 moving right + --- -0.415565 (0.605094), N = 188 moving right + --- -0.164811 (0.671081), N = 154 moving right + --- 0.0339773 (0.694584), N = 133 moving right + --- 0.0729036 (0.710474), N = 125 moving right + + -- best stat: 0.710474, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 3.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 3.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.7000e+01 9.9275e-01 7.2596e-03 + 1.1000e+02 9.8913e-01 1.0909e-02 + 1.3100e+02 9.8551e-01 1.4572e-02 + 1.4000e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 254 -------------- + +- N obs inbag: 276 +- N row inbag: 162 +- max nodes: 225 +- max leaves: 113 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 15 2 12 10 9 + + + -- linear combo weights (showing up to 5) + + -0.3436 -0.5574 0.0574 -0.9328 0.5914 + + + -- cutpoint (score) + --- -1.26534 (0.62128), N = 208 moving right + --- -0.510959 (0.671738), N = 131 moving right + --- -0.323555 (0.702632), N = 108 moving right + --- 0.20221 (0.700535), N = 53 moving right + --- 1.24004 (0.562904), N = 11 moving right + + -- best stat: 0.702632, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 8 0 16 3 7 + + + -- linear combo weights (showing up to 5) + + 1.5415 0.0946 0.2330 7.7502 4.7096 + + + -- cutpoint (score) + --- -0.846665 (0.651773), N = 189 moving right + --- -0.779811 (0.699554), N = 166 moving right + --- -0.716258 (0.719496), N = 141 moving right + --- -0.248246 (0.761008), N = 103 moving right + --- 0.869943 (0.697569), N = 53 moving right + + -- best stat: 0.761008, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 8 14 16 12 1 + + + -- linear combo weights (showing up to 5) + + 2.1646 0.0237 0.3092 0.0332 0.4859 + + + -- cutpoint (score) + --- -1.19666 (0.655476), N = 177 moving right + --- -0.60967 (0.741847), N = 121 moving right + --- -0.438001 (0.777627), N = 94 moving right + --- 0.704312 (0.718916), N = 62 moving right + --- 4.50703 (0.575708), N = 13 moving right + + -- best stat: 0.777627, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 3.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 5.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8551e-01 1.4532e-02 + 7.1000e+01 9.7826e-01 2.1885e-02 + 7.7000e+01 9.7464e-01 2.5589e-02 + 1.1000e+02 9.7101e-01 2.9306e-02 + + +------------ Growing tree 255 -------------- + +- N obs inbag: 276 +- N row inbag: 177 +- max nodes: 239 +- max leaves: 120 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 11 1 14 6 13 + + + -- linear combo weights (showing up to 5) + + 1.3881 0.5821 0.0013 0.1698 0.2921 + + + -- cutpoint (score) + --- -1.36267 (0.579915), N = 236 moving right + --- -1.10406 (0.615621), N = 202 moving right + --- -0.18217 (0.747134), N = 109 moving right + --- 1.43669 (0.676356), N = 48 moving right + --- 3.86814 (0.533571), N = 6 moving right + + -- best stat: 0.747134, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 16 12 3 7 8 + + + -- linear combo weights (showing up to 5) + + 0.0375 0.0108 18.3065 0.3604 1.3206 + + + -- cutpoint (score) + --- -0.851487 (0.511889), N = 265 moving right + --- -0.725006 (0.604771), N = 208 moving right + --- -0.714261 (0.619392), N = 202 moving right + --- -0.10635 (0.733994), N = 99 moving right + --- 0.381661 (0.681474), N = 63 moving right + + -- best stat: 0.733994, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 7 5 14 12 3 + + + -- linear combo weights (showing up to 5) + + 0.8275 1.0062 0.3466 0.1693 19.7364 + + + -- cutpoint (score) + --- -0.251549 (0.570643), N = 222 moving right + --- 0.0269099 (0.632455), N = 161 moving right + --- 0.130349 (0.642132), N = 141 moving right + --- 0.840713 (0.643363), N = 53 moving right + --- 1.32254 (0.615583), N = 28 moving right + + -- best stat: 0.643363, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.1000e+01 9.8913e-01 1.0909e-02 + 7.7000e+01 9.8551e-01 1.4572e-02 + 1.3100e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 256 -------------- + +- N obs inbag: 276 +- N row inbag: 170 +- max nodes: 197 +- max leaves: 99 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 9 11 0 13 14 + + + -- linear combo weights (showing up to 5) + + 0.1855 0.9152 -0.5037 0.2195 0.3128 + + + -- cutpoint (score) + --- -1.18716 (0.586461), N = 227 moving right + --- -1.17913 (0.592912), N = 224 moving right + --- -0.906505 (0.661909), N = 183 moving right + --- -0.357573 (0.696046), N = 117 moving right + --- -0.00528882 (0.696628), N = 81 moving right + + -- best stat: 0.696628, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 7 2 10 17 3 + + + -- linear combo weights (showing up to 5) + + 7.7341 -0.9336 -0.3817 0.3710 6.5976 + + + -- cutpoint (score) + --- -0.210261 (0.594449), N = 218 moving right + --- 0.157518 (0.671922), N = 161 moving right + --- 0.166949 (0.674157), N = 160 moving right + --- 0.459286 (0.671596), N = 111 moving right + --- 7.34297 (0.615383), N = 18 moving right + + -- best stat: 0.674157, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 13 2 7 5 9 + + + -- linear combo weights (showing up to 5) + + 0.2977 -0.8336 11.2252 0.7866 0.1127 + + + -- cutpoint (score) + --- -1.06772 (0.590676), N = 223 moving right + --- -0.957917 (0.638459), N = 197 moving right + --- -0.761917 (0.665821), N = 162 moving right + --- -0.695042 (0.661), N = 153 moving right + --- 0.0765086 (0.665192), N = 54 moving right + + -- best stat: 0.665821, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 3.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.4800e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.1000e+01 9.8188e-01 1.8208e-02 + 7.7000e+01 9.7826e-01 2.1898e-02 + 1.8600e+02 9.7101e-01 2.9306e-02 + + +------------ Growing tree 257 -------------- + +- N obs inbag: 276 +- N row inbag: 178 +- max nodes: 223 +- max leaves: 112 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 11 6 16 10 1 + + + -- linear combo weights (showing up to 5) + + 0.7652 -0.4840 0.6328 -0.8562 0.2614 + + + -- cutpoint (score) + --- -2.03534 (0.51889), N = 266 moving right + --- -2.02004 (0.521023), N = 265 moving right + --- -0.239124 (0.721286), N = 142 moving right + --- 0.0765406 (0.747826), N = 115 moving right + --- 1.17418 (0.697104), N = 46 moving right + + -- best stat: 0.747826, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 15 7 9 16 6 + + + -- linear combo weights (showing up to 5) + + -0.1177 7.8173 0.3570 0.4213 0.2731 + + + -- cutpoint (score) + --- -0.138298 (0.691443), N = 151 moving right + --- 0.0222181 (0.712446), N = 118 moving right + --- 0.501672 (0.677496), N = 55 moving right + --- 0.600217 (0.658975), N = 52 moving right + --- 8.31684 (0.559685), N = 10 moving right + + -- best stat: 0.712446, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 3 14 16 1 2 + + + -- linear combo weights (showing up to 5) + + 7.8180 0.2638 0.4391 0.2945 -0.3723 + + + -- cutpoint (score) + --- -0.945359 (0.572873), N = 233 moving right + --- -0.876697 (0.594183), N = 223 moving right + --- -0.346564 (0.671569), N = 122 moving right + --- -0.24825 (0.673435), N = 96 moving right + --- 0.108309 (0.666995), N = 54 moving right + + -- best stat: 0.673435, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 1.3100e+02 9.8913e-01 1.0909e-02 + 1.4000e+02 9.8551e-01 1.4572e-02 + 1.7900e+02 9.8188e-01 1.8249e-02 + + +------------ Growing tree 258 -------------- + +- N obs inbag: 276 +- N row inbag: 176 +- max nodes: 245 +- max leaves: 123 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 11 12 16 2 8 + + + -- linear combo weights (showing up to 5) + + 0.2438 0.1416 0.4953 0.5103 2.5996 + + + -- cutpoint (score) + --- -1.68567 (0.524743), N = 261 moving right + --- -1.3063 (0.582788), N = 226 moving right + --- 0.279583 (0.694579), N = 95 moving right + --- 1.10481 (0.698722), N = 69 moving right + --- 1.34085 (0.689487), N = 65 moving right + + -- best stat: 0.698722, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 2 4 6 9 15 + + + -- linear combo weights (showing up to 5) + + -0.4038 1.0923 1.1196 0.1776 -0.0352 + + + -- cutpoint (score) + --- -0.45511 (0.58817), N = 211 moving right + --- -0.388553 (0.60484), N = 184 moving right + --- 0.640223 (0.639071), N = 112 moving right + --- 0.772633 (0.622846), N = 55 moving right + --- 1.22901 (0.561491), N = 23 moving right + + -- best stat: 0.639071, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 1 8 16 2 15 + + + -- linear combo weights (showing up to 5) + + 0.6197 2.8962 0.4253 0.6929 -0.1766 + + + -- cutpoint (score) + --- -1.76092 (0.543504), N = 246 moving right + --- -1.66542 (0.560077), N = 238 moving right + --- -0.960577 (0.671617), N = 172 moving right + --- 0.0733786 (0.763408), N = 107 moving right + --- 3.24348 (0.644085), N = 29 moving right + + -- best stat: 0.763408, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.1000e+01 9.8913e-01 1.0909e-02 + 7.7000e+01 9.8188e-01 1.8235e-02 + 1.1000e+02 9.7464e-01 2.5615e-02 + + +------------ Growing tree 259 -------------- + +- N obs inbag: 276 +- N row inbag: 174 +- max nodes: 239 +- max leaves: 120 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 14 16 4 17 1 + + + -- linear combo weights (showing up to 5) + + 0.2880 0.5547 0.3672 0.3892 0.3121 + + + -- cutpoint (score) + --- 0.608556 (0.591238), N = 210 moving right + --- 0.804113 (0.61698), N = 187 moving right + --- 1.32635 (0.688465), N = 131 moving right + --- 1.44721 (0.712334), N = 118 moving right + --- 1.67443 (0.710976), N = 98 moving right + + -- best stat: 0.712334, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 9 16 4 5 10 + + + -- linear combo weights (showing up to 5) + + 0.6911 0.6145 0.3453 0.8745 -0.4613 + + + -- cutpoint (score) + --- -1.20742 (0.521071), N = 264 moving right + --- -0.991938 (0.530557), N = 249 moving right + --- 0.0314025 (0.689884), N = 146 moving right + --- 1.19212 (0.69114), N = 71 moving right + --- 2.35623 (0.562636), N = 17 moving right + + -- best stat: 0.69114, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 1 10 6 11 15 + + + -- linear combo weights (showing up to 5) + + 0.4217 -0.4811 1.2839 0.8965 -0.1189 + + + -- cutpoint (score) + --- -1.84252 (0.501461), N = 265 moving right + --- -1.34548 (0.556278), N = 237 moving right + --- -0.511821 (0.690851), N = 152 moving right + --- -0.32065 (0.704309), N = 137 moving right + --- 0.0737655 (0.718178), N = 107 moving right + + -- best stat: 0.718178, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 3.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 3.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 4.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + 3.4800e+02 1.0000e+00 1.0000e+00 + 4.6000e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.7000e+01 9.8551e-01 1.4532e-02 + 1.4000e+02 9.7826e-01 2.1885e-02 + 1.7900e+02 9.7101e-01 2.9293e-02 + 1.9800e+02 9.6014e-01 4.0487e-02 + + +------------ Growing tree 260 -------------- + +- N obs inbag: 276 +- N row inbag: 167 +- max nodes: 209 +- max leaves: 105 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 11 10 7 2 8 + + + -- linear combo weights (showing up to 5) + + 0.1662 -0.6339 4.8402 -0.4326 1.5654 + + + -- cutpoint (score) + --- -1.45409 (0.658365), N = 184 moving right + --- -1.11303 (0.709594), N = 159 moving right + --- -0.387413 (0.770738), N = 106 moving right + --- -0.146177 (0.756564), N = 95 moving right + --- 0.106556 (0.73657), N = 72 moving right + + -- best stat: 0.770738, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 12 0 9 6 17 + + + -- linear combo weights (showing up to 5) + + 0.0925 -0.2420 0.3693 0.4409 0.7075 + + + -- cutpoint (score) + --- 0.989925 (0.554976), N = 253 moving right + --- 2.36326 (0.673517), N = 111 moving right + --- 2.79459 (0.596267), N = 49 moving right + --- 2.95138 (0.570571), N = 25 moving right + --- 2.9871 (0.540871), N = 20 moving right + + -- best stat: 0.673517, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 17 16 2 0 4 + + + -- linear combo weights (showing up to 5) + + 0.6384 0.3405 -0.6999 -0.3323 0.3666 + + + -- cutpoint (score) + --- 0.592694 (0.628806), N = 214 moving right + --- 0.832011 (0.647589), N = 196 moving right + --- 1.57535 (0.687832), N = 116 moving right + --- 1.63755 (0.687901), N = 108 moving right + --- 1.86959 (0.680174), N = 86 moving right + + -- best stat: 0.687901, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 3.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 3.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.8913e-01 1.0870e-02 + 5.1000e+01 9.8551e-01 1.4533e-02 + 7.1000e+01 9.8188e-01 1.8209e-02 + 7.7000e+01 9.7464e-01 2.5589e-02 + 1.3100e+02 9.6377e-01 3.6742e-02 + + +------------ Growing tree 261 -------------- + +- N obs inbag: 276 +- N row inbag: 177 +- max nodes: 215 +- max leaves: 108 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 1 11 14 15 2 + + + -- linear combo weights (showing up to 5) + + 0.6473 1.0397 0.2307 -0.1352 0.5426 + + + -- cutpoint (score) + --- -1.06987 (0.547144), N = 256 moving right + --- -0.411297 (0.604853), N = 210 moving right + --- -0.316874 (0.610044), N = 207 moving right + --- -0.0266146 (0.660343), N = 172 moving right + --- 0.233181 (0.695782), N = 133 moving right + + -- best stat: 0.695782, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 5 11 3 15 6 + + + -- linear combo weights (showing up to 5) + + 0.5979 0.8455 4.7673 -0.0563 0.9503 + + + -- cutpoint (score) + --- -0.531168 (0.605484), N = 218 moving right + --- 1.02236 (0.684179), N = 69 moving right + --- 1.39954 (0.662908), N = 44 moving right + --- 1.51969 (0.64076), N = 38 moving right + --- 3.5658 (0.600822), N = 18 moving right + + -- best stat: 0.684179, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 1 13 6 8 4 + + + -- linear combo weights (showing up to 5) + + 0.4862 0.1770 0.4196 1.6604 0.1803 + + + -- cutpoint (score) + --- -0.709116 (0.653605), N = 173 moving right + --- -0.551069 (0.721512), N = 139 moving right + --- -0.275455 (0.757806), N = 107 moving right + --- -0.157548 (0.759007), N = 97 moving right + --- 7.147 (0.530167), N = 6 moving right + + -- best stat: 0.759007, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.7000e+01 9.8551e-01 1.4559e-02 + 1.1000e+02 9.8188e-01 1.8235e-02 + 1.3100e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 262 -------------- + +- N obs inbag: 276 +- N row inbag: 172 +- max nodes: 227 +- max leaves: 114 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 7 3 8 15 10 + + + -- linear combo weights (showing up to 5) + + 2.2161 2.0509 2.1961 -0.2328 -0.3115 + + + -- cutpoint (score) + --- -2.12193 (0.509584), N = 271 moving right + --- -1.67606 (0.555256), N = 251 moving right + --- -1.05277 (0.698712), N = 167 moving right + --- -0.686925 (0.750011), N = 131 moving right + --- 1.44899 (0.668528), N = 50 moving right + + -- best stat: 0.750011, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 17 6 8 5 15 + + + -- linear combo weights (showing up to 5) + + 0.4113 -0.2194 2.4480 0.2997 -0.2228 + + + -- cutpoint (score) + --- -0.486432 (0.606105), N = 229 moving right + --- 0.620126 (0.730608), N = 124 moving right + --- 0.664396 (0.740256), N = 119 moving right + --- 1.53628 (0.717152), N = 71 moving right + --- 1.83934 (0.710457), N = 63 moving right + + -- best stat: 0.740256, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 14 16 8 3 6 + + + -- linear combo weights (showing up to 5) + + -0.0275 0.1792 2.4271 2.7218 0.0763 + + + -- cutpoint (score) + --- -1.47401 (0.57928), N = 233 moving right + --- -1.46379 (0.581611), N = 232 moving right + --- -1.37344 (0.618812), N = 211 moving right + --- -1.02845 (0.73217), N = 147 moving right + --- 0.142249 (0.733688), N = 77 moving right + + -- best stat: 0.733688, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 7.1000e+01 9.8551e-01 1.4546e-02 + 1.1000e+02 9.8188e-01 1.8222e-02 + 1.3100e+02 9.7464e-01 2.5602e-02 + 1.7900e+02 9.6739e-01 3.3037e-02 + + +------------ Growing tree 263 -------------- + +- N obs inbag: 276 +- N row inbag: 176 +- max nodes: 205 +- max leaves: 103 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 2 9 17 11 4 + + + -- linear combo weights (showing up to 5) + + 0.1604 0.3016 0.6769 0.8887 0.3388 + + + -- cutpoint (score) + --- 0.428134 (0.522477), N = 265 moving right + --- 1.88728 (0.683985), N = 173 moving right + --- 2.1292 (0.714107), N = 141 moving right + --- 2.30113 (0.728002), N = 131 moving right + --- 3.78109 (0.625323), N = 34 moving right + + -- best stat: 0.728002, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 15 8 16 6 7 + + + -- linear combo weights (showing up to 5) + + 0.1103 1.6006 0.4598 0.0522 3.6934 + + + -- cutpoint (score) + --- -1.35247 (0.518207), N = 259 moving right + --- -1.11337 (0.573598), N = 218 moving right + --- -1.02965 (0.626594), N = 193 moving right + --- 1.25385 (0.685047), N = 43 moving right + --- 4.0666 (0.627552), N = 25 moving right + + -- best stat: 0.685047, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 17 9 13 14 7 + + + -- linear combo weights (showing up to 5) + + 0.5958 0.1407 0.2972 0.5890 6.5306 + + + -- cutpoint (score) + --- 1.33505 (0.648842), N = 186 moving right + --- 1.62589 (0.71444), N = 150 moving right + --- 2.52416 (0.671819), N = 62 moving right + --- 2.59944 (0.662195), N = 50 moving right + --- 9.12444 (0.577619), N = 14 moving right + + -- best stat: 0.71444, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.1000e+01 9.8913e-01 1.0909e-02 + 7.7000e+01 9.8551e-01 1.4572e-02 + 1.3100e+02 9.8188e-01 1.8249e-02 + + +------------ Growing tree 264 -------------- + +- N obs inbag: 276 +- N row inbag: 174 +- max nodes: 229 +- max leaves: 115 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 0 12 7 17 11 + + + -- linear combo weights (showing up to 5) + + -0.0107 0.0488 1.8053 0.4263 1.3230 + + + -- cutpoint (score) + --- 0.341094 (0.649075), N = 209 moving right + --- 0.366813 (0.659443), N = 201 moving right + --- 0.598417 (0.671056), N = 183 moving right + --- 1.10952 (0.741685), N = 122 moving right + --- 3.16996 (0.630951), N = 38 moving right + + -- best stat: 0.741685, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 7 13 1 14 10 + + + -- linear combo weights (showing up to 5) + + 3.7476 0.4205 0.4360 0.4139 -0.5803 + + + -- cutpoint (score) + --- -1.42084 (0.527911), N = 252 moving right + --- -0.873002 (0.613657), N = 210 moving right + --- -0.332252 (0.658158), N = 167 moving right + --- -0.319488 (0.664296), N = 165 moving right + --- -0.119608 (0.686422), N = 141 moving right + + -- best stat: 0.686422, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 6 7 10 1 3 + + + -- linear combo weights (showing up to 5) + + 0.6635 2.7713 -0.5435 0.2379 2.5819 + + + -- cutpoint (score) + --- -0.642467 (0.560406), N = 225 moving right + --- -0.402421 (0.614818), N = 195 moving right + --- -0.320181 (0.628297), N = 184 moving right + --- 0.254679 (0.675846), N = 99 moving right + --- 0.639284 (0.657826), N = 64 moving right + + -- best stat: 0.675846, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 3.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + 3.0400e+02 1.0000e+00 4.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8188e-01 1.8195e-02 + 1.1000e+02 9.7826e-01 2.1885e-02 + 1.3100e+02 9.7101e-01 2.9293e-02 + 1.7900e+02 9.6739e-01 3.3024e-02 + + +------------ Growing tree 265 -------------- + +- N obs inbag: 276 +- N row inbag: 182 +- max nodes: 233 +- max leaves: 117 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 5 8 3 16 14 + + + -- linear combo weights (showing up to 5) + + 0.5344 1.4839 6.4788 0.2850 -0.0655 + + + -- cutpoint (score) + --- -0.984426 (0.575604), N = 236 moving right + --- -0.715478 (0.703306), N = 169 moving right + --- 1.07992 (0.692748), N = 46 moving right + --- 1.27823 (0.673616), N = 39 moving right + --- 6.4321 (0.592636), N = 16 moving right + + -- best stat: 0.703306, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 1 8 17 11 6 + + + -- linear combo weights (showing up to 5) + + 0.5314 1.5536 0.5020 0.8105 0.4740 + + + -- cutpoint (score) + --- 0.0409433 (0.634214), N = 196 moving right + --- 1.22258 (0.774209), N = 112 moving right + --- 2.16816 (0.773997), N = 70 moving right + --- 3.02155 (0.685446), N = 46 moving right + --- 5.77967 (0.580729), N = 14 moving right + + -- best stat: 0.774209, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 0 5 15 12 17 + + + -- linear combo weights (showing up to 5) + + -0.5977 0.7323 0.0534 0.1429 0.7013 + + + -- cutpoint (score) + --- 0.774505 (0.546646), N = 254 moving right + --- 2.13718 (0.675311), N = 132 moving right + --- 2.14759 (0.686255), N = 126 moving right + --- 2.7904 (0.619706), N = 51 moving right + --- 2.94257 (0.605815), N = 28 moving right + + -- best stat: 0.686255, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 3.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.8913e-01 1.0896e-02 + 1.3100e+02 9.8551e-01 1.4559e-02 + 1.4000e+02 9.8188e-01 1.8235e-02 + 1.7900e+02 9.7464e-01 2.5615e-02 + + +------------ Growing tree 266 -------------- + +- N obs inbag: 276 +- N row inbag: 164 +- max nodes: 215 +- max leaves: 108 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 3 0 4 17 2 + + + -- linear combo weights (showing up to 5) + + 8.9030 -0.1587 0.3469 0.3406 -0.5619 + + + -- cutpoint (score) + --- -0.0393834 (0.572312), N = 242 moving right + --- 0.181939 (0.616931), N = 213 moving right + --- 0.340593 (0.676476), N = 172 moving right + --- 0.800455 (0.677833), N = 112 moving right + --- 0.988672 (0.691), N = 65 moving right + + -- best stat: 0.691, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 14 13 17 11 2 + + + -- linear combo weights (showing up to 5) + + 0.2117 0.4382 0.4805 1.0144 0.2902 + + + -- cutpoint (score) + --- -0.393769 (0.519974), N = 265 moving right + --- 0.646002 (0.627119), N = 202 moving right + --- 2.1911 (0.721251), N = 81 moving right + --- 3.11587 (0.653076), N = 42 moving right + --- 4.18097 (0.592286), N = 20 moving right + + -- best stat: 0.721251, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 4 17 15 13 10 + + + -- linear combo weights (showing up to 5) + + 0.2378 0.4749 0.1262 0.5640 -0.9548 + + + -- cutpoint (score) + --- 0.822524 (0.618177), N = 198 moving right + --- 1.12456 (0.660883), N = 166 moving right + --- 1.91621 (0.730549), N = 98 moving right + --- 3.05896 (0.670737), N = 47 moving right + --- 3.73171 (0.596446), N = 21 moving right + + -- best stat: 0.730549, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 5.0000e+00 + 7.7000e+01 1.0000e+00 3.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 3.0000e+00 + 2.2300e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.8188e-01 1.8116e-02 + 7.7000e+01 9.7101e-01 2.9186e-02 + 1.1000e+02 9.6739e-01 3.2917e-02 + 1.3100e+02 9.6377e-01 3.6663e-02 + 1.4000e+02 9.5652e-01 4.4182e-02 + + +------------ Growing tree 267 -------------- + +- N obs inbag: 276 +- N row inbag: 180 +- max nodes: 235 +- max leaves: 118 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 5 9 10 0 17 + + + -- linear combo weights (showing up to 5) + + 0.6083 0.5291 -0.7287 -0.2139 0.4446 + + + -- cutpoint (score) + --- -0.0230234 (0.550755), N = 246 moving right + --- 0.917697 (0.67564), N = 168 moving right + --- 1.25316 (0.711133), N = 122 moving right + --- 2.26038 (0.63988), N = 48 moving right + --- 2.97394 (0.587053), N = 20 moving right + + -- best stat: 0.711133, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 1 11 13 14 0 + + + -- linear combo weights (showing up to 5) + + 0.6394 0.7519 0.3697 0.1870 -0.2383 + + + -- cutpoint (score) + --- -0.492817 (0.697749), N = 145 moving right + --- 0.273042 (0.725897), N = 81 moving right + --- 0.49415 (0.709407), N = 62 moving right + --- 0.542523 (0.70051), N = 58 moving right + --- 2.31713 (0.525234), N = 7 moving right + + -- best stat: 0.725897, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 4 14 16 17 10 + + + -- linear combo weights (showing up to 5) + + 0.4829 0.3748 0.5392 0.3047 -0.8111 + + + -- cutpoint (score) + --- -0.941163 (0.507977), N = 265 moving right + --- 0.186841 (0.602048), N = 209 moving right + --- 0.253721 (0.627052), N = 198 moving right + --- 0.472817 (0.655296), N = 177 moving right + --- 1.41574 (0.708698), N = 91 moving right + + -- best stat: 0.708698, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.9275e-01 7.2596e-03 + 7.7000e+01 9.8913e-01 1.0909e-02 + 1.1000e+02 9.8188e-01 1.8235e-02 + 1.7900e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 268 -------------- + +- N obs inbag: 276 +- N row inbag: 172 +- max nodes: 213 +- max leaves: 107 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 17 7 0 5 3 + + + -- linear combo weights (showing up to 5) + + 0.5309 3.1613 0.1092 0.3676 4.3377 + + + -- cutpoint (score) + --- 1.17093 (0.603563), N = 211 moving right + --- 1.70183 (0.665144), N = 117 moving right + --- 2.06941 (0.6651), N = 81 moving right + --- 2.49115 (0.613308), N = 30 moving right + --- 6.57041 (0.569194), N = 13 moving right + + -- best stat: 0.665144, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 15 0 9 10 16 + + + -- linear combo weights (showing up to 5) + + 0.0220 0.2413 0.4463 -0.6004 0.5628 + + + -- cutpoint (score) + --- -0.978856 (0.531258), N = 239 moving right + --- -0.818537 (0.572066), N = 221 moving right + --- 0.194538 (0.703646), N = 106 moving right + --- 1.34908 (0.615766), N = 30 moving right + --- 1.87285 (0.521644), N = 13 moving right + + -- best stat: 0.703646, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 5 8 9 1 17 + + + -- linear combo weights (showing up to 5) + + 0.3622 1.5998 -0.0659 0.2731 0.4428 + + + -- cutpoint (score) + --- 0.707925 (0.731924), N = 137 moving right + --- 0.708172 (0.733838), N = 136 moving right + --- 1.01178 (0.740407), N = 120 moving right + --- 1.8133 (0.698817), N = 55 moving right + --- 3.00935 (0.603802), N = 25 moving right + + -- best stat: 0.740407, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + 3.2600e+02 1.0000e+00 3.0000e+00 + 3.3400e+02 1.0000e+00 1.0000e+00 + 3.4800e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 1.3100e+02 9.9275e-01 7.2596e-03 + 1.8600e+02 9.8913e-01 1.0909e-02 + 1.9100e+02 9.8188e-01 1.8235e-02 + 1.9800e+02 9.7464e-01 2.5615e-02 + + +------------ Growing tree 269 -------------- + +- N obs inbag: 276 +- N row inbag: 179 +- max nodes: 233 +- max leaves: 117 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 14 4 2 9 7 + + + -- linear combo weights (showing up to 5) + + 0.2641 0.6180 -0.6014 0.5142 13.3239 + + + -- cutpoint (score) + --- -0.496568 (0.666024), N = 181 moving right + --- -0.406379 (0.686398), N = 162 moving right + --- -0.264779 (0.684028), N = 129 moving right + --- 0.32522 (0.68197), N = 59 moving right + --- 0.879065 (0.639863), N = 44 moving right + + -- best stat: 0.686398, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 1 4 11 10 17 + + + -- linear combo weights (showing up to 5) + + 0.4895 0.1149 1.1126 -0.5284 0.2881 + + + -- cutpoint (score) + --- 0.000240045 (0.656287), N = 188 moving right + --- 0.0262407 (0.667016), N = 183 moving right + --- 0.133008 (0.683936), N = 173 moving right + --- 1.2754 (0.752903), N = 89 moving right + --- 2.12141 (0.703575), N = 70 moving right + + -- best stat: 0.752903, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 14 11 4 7 15 + + + -- linear combo weights (showing up to 5) + + 0.2536 0.8404 0.5100 12.1019 0.1324 + + + -- cutpoint (score) + --- -1.05987 (0.511023), N = 271 moving right + --- -0.302837 (0.688419), N = 183 moving right + --- -0.0264946 (0.708499), N = 148 moving right + --- 0.44097 (0.724317), N = 107 moving right + --- 1.12873 (0.686728), N = 61 moving right + + -- best stat: 0.724317, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 3.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 3.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8551e-01 1.4532e-02 + 7.1000e+01 9.8188e-01 1.8209e-02 + 7.7000e+01 9.7826e-01 2.1899e-02 + 1.1000e+02 9.7464e-01 2.5602e-02 + + +------------ Growing tree 270 -------------- + +- N obs inbag: 276 +- N row inbag: 175 +- max nodes: 221 +- max leaves: 111 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 1 8 0 3 17 + + + -- linear combo weights (showing up to 5) + + 0.2132 1.5687 -0.1543 6.0314 0.2307 + + + -- cutpoint (score) + --- -0.774347 (0.522623), N = 262 moving right + --- -0.32999 (0.602494), N = 213 moving right + --- 0.0534261 (0.700223), N = 142 moving right + --- 0.382794 (0.734469), N = 99 moving right + --- 1.46148 (0.678334), N = 46 moving right + + -- best stat: 0.734469, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 10 4 9 17 13 + + + -- linear combo weights (showing up to 5) + + -0.6204 0.2930 0.1008 0.3817 0.3435 + + + -- cutpoint (score) + --- 0.285486 (0.564663), N = 236 moving right + --- 1.08514 (0.661434), N = 154 moving right + --- 1.31213 (0.692875), N = 127 moving right + --- 1.76559 (0.669428), N = 89 moving right + --- 2.16326 (0.658695), N = 54 moving right + + -- best stat: 0.692875, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 15 13 11 17 0 + + + -- linear combo weights (showing up to 5) + + -0.0611 0.3079 0.8304 0.4360 -0.4396 + + + -- cutpoint (score) + --- -0.0471586 (0.574393), N = 239 moving right + --- 0.691014 (0.637141), N = 170 moving right + --- 0.715675 (0.639212), N = 169 moving right + --- 2.46365 (0.620775), N = 30 moving right + --- 3.10806 (0.531485), N = 8 moving right + + -- best stat: 0.639212, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 4.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.8551e-01 1.4559e-02 + 1.1000e+02 9.8188e-01 1.8235e-02 + 1.3100e+02 9.7464e-01 2.5615e-02 + + +------------ Growing tree 271 -------------- + +- N obs inbag: 276 +- N row inbag: 176 +- max nodes: 203 +- max leaves: 102 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 4 15 14 13 9 + + + -- linear combo weights (showing up to 5) + + 0.6047 -0.2060 0.2461 0.2357 0.2958 + + + -- cutpoint (score) + --- -0.878215 (0.506687), N = 271 moving right + --- -0.821126 (0.514756), N = 266 moving right + --- -0.241866 (0.58807), N = 207 moving right + --- 0.453761 (0.640832), N = 112 moving right + --- 1.39699 (0.546364), N = 20 moving right + + -- best stat: 0.640832, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 1 11 5 16 15 + + + -- linear combo weights (showing up to 5) + + 0.6350 1.4490 0.8536 0.3548 -0.0803 + + + -- cutpoint (score) + --- -1.63397 (0.577103), N = 242 moving right + --- -1.61224 (0.580647), N = 241 moving right + --- -0.376081 (0.750011), N = 118 moving right + --- 0.195994 (0.768802), N = 90 moving right + --- 1.72709 (0.643774), N = 39 moving right + + -- best stat: 0.768802, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 4 10 2 5 14 + + + -- linear combo weights (showing up to 5) + + 0.0429 -0.9165 -1.4570 0.9311 0.2675 + + + -- cutpoint (score) + --- -1.1629 (0.692836), N = 133 moving right + --- -1.09071 (0.67614), N = 127 moving right + --- -0.6685 (0.673086), N = 98 moving right + --- -0.659684 (0.664438), N = 97 moving right + --- 0.24367 (0.655298), N = 32 moving right + + -- best stat: 0.692836, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + 3.3400e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 1.1000e+02 9.9275e-01 7.2596e-03 + 1.3100e+02 9.8913e-01 1.0909e-02 + 1.4000e+02 9.8188e-01 1.8235e-02 + 1.7900e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 272 -------------- + +- N obs inbag: 276 +- N row inbag: 168 +- max nodes: 215 +- max leaves: 108 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 3 7 14 12 17 + + + -- linear combo weights (showing up to 5) + + 17.5797 5.2551 0.1138 0.0219 0.5156 + + + -- cutpoint (score) + --- 1.08213 (0.605861), N = 199 moving right + --- 1.62677 (0.690037), N = 102 moving right + --- 1.99039 (0.667406), N = 57 moving right + --- 2.00076 (0.656621), N = 53 moving right + --- 2.0364 (0.621519), N = 38 moving right + + -- best stat: 0.690037, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 7 3 1 4 11 + + + -- linear combo weights (showing up to 5) + + 4.2517 18.2010 0.4891 0.5905 0.6913 + + + -- cutpoint (score) + --- -0.574915 (0.591843), N = 222 moving right + --- -0.527097 (0.604868), N = 217 moving right + --- -0.230555 (0.655166), N = 187 moving right + --- 2.03836 (0.616346), N = 20 moving right + --- 22.6615 (0.548127), N = 7 moving right + + -- best stat: 0.655166, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 17 5 14 0 6 + + + -- linear combo weights (showing up to 5) + + 0.5739 1.2355 0.3058 -0.5710 -0.0363 + + + -- cutpoint (score) + --- 0.810604 (0.570528), N = 240 moving right + --- 1.32986 (0.624936), N = 163 moving right + --- 1.39897 (0.654658), N = 149 moving right + --- 1.58591 (0.652095), N = 129 moving right + --- 1.93722 (0.650155), N = 97 moving right + + -- best stat: 0.654658, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.1000e+01 9.8913e-01 1.0909e-02 + 1.1000e+02 9.8188e-01 1.8235e-02 + 1.4000e+02 9.7464e-01 2.5615e-02 + + +------------ Growing tree 273 -------------- + +- N obs inbag: 276 +- N row inbag: 172 +- max nodes: 241 +- max leaves: 121 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 14 13 0 1 5 + + + -- linear combo weights (showing up to 5) + + 0.2287 0.5086 0.1362 0.4609 0.7785 + + + -- cutpoint (score) + --- -0.591259 (0.563108), N = 242 moving right + --- -0.264435 (0.653648), N = 198 moving right + --- 0.582952 (0.710341), N = 91 moving right + --- 0.684264 (0.677942), N = 79 moving right + --- 1.22537 (0.614512), N = 43 moving right + + -- best stat: 0.710341, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 11 2 3 1 16 + + + -- linear combo weights (showing up to 5) + + 0.5612 0.4678 3.6244 0.1394 0.1066 + + + -- cutpoint (score) + --- -0.0105689 (0.600455), N = 223 moving right + --- 0.238041 (0.71014), N = 147 moving right + --- 0.652671 (0.678727), N = 83 moving right + --- 1.57494 (0.623643), N = 34 moving right + --- 2.25359 (0.606327), N = 24 moving right + + -- best stat: 0.71014, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 1 5 16 14 4 + + + -- linear combo weights (showing up to 5) + + 0.3217 0.5747 0.2229 0.3253 0.7282 + + + -- cutpoint (score) + --- -0.501387 (0.534772), N = 252 moving right + --- -0.209323 (0.57966), N = 228 moving right + --- 0.689426 (0.679913), N = 121 moving right + --- 0.728941 (0.68289), N = 113 moving right + --- 1.40161 (0.600796), N = 41 moving right + + -- best stat: 0.68289, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 3.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.1000e+01 9.8551e-01 1.4559e-02 + 1.1000e+02 9.7826e-01 2.1912e-02 + 1.7900e+02 9.6739e-01 3.3023e-02 + + +------------ Growing tree 274 -------------- + +- N obs inbag: 276 +- N row inbag: 172 +- max nodes: 227 +- max leaves: 114 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 13 16 11 0 6 + + + -- linear combo weights (showing up to 5) + + 0.2190 0.7424 1.0048 0.0768 1.0478 + + + -- cutpoint (score) + --- -1.75649 (0.50577), N = 271 moving right + --- -1.37271 (0.54159), N = 243 moving right + --- -0.740089 (0.662606), N = 180 moving right + --- -0.214047 (0.719725), N = 121 moving right + --- -0.0190091 (0.707198), N = 111 moving right + + -- best stat: 0.719725, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 17 7 3 15 2 + + + -- linear combo weights (showing up to 5) + + 0.3875 6.8229 4.8717 -0.1651 -0.3524 + + + -- cutpoint (score) + --- 0.509087 (0.594097), N = 218 moving right + --- 1.02559 (0.672472), N = 95 moving right + --- 1.4419 (0.64491), N = 41 moving right + --- 5.82605 (0.615203), N = 25 moving right + --- 6.71392 (0.593325), N = 18 moving right + + -- best stat: 0.672472, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 10 17 2 9 13 + + + -- linear combo weights (showing up to 5) + + -0.8483 0.5361 -0.4175 0.4030 0.0925 + + + -- cutpoint (score) + --- 0.569559 (0.640921), N = 195 moving right + --- 2.25219 (0.670199), N = 45 moving right + --- 3.14438 (0.583394), N = 20 moving right + --- 3.35135 (0.56246), N = 17 moving right + --- 3.45197 (0.551371), N = 13 moving right + + -- best stat: 0.670199, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 3.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 3.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 5.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.1000e+01 9.8551e-01 1.4559e-02 + 7.7000e+01 9.8188e-01 1.8235e-02 + 1.1000e+02 9.7101e-01 2.9306e-02 + + +------------ Growing tree 275 -------------- + +- N obs inbag: 276 +- N row inbag: 170 +- max nodes: 203 +- max leaves: 102 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 10 11 13 0 4 + + + -- linear combo weights (showing up to 5) + + -0.6367 0.7826 0.2736 -0.1279 0.6338 + + + -- cutpoint (score) + --- -1.01235 (0.584108), N = 223 moving right + --- -0.916952 (0.604302), N = 214 moving right + --- -0.194396 (0.700502), N = 147 moving right + --- 0.226554 (0.70602), N = 115 moving right + --- 1.538 (0.669297), N = 40 moving right + + -- best stat: 0.70602, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 17 10 9 1 4 + + + -- linear combo weights (showing up to 5) + + 0.4774 -0.5538 0.4865 0.4149 0.4018 + + + -- cutpoint (score) + --- 1.18664 (0.72025), N = 156 moving right + --- 1.73986 (0.721377), N = 103 moving right + --- 2.10848 (0.715061), N = 83 moving right + --- 2.78776 (0.672279), N = 45 moving right + --- 2.79127 (0.668921), N = 44 moving right + + -- best stat: 0.721377, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 17 16 2 10 0 + + + -- linear combo weights (showing up to 5) + + 0.5810 0.5772 -1.2392 -0.7001 -0.2771 + + + -- cutpoint (score) + --- -0.74014 (0.571898), N = 231 moving right + --- -0.21227 (0.682751), N = 165 moving right + --- -0.191909 (0.671175), N = 163 moving right + --- 0.405106 (0.726754), N = 120 moving right + --- 1.96129 (0.639922), N = 33 moving right + + -- best stat: 0.726754, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 5.0000e+00 + 2.1600e+02 1.0000e+00 3.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.7000e+01 9.8913e-01 1.0909e-02 + 1.1000e+02 9.8551e-01 1.4572e-02 + 1.7900e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 276 -------------- + +- N obs inbag: 276 +- N row inbag: 174 +- max nodes: 221 +- max leaves: 111 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 15 16 11 7 8 + + + -- linear combo weights (showing up to 5) + + -0.1161 0.3206 0.9043 3.7496 1.3020 + + + -- cutpoint (score) + --- -1.71974 (0.541916), N = 251 moving right + --- -1.42568 (0.614751), N = 213 moving right + --- 0.726737 (0.708639), N = 63 moving right + --- 1.08606 (0.686099), N = 51 moving right + --- 5.57239 (0.581905), N = 15 moving right + + -- best stat: 0.708639, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 8 14 4 9 1 + + + -- linear combo weights (showing up to 5) + + 2.1004 0.0540 0.2518 -0.2998 0.5851 + + + -- cutpoint (score) + --- -1.1369 (0.580523), N = 209 moving right + --- -0.964472 (0.612845), N = 191 moving right + --- -0.893237 (0.628409), N = 182 moving right + --- -0.567349 (0.724999), N = 137 moving right + --- 0.781028 (0.692781), N = 44 moving right + + -- best stat: 0.724999, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 10 8 3 0 4 + + + -- linear combo weights (showing up to 5) + + -0.4578 1.6346 5.2026 -0.2756 0.0964 + + + -- cutpoint (score) + --- -1.38453 (0.585257), N = 227 moving right + --- -0.945603 (0.648393), N = 180 moving right + --- -0.645336 (0.724727), N = 138 moving right + --- -0.575838 (0.743056), N = 126 moving right + --- 0.29317 (0.708408), N = 68 moving right + + -- best stat: 0.743056, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 3.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + 3.4800e+02 1.0000e+00 2.0000e+00 + 4.6000e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.8913e-01 1.0870e-02 + 5.1000e+01 9.8188e-01 1.8196e-02 + 1.4000e+02 9.7464e-01 2.5576e-02 + 1.7900e+02 9.7101e-01 2.9293e-02 + 1.9100e+02 9.6739e-01 3.3024e-02 + + +------------ Growing tree 277 -------------- + +- N obs inbag: 276 +- N row inbag: 173 +- max nodes: 251 +- max leaves: 126 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 2 0 1 8 13 + + + -- linear combo weights (showing up to 5) + + -0.3257 -0.1205 0.3045 2.3180 -0.0700 + + + -- cutpoint (score) + --- -1.71812 (0.579726), N = 227 moving right + --- -1.42674 (0.65002), N = 181 moving right + --- -1.34381 (0.686967), N = 159 moving right + --- 0.862059 (0.646223), N = 38 moving right + --- 2.68418 (0.588474), N = 16 moving right + + -- best stat: 0.686967, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 4 15 8 16 3 + + + -- linear combo weights (showing up to 5) + + 0.1450 -0.0350 1.7472 0.2621 5.0700 + + + -- cutpoint (score) + --- -1.25439 (0.512387), N = 261 moving right + --- -1.22175 (0.521448), N = 258 moving right + --- -1.12507 (0.547671), N = 239 moving right + --- -0.766582 (0.69229), N = 157 moving right + --- 1.73663 (0.658434), N = 35 moving right + + -- best stat: 0.69229, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 17 16 15 8 13 + + + -- linear combo weights (showing up to 5) + + 0.2758 0.3838 -0.0528 2.0759 -0.0387 + + + -- cutpoint (score) + --- -0.632633 (0.59411), N = 222 moving right + --- -0.405657 (0.632838), N = 194 moving right + --- 0.20139 (0.732955), N = 134 moving right + --- 0.734534 (0.737847), N = 101 moving right + --- 4.08209 (0.582955), N = 15 moving right + + -- best stat: 0.737847, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 3.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 3.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.9275e-01 7.2596e-03 + 7.7000e+01 9.8551e-01 1.4559e-02 + 1.1000e+02 9.7464e-01 2.5588e-02 + 1.3100e+02 9.7101e-01 2.9306e-02 + + +------------ Growing tree 278 -------------- + +- N obs inbag: 276 +- N row inbag: 172 +- max nodes: 225 +- max leaves: 113 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 13 6 3 10 8 + + + -- linear combo weights (showing up to 5) + + 0.0906 0.5972 4.8724 -0.3397 1.3828 + + + -- cutpoint (score) + --- -0.956071 (0.592202), N = 218 moving right + --- -0.688907 (0.674822), N = 177 moving right + --- -0.583141 (0.701708), N = 161 moving right + --- 4.55621 (0.599864), N = 20 moving right + --- 6.51973 (0.567456), N = 11 moving right + + -- best stat: 0.701708, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 8 10 11 5 7 + + + -- linear combo weights (showing up to 5) + + 1.2824 -0.5462 0.4204 0.4357 1.5214 + + + -- cutpoint (score) + --- -1.79854 (0.507582), N = 268 moving right + --- -1.65609 (0.517644), N = 257 moving right + --- -1.30086 (0.560475), N = 235 moving right + --- 0.152247 (0.762903), N = 105 moving right + --- 2.04687 (0.640554), N = 26 moving right + + -- best stat: 0.762903, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 7 0 17 12 15 + + + -- linear combo weights (showing up to 5) + + 3.1772 -0.2187 0.8053 0.1744 -0.0534 + + + -- cutpoint (score) + --- 1.57681 (0.601724), N = 217 moving right + --- 1.92728 (0.616108), N = 209 moving right + --- 2.3511 (0.66854), N = 121 moving right + --- 2.97485 (0.661339), N = 74 moving right + --- 3.25073 (0.613247), N = 30 moving right + + -- best stat: 0.66854, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.1000e+01 9.8913e-01 1.0909e-02 + 7.7000e+01 9.8551e-01 1.4572e-02 + 1.1000e+02 9.8188e-01 1.8249e-02 + + +------------ Growing tree 279 -------------- + +- N obs inbag: 276 +- N row inbag: 173 +- max nodes: 205 +- max leaves: 103 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 0 4 12 17 15 + + + -- linear combo weights (showing up to 5) + + -0.1757 0.4545 0.0887 0.4718 0.0374 + + + -- cutpoint (score) + --- 1.27183 (0.639998), N = 191 moving right + --- 1.44904 (0.647915), N = 158 moving right + --- 2.31147 (0.536172), N = 18 moving right + --- 2.33217 (0.523867), N = 13 moving right + --- 2.34776 (0.505502), N = 9 moving right + + -- best stat: 0.647915, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 7 10 9 5 8 + + + -- linear combo weights (showing up to 5) + + 0.8085 -0.5893 -0.4373 0.5105 2.2804 + + + -- cutpoint (score) + --- -2.00551 (0.509426), N = 266 moving right + --- -1.46961 (0.585508), N = 234 moving right + --- -1.43042 (0.589223), N = 231 moving right + --- -1.11394 (0.667905), N = 186 moving right + --- 0.695829 (0.7487), N = 76 moving right + + -- best stat: 0.7487, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 0 10 12 14 17 + + + -- linear combo weights (showing up to 5) + + -0.3001 -0.7962 -0.0959 0.7942 0.3969 + + + -- cutpoint (score) + --- -0.0374933 (0.615736), N = 220 moving right + --- 0.0843478 (0.631895), N = 213 moving right + --- 0.24318 (0.641066), N = 207 moving right + --- 0.462693 (0.660638), N = 188 moving right + --- 0.693912 (0.693606), N = 165 moving right + + -- best stat: 0.693606, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 3.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 3.0000e+00 + 2.1600e+02 1.0000e+00 3.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.9275e-01 7.2596e-03 + 7.7000e+01 9.8551e-01 1.4559e-02 + 1.3100e+02 9.7464e-01 2.5588e-02 + 1.4000e+02 9.6739e-01 3.3023e-02 + + +------------ Growing tree 280 -------------- + +- N obs inbag: 276 +- N row inbag: 176 +- max nodes: 237 +- max leaves: 119 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 11 10 17 7 13 + + + -- linear combo weights (showing up to 5) + + 0.7749 -0.4134 0.6097 2.3286 0.2314 + + + -- cutpoint (score) + --- 1.17742 (0.667292), N = 187 moving right + --- 1.31644 (0.680544), N = 177 moving right + --- 2.24899 (0.752746), N = 113 moving right + --- 2.2866 (0.747645), N = 109 moving right + --- 3.67823 (0.65234), N = 43 moving right + + -- best stat: 0.752746, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 6 16 5 15 10 + + + -- linear combo weights (showing up to 5) + + 0.8198 0.5861 0.8402 -0.0677 -0.5802 + + + -- cutpoint (score) + --- -0.802482 (0.569329), N = 238 moving right + --- -0.27171 (0.63252), N = 185 moving right + --- -0.243422 (0.63639), N = 178 moving right + --- -0.210945 (0.648763), N = 167 moving right + --- 1.89535 (0.640202), N = 34 moving right + + -- best stat: 0.648763, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 1 14 11 6 5 + + + -- linear combo weights (showing up to 5) + + 0.4262 0.2604 0.9802 1.2570 0.5958 + + + -- cutpoint (score) + --- -1.10437 (0.562566), N = 248 moving right + --- -0.733063 (0.625777), N = 215 moving right + --- -0.585714 (0.65234), N = 191 moving right + --- 1.1969 (0.679586), N = 55 moving right + --- 1.7655 (0.658692), N = 42 moving right + + -- best stat: 0.679586, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 3.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.1000e+01 9.8551e-01 1.4559e-02 + 7.7000e+01 9.8188e-01 1.8235e-02 + 1.1000e+02 9.7101e-01 2.9306e-02 + + +------------ Growing tree 281 -------------- + +- N obs inbag: 276 +- N row inbag: 182 +- max nodes: 213 +- max leaves: 107 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 8 5 6 11 0 + + + -- linear combo weights (showing up to 5) + + 1.8088 0.3246 1.0227 0.3273 -0.0769 + + + -- cutpoint (score) + --- -1.34724 (0.575103), N = 236 moving right + --- -0.0598206 (0.736871), N = 103 moving right + --- 0.277718 (0.732964), N = 76 moving right + --- 0.326505 (0.724655), N = 72 moving right + --- 1.69738 (0.648719), N = 37 moving right + + -- best stat: 0.736871, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 12 11 1 3 0 + + + -- linear combo weights (showing up to 5) + + -0.0189 0.6563 0.2881 5.5281 -0.1764 + + + -- cutpoint (score) + --- -0.748178 (0.562153), N = 241 moving right + --- -0.459536 (0.676126), N = 174 moving right + --- -0.43702 (0.679676), N = 172 moving right + --- -0.341231 (0.714719), N = 151 moving right + --- 0.0756574 (0.733956), N = 90 moving right + + -- best stat: 0.733956, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 13 12 14 5 1 + + + -- linear combo weights (showing up to 5) + + 0.4536 -0.0405 0.4519 1.1612 0.5657 + + + -- cutpoint (score) + --- -0.467084 (0.599655), N = 227 moving right + --- -0.337001 (0.614707), N = 214 moving right + --- -0.108854 (0.663057), N = 172 moving right + --- 0.010778 (0.686736), N = 160 moving right + --- 1.19422 (0.629323), N = 51 moving right + + -- best stat: 0.686736, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 3.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.8913e-01 1.0870e-02 + 5.1000e+01 9.8551e-01 1.4533e-02 + 7.7000e+01 9.8188e-01 1.8209e-02 + 1.1000e+02 9.7826e-01 2.1899e-02 + 1.4000e+02 9.7464e-01 2.5603e-02 + + +------------ Growing tree 282 -------------- + +- N obs inbag: 276 +- N row inbag: 177 +- max nodes: 217 +- max leaves: 109 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 13 12 2 4 0 + + + -- linear combo weights (showing up to 5) + + 0.4305 0.0929 -0.0844 0.7793 0.1320 + + + -- cutpoint (score) + --- -0.33493 (0.568245), N = 241 moving right + --- -0.248183 (0.569669), N = 230 moving right + --- -0.16798 (0.595918), N = 217 moving right + --- 1.11364 (0.587787), N = 38 moving right + --- 1.45926 (0.520822), N = 16 moving right + + -- best stat: 0.595918, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 14 17 9 6 7 + + + -- linear combo weights (showing up to 5) + + 0.3763 0.5807 0.5819 0.9756 6.0295 + + + -- cutpoint (score) + --- 0.998026 (0.600355), N = 227 moving right + --- 1.55692 (0.681332), N = 177 moving right + --- 2.05021 (0.712844), N = 106 moving right + --- 2.50198 (0.704094), N = 56 moving right + --- 2.64267 (0.690969), N = 45 moving right + + -- best stat: 0.712844, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 14 9 12 2 6 + + + -- linear combo weights (showing up to 5) + + 0.2558 0.6456 0.1428 0.0180 0.8968 + + + -- cutpoint (score) + --- -0.733683 (0.501073), N = 266 moving right + --- -0.624836 (0.499216), N = 255 moving right + --- -0.558993 (0.498514), N = 239 moving right + --- 0.326885 (0.600768), N = 63 moving right + --- 0.335568 (0.596063), N = 61 moving right + + -- best stat: 0.600768, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 3.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.8913e-01 1.0870e-02 + 5.1000e+01 9.8188e-01 1.8196e-02 + 7.1000e+01 9.7826e-01 2.1886e-02 + 7.7000e+01 9.7464e-01 2.5589e-02 + 1.1000e+02 9.7101e-01 2.9307e-02 + + +------------ Growing tree 283 -------------- + +- N obs inbag: 276 +- N row inbag: 165 +- max nodes: 199 +- max leaves: 100 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 1 4 2 3 0 + + + -- linear combo weights (showing up to 5) + + 0.2339 0.5933 -1.3279 13.4435 -0.4456 + + + -- cutpoint (score) + --- -1.96539 (0.506846), N = 269 moving right + --- -1.79669 (0.530883), N = 249 moving right + --- -1.44799 (0.605078), N = 182 moving right + --- -1.30609 (0.632859), N = 163 moving right + --- -1.20147 (0.647149), N = 148 moving right + + -- best stat: 0.647149, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 17 5 13 11 7 + + + -- linear combo weights (showing up to 5) + + 0.3419 0.2864 0.2751 1.1177 6.6024 + + + -- cutpoint (score) + --- 0.41215 (0.666645), N = 188 moving right + --- 0.479611 (0.667021), N = 184 moving right + --- 1.11966 (0.774248), N = 108 moving right + --- 3.75291 (0.653684), N = 29 moving right + --- 7.2419 (0.615069), N = 22 moving right + + -- best stat: 0.774248, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 4 10 12 0 17 + + + -- linear combo weights (showing up to 5) + + -0.1660 -0.9245 -0.0030 -0.3841 0.7173 + + + -- cutpoint (score) + --- 1.53424 (0.658758), N = 174 moving right + --- 1.60343 (0.668661), N = 169 moving right + --- 1.93964 (0.661992), N = 132 moving right + --- 1.9444 (0.66423), N = 131 moving right + --- 2.35091 (0.676127), N = 92 moving right + + -- best stat: 0.676127, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 4.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.8551e-01 1.4493e-02 + 5.1000e+01 9.7826e-01 2.1846e-02 + 7.7000e+01 9.7464e-01 2.5549e-02 + 1.3100e+02 9.7101e-01 2.9267e-02 + 1.4000e+02 9.6739e-01 3.2998e-02 + + +------------ Growing tree 284 -------------- + +- N obs inbag: 276 +- N row inbag: 171 +- max nodes: 269 +- max leaves: 135 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 6 0 14 9 4 + + + -- linear combo weights (showing up to 5) + + 1.6633 0.1947 0.3520 0.1099 1.1030 + + + -- cutpoint (score) + --- -0.379441 (0.519169), N = 261 moving right + --- -0.0588074 (0.604715), N = 204 moving right + --- 0.780215 (0.685514), N = 138 moving right + --- 0.880702 (0.677595), N = 132 moving right + --- 2.64286 (0.556845), N = 14 moving right + + -- best stat: 0.685514, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 3 9 15 0 16 + + + -- linear combo weights (showing up to 5) + + 5.8696 0.3345 -0.2392 -0.0030 0.8936 + + + -- cutpoint (score) + --- -1.05778 (0.533788), N = 255 moving right + --- -0.30724 (0.634168), N = 168 moving right + --- -0.255011 (0.645562), N = 162 moving right + --- 0.31608 (0.714626), N = 96 moving right + --- 0.799898 (0.700115), N = 63 moving right + + -- best stat: 0.714626, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 9 12 8 15 16 + + + -- linear combo weights (showing up to 5) + + -0.1934 -0.0042 1.8038 -0.3572 0.6858 + + + -- cutpoint (score) + --- -1.45553 (0.577699), N = 238 moving right + --- -1.05994 (0.650185), N = 191 moving right + --- -0.894893 (0.684725), N = 173 moving right + --- -0.537701 (0.749973), N = 136 moving right + --- -0.110324 (0.739708), N = 109 moving right + + -- best stat: 0.749973, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 3.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.9275e-01 7.2596e-03 + 7.7000e+01 9.8551e-01 1.4559e-02 + 1.1000e+02 9.8188e-01 1.8235e-02 + 1.3100e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 285 -------------- + +- N obs inbag: 276 +- N row inbag: 162 +- max nodes: 195 +- max leaves: 98 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 9 5 6 13 10 + + + -- linear combo weights (showing up to 5) + + 0.4691 1.2579 0.6442 0.3434 -0.7881 + + + -- cutpoint (score) + --- -0.158043 (0.666965), N = 161 moving right + --- 0.661816 (0.698103), N = 95 moving right + --- 2.31874 (0.60729), N = 25 moving right + --- 2.31913 (0.610867), N = 23 moving right + --- 2.46995 (0.591924), N = 19 moving right + + -- best stat: 0.698103, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 5 17 14 16 2 + + + -- linear combo weights (showing up to 5) + + 1.0586 0.3613 0.8224 0.5852 0.2115 + + + -- cutpoint (score) + --- 0.753285 (0.617805), N = 205 moving right + --- 1.25437 (0.681897), N = 172 moving right + --- 1.80351 (0.703442), N = 97 moving right + --- 2.24299 (0.683523), N = 67 moving right + --- 2.86919 (0.588862), N = 30 moving right + + -- best stat: 0.703442, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 2 13 11 5 12 + + + -- linear combo weights (showing up to 5) + + 0.1828 0.2693 0.9709 0.9450 0.0312 + + + -- cutpoint (score) + --- -0.908246 (0.514851), N = 254 moving right + --- -0.905046 (0.518537), N = 253 moving right + --- 0.844884 (0.71439), N = 76 moving right + --- 0.876376 (0.718347), N = 73 moving right + --- 0.96621 (0.719377), N = 71 moving right + + -- best stat: 0.719377, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 3.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + 3.3400e+02 1.0000e+00 2.0000e+00 + 5.1500e+02 1.0000e+00 1.0000e+00 + 5.3300e+02 0 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 1.3100e+02 9.9638e-01 3.6232e-03 + 1.7900e+02 9.8551e-01 1.4532e-02 + 1.9800e+02 9.8188e-01 1.8209e-02 + 2.1600e+02 9.7464e-01 2.5589e-02 + 2.2300e+02 9.6739e-01 3.3024e-02 + + +------------ Growing tree 286 -------------- + +- N obs inbag: 276 +- N row inbag: 173 +- max nodes: 239 +- max leaves: 120 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 13 10 6 7 9 + + + -- linear combo weights (showing up to 5) + + 0.1065 -0.4512 0.6488 9.6844 0.1785 + + + -- cutpoint (score) + --- -0.180702 (0.588434), N = 187 moving right + --- -0.0514431 (0.650192), N = 144 moving right + --- 0.321667 (0.69077), N = 82 moving right + --- 0.491753 (0.68837), N = 65 moving right + --- 0.582561 (0.694439), N = 59 moving right + + -- best stat: 0.694439, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 7 15 10 1 2 + + + -- linear combo weights (showing up to 5) + + 9.9514 0.0098 -0.5173 0.2903 -0.9745 + + + -- cutpoint (score) + --- -1.26321 (0.643291), N = 187 moving right + --- -0.911523 (0.663183), N = 136 moving right + --- -0.679301 (0.668577), N = 108 moving right + --- 0.133478 (0.624132), N = 34 moving right + --- 1.24296 (0.600353), N = 19 moving right + + -- best stat: 0.668577, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 1 5 15 6 12 + + + -- linear combo weights (showing up to 5) + + 0.3260 2.2394 -0.1792 -0.0404 0.1933 + + + -- cutpoint (score) + --- -0.403559 (0.573718), N = 228 moving right + --- -0.336102 (0.580401), N = 220 moving right + --- -0.0214028 (0.644005), N = 163 moving right + --- -0.0048043 (0.646186), N = 162 moving right + --- 0.0725386 (0.673595), N = 145 moving right + + -- best stat: 0.673595, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 4.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.8913e-01 1.0896e-02 + 1.1000e+02 9.8188e-01 1.8222e-02 + 1.3100e+02 9.7464e-01 2.5602e-02 + 1.4000e+02 9.7101e-01 2.9319e-02 + + +------------ Growing tree 287 -------------- + +- N obs inbag: 276 +- N row inbag: 177 +- max nodes: 223 +- max leaves: 112 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 8 3 2 13 11 + + + -- linear combo weights (showing up to 5) + + 1.4161 3.1016 0.3149 0.2692 0.5457 + + + -- cutpoint (score) + --- -1.30173 (0.529247), N = 257 moving right + --- -0.738158 (0.656014), N = 187 moving right + --- -0.675926 (0.675244), N = 178 moving right + --- -0.491631 (0.702487), N = 156 moving right + --- 0.222983 (0.75218), N = 103 moving right + + -- best stat: 0.75218, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 14 0 5 4 3 + + + -- linear combo weights (showing up to 5) + + 0.2926 -0.1940 1.0117 0.6077 4.6490 + + + -- cutpoint (score) + --- 0.0929947 (0.655445), N = 176 moving right + --- 0.46432 (0.676088), N = 132 moving right + --- 0.768497 (0.667387), N = 95 moving right + --- 0.790287 (0.661966), N = 88 moving right + --- 6.26844 (0.53233), N = 9 moving right + + -- best stat: 0.676088, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 11 12 15 3 8 + + + -- linear combo weights (showing up to 5) + + 0.4900 0.2757 -0.3018 2.8096 1.5052 + + + -- cutpoint (score) + --- -1.37702 (0.588879), N = 226 moving right + --- -1.11252 (0.657271), N = 196 moving right + --- 0.590296 (0.718141), N = 68 moving right + --- 5.99364 (0.586011), N = 16 moving right + --- 8.32538 (0.558257), N = 10 moving right + + -- best stat: 0.718141, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 3.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 3.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.8913e-01 1.0870e-02 + 5.1000e+01 9.8551e-01 1.4533e-02 + 7.1000e+01 9.7464e-01 2.5562e-02 + 7.7000e+01 9.6739e-01 3.2997e-02 + 1.3100e+02 9.6014e-01 4.0488e-02 + + +------------ Growing tree 288 -------------- + +- N obs inbag: 276 +- N row inbag: 173 +- max nodes: 205 +- max leaves: 103 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 16 17 4 6 14 + + + -- linear combo weights (showing up to 5) + + 0.4425 0.6322 0.3476 -1.1576 0.5919 + + + -- cutpoint (score) + --- 1.40494 (0.617944), N = 196 moving right + --- 2.19761 (0.718053), N = 119 moving right + --- 2.49355 (0.711375), N = 80 moving right + --- 2.77888 (0.684623), N = 53 moving right + --- 3.02765 (0.634729), N = 29 moving right + + -- best stat: 0.718053, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 11 17 10 12 4 + + + -- linear combo weights (showing up to 5) + + 1.0336 0.4085 -0.6198 -0.1644 0.1177 + + + -- cutpoint (score) + --- -0.248151 (0.55881), N = 245 moving right + --- 0.177744 (0.612396), N = 211 moving right + --- 0.997982 (0.702962), N = 146 moving right + --- 1.80541 (0.743958), N = 71 moving right + --- 2.65947 (0.695295), N = 41 moving right + + -- best stat: 0.743958, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 15 16 9 6 10 + + + -- linear combo weights (showing up to 5) + + -0.1837 0.4545 0.6245 -0.9677 -0.9549 + + + -- cutpoint (score) + --- -1.0521 (0.608603), N = 207 moving right + --- -0.611152 (0.655792), N = 164 moving right + --- -0.250646 (0.699411), N = 140 moving right + --- 0.0509984 (0.71311), N = 107 moving right + --- 0.371502 (0.707743), N = 84 moving right + + -- best stat: 0.71311, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8551e-01 1.4546e-02 + 7.1000e+01 9.8188e-01 1.8222e-02 + 1.4000e+02 9.7826e-01 2.1912e-02 + 1.7900e+02 9.7464e-01 2.5616e-02 + + +------------ Growing tree 289 -------------- + +- N obs inbag: 276 +- N row inbag: 171 +- max nodes: 241 +- max leaves: 121 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 10 9 4 8 13 + + + -- linear combo weights (showing up to 5) + + -0.5500 -0.3621 -0.0492 1.6004 0.2895 + + + -- cutpoint (score) + --- -1.62518 (0.523052), N = 252 moving right + --- -1.61143 (0.526867), N = 251 moving right + --- -0.816336 (0.627022), N = 179 moving right + --- 0.535169 (0.674139), N = 61 moving right + --- 1.38586 (0.645205), N = 35 moving right + + -- best stat: 0.674139, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 7 8 16 14 4 + + + -- linear combo weights (showing up to 5) + + 2.7031 1.1609 0.3339 0.1348 0.0472 + + + -- cutpoint (score) + --- -1.15978 (0.504928), N = 271 moving right + --- -0.777027 (0.615874), N = 210 moving right + --- -0.71194 (0.654147), N = 185 moving right + --- 1.21126 (0.662811), N = 51 moving right + --- 4.75071 (0.588172), N = 16 moving right + + -- best stat: 0.662811, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 8 2 0 15 7 + + + -- linear combo weights (showing up to 5) + + 1.3662 -0.3833 -0.1677 -0.0529 2.8111 + + + -- cutpoint (score) + --- -1.40081 (0.522118), N = 267 moving right + --- -1.23455 (0.628671), N = 202 moving right + --- -1.12942 (0.649219), N = 172 moving right + --- -0.0607707 (0.686221), N = 62 moving right + --- 2.28579 (0.609296), N = 24 moving right + + -- best stat: 0.686221, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 3.0000e+00 + 1.8600e+02 1.0000e+00 3.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.8551e-01 1.4559e-02 + 1.1000e+02 9.7826e-01 2.1912e-02 + 1.3100e+02 9.6739e-01 3.3023e-02 + + +------------ Growing tree 290 -------------- + +- N obs inbag: 276 +- N row inbag: 179 +- max nodes: 217 +- max leaves: 109 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 2 13 11 6 0 + + + -- linear combo weights (showing up to 5) + + 0.4653 0.2452 0.9169 0.9262 0.2668 + + + -- cutpoint (score) + --- -0.275245 (0.568058), N = 235 moving right + --- -0.0611809 (0.606488), N = 201 moving right + --- 0.508087 (0.678843), N = 118 moving right + --- 0.639492 (0.673471), N = 101 moving right + --- 3.04735 (0.516405), N = 7 moving right + + -- best stat: 0.678843, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 7 9 10 6 0 + + + -- linear combo weights (showing up to 5) + + 14.7492 0.3646 -0.4245 0.9210 0.2071 + + + -- cutpoint (score) + --- -0.352517 (0.55657), N = 239 moving right + --- -0.348269 (0.551818), N = 238 moving right + --- 0.403317 (0.675702), N = 82 moving right + --- 1.04241 (0.673781), N = 42 moving right + --- 2.47816 (0.602479), N = 19 moving right + + -- best stat: 0.675702, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 9 5 14 15 2 + + + -- linear combo weights (showing up to 5) + + 0.2549 1.2387 0.2454 -0.1878 -0.1147 + + + -- cutpoint (score) + --- -0.360805 (0.58969), N = 213 moving right + --- -0.348623 (0.59907), N = 207 moving right + --- -0.298618 (0.610331), N = 200 moving right + --- -0.158785 (0.628058), N = 162 moving right + --- 1.18871 (0.569318), N = 37 moving right + + -- best stat: 0.628058, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 7.1000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 4.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + 3.3400e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 7.1000e+01 9.9275e-01 7.2464e-03 + 1.1000e+02 9.7826e-01 2.1845e-02 + 1.4000e+02 9.7101e-01 2.9252e-02 + 1.7900e+02 9.6739e-01 3.2984e-02 + 1.9800e+02 9.6377e-01 3.6729e-02 + + +------------ Growing tree 291 -------------- + +- N obs inbag: 276 +- N row inbag: 169 +- max nodes: 241 +- max leaves: 121 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 5 11 10 3 13 + + + -- linear combo weights (showing up to 5) + + 0.5759 0.6777 -0.5587 8.1555 0.1166 + + + -- cutpoint (score) + --- -0.911132 (0.557182), N = 249 moving right + --- -0.140912 (0.709273), N = 153 moving right + --- 0.00477088 (0.697463), N = 136 moving right + --- 0.376703 (0.68608), N = 99 moving right + --- 2.38449 (0.613002), N = 21 moving right + + -- best stat: 0.709273, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 15 1 9 3 11 + + + -- linear combo weights (showing up to 5) + + -0.1037 0.2793 0.1224 8.5317 0.7601 + + + -- cutpoint (score) + --- -0.940177 (0.528093), N = 261 moving right + --- -0.250293 (0.710432), N = 145 moving right + --- -0.121762 (0.716673), N = 118 moving right + --- 0.370557 (0.683823), N = 68 moving right + --- 1.01784 (0.644245), N = 37 moving right + + -- best stat: 0.716673, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 2 9 12 11 13 + + + -- linear combo weights (showing up to 5) + + 0.0182 -0.2988 0.1353 1.0287 0.2415 + + + -- cutpoint (score) + --- -1.00182 (0.54157), N = 250 moving right + --- -0.934789 (0.55582), N = 244 moving right + --- -0.688729 (0.617575), N = 208 moving right + --- -0.540773 (0.64518), N = 172 moving right + --- 0.526551 (0.647742), N = 66 moving right + + -- best stat: 0.647742, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 5.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + 3.3400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.7826e-01 2.1805e-02 + 7.7000e+01 9.7464e-01 2.5509e-02 + 1.1000e+02 9.6739e-01 3.2944e-02 + 1.3100e+02 9.6377e-01 3.6689e-02 + + +------------ Growing tree 292 -------------- + +- N obs inbag: 276 +- N row inbag: 181 +- max nodes: 213 +- max leaves: 107 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 12 5 2 11 17 + + + -- linear combo weights (showing up to 5) + + -0.0364 0.2282 0.1818 0.7658 0.4828 + + + -- cutpoint (score) + --- 1.30584 (0.659044), N = 177 moving right + --- 1.96792 (0.739773), N = 99 moving right + --- 2.03833 (0.720861), N = 92 moving right + --- 2.41324 (0.673852), N = 56 moving right + --- 2.47874 (0.634466), N = 46 moving right + + -- best stat: 0.739773, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 13 12 0 15 1 + + + -- linear combo weights (showing up to 5) + + 0.3671 0.0635 0.0649 -0.0405 0.5360 + + + -- cutpoint (score) + --- -0.182546 (0.678143), N = 158 moving right + --- 0.0112561 (0.705365), N = 130 moving right + --- 0.318082 (0.650837), N = 85 moving right + --- 0.374027 (0.649608), N = 81 moving right + --- 0.975402 (0.553903), N = 20 moving right + + -- best stat: 0.705365, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 12 10 1 4 3 + + + -- linear combo weights (showing up to 5) + + 0.1010 -0.3959 0.2355 0.7407 5.6862 + + + -- cutpoint (score) + --- 0.20714 (0.673352), N = 155 moving right + --- 0.249029 (0.678664), N = 152 moving right + --- 0.255622 (0.68687), N = 149 moving right + --- 0.677129 (0.710885), N = 94 moving right + --- 7.21721 (0.553507), N = 12 moving right + + -- best stat: 0.710885, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 7.7000e+01 9.9638e-01 3.6232e-03 + 1.1000e+02 9.9275e-01 7.2596e-03 + 1.4000e+02 9.8913e-01 1.0909e-02 + 1.7900e+02 9.8188e-01 1.8235e-02 + 1.8600e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 293 -------------- + +- N obs inbag: 276 +- N row inbag: 172 +- max nodes: 253 +- max leaves: 127 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 7 12 16 14 2 + + + -- linear combo weights (showing up to 5) + + 3.0406 0.2206 0.3460 0.1652 -0.3720 + + + -- cutpoint (score) + --- -0.81474 (0.547394), N = 246 moving right + --- -0.431847 (0.682936), N = 142 moving right + --- -0.121906 (0.637232), N = 85 moving right + --- -0.0105298 (0.650338), N = 79 moving right + --- 2.96344 (0.560599), N = 10 moving right + + -- best stat: 0.682936, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 8 5 9 17 2 + + + -- linear combo weights (showing up to 5) + + 1.1570 0.3322 -0.2846 0.4975 -0.6924 + + + -- cutpoint (score) + --- -0.0803891 (0.597638), N = 229 moving right + --- 0.460653 (0.673465), N = 174 moving right + --- 0.971418 (0.740332), N = 125 moving right + --- 1.39865 (0.716026), N = 83 moving right + --- 1.42106 (0.71691), N = 80 moving right + + -- best stat: 0.740332, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 15 13 6 2 11 + + + -- linear combo weights (showing up to 5) + + -0.1804 0.2779 0.9024 0.4237 0.8148 + + + -- cutpoint (score) + --- -0.491579 (0.55661), N = 237 moving right + --- -0.474934 (0.56948), N = 231 moving right + --- 0.545152 (0.670105), N = 108 moving right + --- 0.674164 (0.675253), N = 93 moving right + --- 1.40533 (0.622868), N = 42 moving right + + -- best stat: 0.675253, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 3.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8551e-01 1.4532e-02 + 7.1000e+01 9.8188e-01 1.8209e-02 + 7.7000e+01 9.7464e-01 2.5589e-02 + 1.1000e+02 9.7101e-01 2.9306e-02 + + +------------ Growing tree 294 -------------- + +- N obs inbag: 276 +- N row inbag: 167 +- max nodes: 253 +- max leaves: 127 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 7 1 4 13 2 + + + -- linear combo weights (showing up to 5) + + 12.0181 0.4034 0.7994 0.4660 -0.2576 + + + -- cutpoint (score) + --- 0.000451792 (0.676442), N = 161 moving right + --- 0.249287 (0.702546), N = 120 moving right + --- 0.314259 (0.693233), N = 118 moving right + --- 0.534789 (0.711625), N = 92 moving right + --- 11.7379 (0.596216), N = 17 moving right + + -- best stat: 0.711625, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 1 15 17 11 14 + + + -- linear combo weights (showing up to 5) + + 0.3820 -0.2923 0.3189 1.1540 0.2484 + + + -- cutpoint (score) + --- -0.381076 (0.588738), N = 230 moving right + --- 1.02392 (0.764263), N = 104 moving right + --- 1.23889 (0.751845), N = 93 moving right + --- 3.36814 (0.5788), N = 21 moving right + --- 4.34484 (0.530146), N = 11 moving right + + -- best stat: 0.764263, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 11 14 9 0 17 + + + -- linear combo weights (showing up to 5) + + 0.9865 0.2343 0.2896 -0.1704 0.4460 + + + -- cutpoint (score) + --- 0.146077 (0.62851), N = 209 moving right + --- 0.794061 (0.714573), N = 150 moving right + --- 0.994212 (0.724277), N = 129 moving right + --- 1.39758 (0.71512), N = 92 moving right + --- 2.29149 (0.645066), N = 46 moving right + + -- best stat: 0.724277, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 4.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.8551e-01 1.4493e-02 + 5.1000e+01 9.8188e-01 1.8169e-02 + 7.1000e+01 9.7826e-01 2.1859e-02 + 7.7000e+01 9.7464e-01 2.5563e-02 + 1.3100e+02 9.6739e-01 3.2998e-02 + + +------------ Growing tree 295 -------------- + +- N obs inbag: 276 +- N row inbag: 182 +- max nodes: 243 +- max leaves: 122 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 15 3 12 17 10 + + + -- linear combo weights (showing up to 5) + + 0.0857 5.8487 0.0502 0.3601 -0.4608 + + + -- cutpoint (score) + --- 0.461482 (0.561198), N = 236 moving right + --- 0.739586 (0.602663), N = 193 moving right + --- 0.963888 (0.663674), N = 156 moving right + --- 1.65956 (0.657895), N = 49 moving right + --- 7.61336 (0.566098), N = 14 moving right + + -- best stat: 0.663674, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 13 1 3 4 2 + + + -- linear combo weights (showing up to 5) + + 0.3618 0.3619 6.5932 0.7833 -0.5765 + + + -- cutpoint (score) + --- -0.972286 (0.557233), N = 249 moving right + --- -0.84376 (0.576778), N = 238 moving right + --- -0.814079 (0.581323), N = 232 moving right + --- -0.183226 (0.67254), N = 161 moving right + --- -0.157282 (0.681368), N = 158 moving right + + -- best stat: 0.681368, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 11 5 14 12 10 + + + -- linear combo weights (showing up to 5) + + 0.6519 1.1396 0.1121 -0.1537 -0.6369 + + + -- cutpoint (score) + --- -0.0804872 (0.719841), N = 157 moving right + --- -0.0613806 (0.722796), N = 155 moving right + --- 0.323311 (0.694497), N = 124 moving right + --- 0.646096 (0.711555), N = 97 moving right + --- 2.26061 (0.569708), N = 16 moving right + + -- best stat: 0.722796, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.8551e-01 1.4559e-02 + 1.3100e+02 9.8188e-01 1.8235e-02 + 1.4000e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 296 -------------- + +- N obs inbag: 276 +- N row inbag: 175 +- max nodes: 203 +- max leaves: 102 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 0 2 7 12 14 + + + -- linear combo weights (showing up to 5) + + -0.3322 -0.5754 9.0804 -0.0488 0.3949 + + + -- cutpoint (score) + --- -1.00563 (0.564586), N = 212 moving right + --- -0.888367 (0.585936), N = 185 moving right + --- -0.836044 (0.597675), N = 164 moving right + --- -0.653887 (0.61134), N = 115 moving right + --- -0.646801 (0.623012), N = 109 moving right + + -- best stat: 0.623012, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 9 11 1 15 0 + + + -- linear combo weights (showing up to 5) + + 0.4698 1.2952 0.3391 -0.0436 -0.0330 + + + -- cutpoint (score) + --- -0.737718 (0.705094), N = 159 moving right + --- -0.704811 (0.713406), N = 154 moving right + --- -0.598133 (0.730835), N = 142 moving right + --- 0.48265 (0.720798), N = 68 moving right + --- 1.4105 (0.620772), N = 32 moving right + + -- best stat: 0.730835, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 8 4 10 9 15 + + + -- linear combo weights (showing up to 5) + + 1.9988 0.2664 -0.6172 -0.2845 0.0592 + + + -- cutpoint (score) + --- -1.188 (0.587706), N = 204 moving right + --- -1.04072 (0.633295), N = 182 moving right + --- 0.168012 (0.710717), N = 70 moving right + --- 0.729601 (0.698217), N = 53 moving right + --- 3.82202 (0.606882), N = 17 moving right + + -- best stat: 0.710717, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + 3.3400e+02 1.0000e+00 2.0000e+00 + 3.4800e+02 1.0000e+00 1.0000e+00 + 4.6000e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8551e-01 1.4546e-02 + 1.3100e+02 9.8188e-01 1.8222e-02 + 1.9800e+02 9.7826e-01 2.1912e-02 + 2.1600e+02 9.7464e-01 2.5616e-02 + + +------------ Growing tree 297 -------------- + +- N obs inbag: 276 +- N row inbag: 171 +- max nodes: 251 +- max leaves: 126 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 7 0 17 9 14 + + + -- linear combo weights (showing up to 5) + + 8.7917 0.0820 0.4821 0.3261 0.2363 + + + -- cutpoint (score) + --- 0.756833 (0.572934), N = 242 moving right + --- 1.1796 (0.610237), N = 217 moving right + --- 1.24642 (0.613392), N = 205 moving right + --- 1.27179 (0.635476), N = 194 moving right + --- 1.63747 (0.676082), N = 130 moving right + + -- best stat: 0.676082, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 16 9 3 0 11 + + + -- linear combo weights (showing up to 5) + + 0.3557 0.3258 3.6577 0.3100 0.7204 + + + -- cutpoint (score) + --- -0.897956 (0.514049), N = 268 moving right + --- -0.264983 (0.696051), N = 170 moving right + --- 1.59351 (0.654072), N = 47 moving right + --- 3.41642 (0.578632), N = 19 moving right + --- 4.30483 (0.541998), N = 13 moving right + + -- best stat: 0.696051, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 3 5 6 4 13 + + + -- linear combo weights (showing up to 5) + + 4.0553 0.7860 0.3712 0.6406 0.3131 + + + -- cutpoint (score) + --- -0.0947696 (0.584032), N = 236 moving right + --- 0.0763421 (0.642695), N = 211 moving right + --- 0.716916 (0.714535), N = 125 moving right + --- 0.896583 (0.662609), N = 93 moving right + --- 1.41496 (0.663499), N = 54 moving right + + -- best stat: 0.714535, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.9275e-01 7.2596e-03 + 7.7000e+01 9.8551e-01 1.4559e-02 + 1.1000e+02 9.7826e-01 2.1912e-02 + 1.3100e+02 9.7464e-01 2.5615e-02 + + +------------ Growing tree 298 -------------- + +- N obs inbag: 276 +- N row inbag: 174 +- max nodes: 225 +- max leaves: 113 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 4 2 0 9 13 + + + -- linear combo weights (showing up to 5) + + 0.9606 -0.6741 0.1235 0.4553 0.4512 + + + -- cutpoint (score) + --- -0.711737 (0.616845), N = 202 moving right + --- -0.175315 (0.680014), N = 156 moving right + --- 0.152589 (0.689077), N = 110 moving right + --- 0.432797 (0.674603), N = 75 moving right + --- 1.49007 (0.548891), N = 21 moving right + + -- best stat: 0.689077, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 12 17 11 13 10 + + + -- linear combo weights (showing up to 5) + + 0.2609 0.5188 1.2040 0.3542 -0.5037 + + + -- cutpoint (score) + --- 0.533278 (0.657024), N = 192 moving right + --- 0.553892 (0.66011), N = 191 moving right + --- 0.980324 (0.70861), N = 162 moving right + --- 1.31397 (0.738378), N = 129 moving right + --- 1.54341 (0.722224), N = 113 moving right + + -- best stat: 0.738378, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 17 4 10 1 9 + + + -- linear combo weights (showing up to 5) + + 0.4616 0.3943 -0.5894 0.4756 0.6781 + + + -- cutpoint (score) + --- -0.274554 (0.523732), N = 261 moving right + --- 0.964738 (0.658743), N = 194 moving right + --- 0.970428 (0.66138), N = 193 moving right + --- 1.86181 (0.740566), N = 106 moving right + --- 2.37655 (0.710446), N = 69 moving right + + -- best stat: 0.740566, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 3.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 3.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.1000e+01 9.8913e-01 1.0909e-02 + 7.7000e+01 9.7826e-01 2.1898e-02 + 1.4000e+02 9.7464e-01 2.5602e-02 + + +------------ Growing tree 299 -------------- + +- N obs inbag: 276 +- N row inbag: 179 +- max nodes: 247 +- max leaves: 124 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 12 2 1 0 16 + + + -- linear combo weights (showing up to 5) + + 0.2325 -0.0854 0.6115 -0.2171 0.4834 + + + -- cutpoint (score) + --- -1.29799 (0.548424), N = 248 moving right + --- -0.591622 (0.657951), N = 180 moving right + --- -0.0807421 (0.707198), N = 128 moving right + --- 0.131108 (0.691576), N = 97 moving right + --- 0.674246 (0.651664), N = 60 moving right + + -- best stat: 0.707198, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 12 16 6 5 8 + + + -- linear combo weights (showing up to 5) + + 0.1595 0.5222 -0.3771 0.4463 1.5689 + + + -- cutpoint (score) + --- -0.893842 (0.673065), N = 184 moving right + --- -0.855771 (0.683853), N = 179 moving right + --- -0.304951 (0.709124), N = 129 moving right + --- 0.892843 (0.694658), N = 58 moving right + --- 5.99043 (0.529737), N = 5 moving right + + -- best stat: 0.709124, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 10 11 3 8 1 + + + -- linear combo weights (showing up to 5) + + -0.3541 0.5155 5.0639 0.9748 0.6031 + + + -- cutpoint (score) + --- -2.03056 (0.49725), N = 268 moving right + --- -1.04417 (0.635779), N = 205 moving right + --- -1.02182 (0.638862), N = 204 moving right + --- -0.48068 (0.757513), N = 145 moving right + --- 0.219758 (0.780823), N = 106 moving right + + -- best stat: 0.780823, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 3.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 3.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 1.1000e+02 9.8551e-01 1.4559e-02 + 1.3100e+02 9.8188e-01 1.8235e-02 + 1.4000e+02 9.7101e-01 2.9306e-02 + + +------------ Growing tree 300 -------------- + +- N obs inbag: 276 +- N row inbag: 167 +- max nodes: 227 +- max leaves: 114 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 0 12 16 15 17 + + + -- linear combo weights (showing up to 5) + + -0.2885 0.1292 0.8074 -0.0822 0.4839 + + + -- cutpoint (score) + --- 0.716874 (0.619168), N = 191 moving right + --- 1.02061 (0.688226), N = 155 moving right + --- 1.83688 (0.680205), N = 98 moving right + --- 2.29474 (0.664184), N = 59 moving right + --- 3.60963 (0.529485), N = 7 moving right + + -- best stat: 0.688226, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 15 16 17 13 3 + + + -- linear combo weights (showing up to 5) + + -0.0073 0.5664 0.3173 0.4682 4.2112 + + + -- cutpoint (score) + --- 0.036034 (0.559605), N = 240 moving right + --- 0.353075 (0.629215), N = 203 moving right + --- 0.445386 (0.650454), N = 195 moving right + --- 0.848326 (0.709077), N = 145 moving right + --- 1.72479 (0.703736), N = 66 moving right + + -- best stat: 0.709077, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 3 16 11 12 7 + + + -- linear combo weights (showing up to 5) + + 1.7926 0.5053 0.2645 0.0446 7.0838 + + + -- cutpoint (score) + --- -0.556794 (0.582829), N = 227 moving right + --- -0.213396 (0.68704), N = 160 moving right + --- 0.0583626 (0.711184), N = 112 moving right + --- 0.161611 (0.714806), N = 89 moving right + --- 0.908502 (0.682538), N = 48 moving right + + -- best stat: 0.714806, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 3.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.8913e-01 1.0870e-02 + 7.1000e+01 9.8551e-01 1.4533e-02 + 7.7000e+01 9.8188e-01 1.8209e-02 + 1.1000e+02 9.7464e-01 2.5589e-02 + 1.3100e+02 9.7101e-01 2.9307e-02 + + +------------ Growing tree 301 -------------- + +- N obs inbag: 276 +- N row inbag: 176 +- max nodes: 203 +- max leaves: 102 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 10 17 7 9 13 + + + -- linear combo weights (showing up to 5) + + -0.3438 0.4489 6.6026 0.2472 0.4875 + + + -- cutpoint (score) + --- 0.155561 (0.540322), N = 253 moving right + --- 0.221266 (0.543172), N = 248 moving right + --- 1.39166 (0.706639), N = 125 moving right + --- 2.26283 (0.694442), N = 57 moving right + --- 2.47565 (0.649405), N = 42 moving right + + -- best stat: 0.706639, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 1 14 12 11 15 + + + -- linear combo weights (showing up to 5) + + 0.4513 0.1456 0.0122 1.6349 -0.1906 + + + -- cutpoint (score) + --- -1.31935 (0.612583), N = 218 moving right + --- -0.737398 (0.708777), N = 158 moving right + --- -0.736805 (0.711669), N = 156 moving right + --- -0.0422566 (0.77517), N = 97 moving right + --- 3.59042 (0.547825), N = 10 moving right + + -- best stat: 0.77517, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 3 15 11 1 17 + + + -- linear combo weights (showing up to 5) + + 7.7231 -0.1050 1.4457 0.3703 0.1691 + + + -- cutpoint (score) + --- -0.61255 (0.632199), N = 217 moving right + --- -0.394667 (0.678074), N = 181 moving right + --- 0.133418 (0.757188), N = 127 moving right + --- 0.266788 (0.775002), N = 109 moving right + --- 9.82734 (0.546965), N = 8 moving right + + -- best stat: 0.775002, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 7.1000e+01 1.0000e+00 3.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 4.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 7.1000e+01 9.8913e-01 1.0870e-02 + 1.3100e+02 9.8551e-01 1.4533e-02 + 1.4000e+02 9.8188e-01 1.8209e-02 + 1.7900e+02 9.7826e-01 2.1899e-02 + 1.9800e+02 9.7464e-01 2.5603e-02 + + +------------ Growing tree 302 -------------- + +- N obs inbag: 276 +- N row inbag: 180 +- max nodes: 209 +- max leaves: 105 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 15 4 7 12 9 + + + -- linear combo weights (showing up to 5) + + -0.0730 0.4122 1.9542 0.1711 0.5355 + + + -- cutpoint (score) + --- -0.584605 (0.514433), N = 269 moving right + --- -0.224502 (0.61287), N = 206 moving right + --- -0.0371524 (0.635824), N = 186 moving right + --- 0.157584 (0.65882), N = 135 moving right + --- 0.199308 (0.66989), N = 122 moving right + + -- best stat: 0.66989, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 0 2 12 3 5 + + + -- linear combo weights (showing up to 5) + + 0.2754 -0.9349 0.2600 7.3407 0.7417 + + + -- cutpoint (score) + --- -0.780924 (0.640733), N = 190 moving right + --- -0.685319 (0.685973), N = 145 moving right + --- -0.0256937 (0.646268), N = 69 moving right + --- 0.470132 (0.61498), N = 27 moving right + --- 0.499887 (0.608192), N = 23 moving right + + -- best stat: 0.685973, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 16 15 12 7 11 + + + -- linear combo weights (showing up to 5) + + 0.5409 0.0113 -0.0234 0.9603 0.9764 + + + -- cutpoint (score) + --- -0.952149 (0.565521), N = 236 moving right + --- -0.347129 (0.717114), N = 130 moving right + --- -0.154912 (0.734784), N = 107 moving right + --- 0.252845 (0.720811), N = 78 moving right + --- 0.57102 (0.69086), N = 57 moving right + + -- best stat: 0.734784, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 3.0000e+00 + 3.3400e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 1.1000e+02 9.8913e-01 1.0909e-02 + 1.7900e+02 9.8551e-01 1.4572e-02 + 1.8600e+02 9.8188e-01 1.8249e-02 + + +------------ Growing tree 303 -------------- + +- N obs inbag: 276 +- N row inbag: 186 +- max nodes: 231 +- max leaves: 116 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 14 9 17 10 3 + + + -- linear combo weights (showing up to 5) + + 0.1047 0.2960 0.4068 -0.5191 5.7916 + + + -- cutpoint (score) + --- 0.159806 (0.538498), N = 259 moving right + --- 0.167073 (0.540836), N = 258 moving right + --- 0.424259 (0.568216), N = 241 moving right + --- 0.586984 (0.592988), N = 224 moving right + --- 1.12941 (0.694502), N = 143 moving right + + -- best stat: 0.694502, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 7 3 6 2 8 + + + -- linear combo weights (showing up to 5) + + 7.0920 2.1036 1.0465 -0.5362 1.2477 + + + -- cutpoint (score) + --- -1.1148 (0.708498), N = 172 moving right + --- -0.708043 (0.754299), N = 141 moving right + --- 1.65115 (0.661492), N = 42 moving right + --- 8.74313 (0.556559), N = 9 moving right + --- 9.54513 (0.548931), N = 8 moving right + + -- best stat: 0.754299, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 7 0 9 1 13 + + + -- linear combo weights (showing up to 5) + + 9.0087 0.1960 0.0648 0.5908 0.5729 + + + -- cutpoint (score) + --- -0.0439059 (0.68513), N = 158 moving right + --- 0.308452 (0.704433), N = 108 moving right + --- 0.692353 (0.69103), N = 75 moving right + --- 1.18851 (0.643214), N = 45 moving right + --- 1.48839 (0.64683), N = 38 moving right + + -- best stat: 0.704433, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 3.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 3.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.1000e+01 9.8551e-01 1.4559e-02 + 7.7000e+01 9.8188e-01 1.8235e-02 + 1.1000e+02 9.7464e-01 2.5616e-02 + + +------------ Growing tree 304 -------------- + +- N obs inbag: 276 +- N row inbag: 166 +- max nodes: 197 +- max leaves: 99 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 1 12 11 3 8 + + + -- linear combo weights (showing up to 5) + + 0.3997 -0.0477 0.8798 5.8759 1.3466 + + + -- cutpoint (score) + --- -1.30988 (0.604624), N = 214 moving right + --- -1.20645 (0.643102), N = 195 moving right + --- -0.119589 (0.760932), N = 102 moving right + --- 1.32608 (0.697422), N = 53 moving right + --- 4.33515 (0.655219), N = 27 moving right + + -- best stat: 0.760932, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 2 12 5 11 15 + + + -- linear combo weights (showing up to 5) + + 0.1121 -0.0408 1.2233 1.2800 0.0126 + + + -- cutpoint (score) + --- -0.843192 (0.576038), N = 239 moving right + --- 0.935566 (0.700905), N = 72 moving right + --- 1.0585 (0.684338), N = 62 moving right + --- 1.36541 (0.683612), N = 58 moving right + --- 2.0676 (0.614782), N = 33 moving right + + -- best stat: 0.700905, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 13 15 14 9 10 + + + -- linear combo weights (showing up to 5) + + 0.5387 -0.1806 0.4334 0.1235 -0.7803 + + + -- cutpoint (score) + --- -0.166869 (0.644433), N = 146 moving right + --- 0.263308 (0.651978), N = 100 moving right + --- 0.857384 (0.631711), N = 51 moving right + --- 0.907958 (0.636282), N = 44 moving right + --- 1.08095 (0.642715), N = 38 moving right + + -- best stat: 0.651978, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 3.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + 3.3400e+02 1.0000e+00 3.0000e+00 + 3.4800e+02 1.0000e+00 1.0000e+00 + 3.8800e+02 1.0000e+00 3.0000e+00 + 4.0000e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 7.7000e+01 9.8913e-01 1.0896e-02 + 1.3100e+02 9.7826e-01 2.1885e-02 + 1.9800e+02 9.7464e-01 2.5589e-02 + 2.6400e+02 9.7101e-01 2.9306e-02 + + +------------ Growing tree 305 -------------- + +- N obs inbag: 276 +- N row inbag: 182 +- max nodes: 227 +- max leaves: 114 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 1 15 11 10 13 + + + -- linear combo weights (showing up to 5) + + 0.5138 0.0167 0.9591 -0.6215 0.4899 + + + -- cutpoint (score) + --- -0.905384 (0.662991), N = 192 moving right + --- -0.403906 (0.722407), N = 155 moving right + --- 0.788269 (0.747379), N = 87 moving right + --- 1.60991 (0.697136), N = 56 moving right + --- 1.71852 (0.685904), N = 49 moving right + + -- best stat: 0.747379, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 9 15 17 10 13 + + + -- linear combo weights (showing up to 5) + + 0.4791 -0.1065 0.3968 -0.6403 0.4617 + + + -- cutpoint (score) + --- 0.0897621 (0.568195), N = 238 moving right + --- 0.127816 (0.588637), N = 227 moving right + --- 0.252934 (0.59021), N = 223 moving right + --- 0.946556 (0.678136), N = 158 moving right + --- 2.42322 (0.664452), N = 45 moving right + + -- best stat: 0.678136, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 16 1 9 4 14 + + + -- linear combo weights (showing up to 5) + + 0.7248 0.4490 0.6183 0.4472 0.2855 + + + -- cutpoint (score) + --- -0.583484 (0.600131), N = 219 moving right + --- 0.0390935 (0.713497), N = 148 moving right + --- 0.289865 (0.741614), N = 122 moving right + --- 0.905371 (0.704137), N = 72 moving right + --- 1.78102 (0.587196), N = 32 moving right + + -- best stat: 0.741614, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 3.0000e+00 + 2.2300e+02 1.0000e+00 3.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + 3.2600e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8551e-01 1.4546e-02 + 7.7000e+01 9.8188e-01 1.8222e-02 + 1.4000e+02 9.7464e-01 2.5602e-02 + 1.8600e+02 9.7101e-01 2.9320e-02 + + +------------ Growing tree 306 -------------- + +- N obs inbag: 276 +- N row inbag: 177 +- max nodes: 217 +- max leaves: 109 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 15 1 12 11 9 + + + -- linear combo weights (showing up to 5) + + -0.2470 0.4354 0.1925 0.8582 0.4126 + + + -- cutpoint (score) + --- -0.728249 (0.65522), N = 199 moving right + --- -0.690671 (0.671857), N = 192 moving right + --- -0.288702 (0.707946), N = 148 moving right + --- -0.224419 (0.721283), N = 135 moving right + --- 2.4284 (0.527318), N = 8 moving right + + -- best stat: 0.721283, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 2 15 3 13 16 + + + -- linear combo weights (showing up to 5) + + -0.2128 -0.1121 8.1880 0.6148 0.4183 + + + -- cutpoint (score) + --- -1.0535 (0.552022), N = 245 moving right + --- 0.160506 (0.715611), N = 89 moving right + --- 0.310431 (0.726614), N = 76 moving right + --- 0.349275 (0.722873), N = 71 moving right + --- 0.644432 (0.660873), N = 57 moving right + + -- best stat: 0.726614, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 13 12 11 15 3 + + + -- linear combo weights (showing up to 5) + + 0.5168 0.2223 0.3787 -0.1826 7.7775 + + + -- cutpoint (score) + --- -0.915301 (0.570851), N = 245 moving right + --- -0.529608 (0.642064), N = 202 moving right + --- -0.235185 (0.719352), N = 158 moving right + --- -0.136619 (0.718004), N = 146 moving right + --- 0.947534 (0.642627), N = 45 moving right + + -- best stat: 0.719352, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 3.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 3.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 7.1000e+01 9.8188e-01 1.8195e-02 + 1.1000e+02 9.7826e-01 2.1885e-02 + 1.7900e+02 9.7464e-01 2.5589e-02 + 1.8600e+02 9.6739e-01 3.3024e-02 + + +------------ Growing tree 307 -------------- + +- N obs inbag: 276 +- N row inbag: 165 +- max nodes: 213 +- max leaves: 107 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 12 9 6 17 2 + + + -- linear combo weights (showing up to 5) + + 0.4072 0.4172 1.0842 0.6456 -0.4005 + + + -- cutpoint (score) + --- 0.437295 (0.550385), N = 249 moving right + --- 1.11442 (0.616594), N = 200 moving right + --- 1.80259 (0.685016), N = 108 moving right + --- 2.48067 (0.628902), N = 46 moving right + --- 3.11825 (0.601005), N = 29 moving right + + -- best stat: 0.685016, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 12 7 8 13 17 + + + -- linear combo weights (showing up to 5) + + 0.2439 4.0445 1.4872 -0.1805 0.4670 + + + -- cutpoint (score) + --- 0.680105 (0.6979), N = 161 moving right + --- 0.912544 (0.740129), N = 130 moving right + --- 1.31245 (0.759019), N = 96 moving right + --- 1.63538 (0.754951), N = 83 moving right + --- 2.69977 (0.689531), N = 49 moving right + + -- best stat: 0.759019, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 8 13 12 3 10 + + + -- linear combo weights (showing up to 5) + + 1.2568 -0.0701 0.2247 5.6034 -0.3174 + + + -- cutpoint (score) + --- -1.24466 (0.529431), N = 262 moving right + --- -0.937427 (0.606734), N = 213 moving right + --- -0.626878 (0.724371), N = 155 moving right + --- -0.221447 (0.737936), N = 98 moving right + --- 2.17665 (0.660995), N = 33 moving right + + -- best stat: 0.737936, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 3.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 7.7000e+01 9.8551e-01 1.4546e-02 + 1.4000e+02 9.8188e-01 1.8222e-02 + 1.7900e+02 9.7464e-01 2.5602e-02 + 1.8600e+02 9.7101e-01 2.9320e-02 + + +------------ Growing tree 308 -------------- + +- N obs inbag: 276 +- N row inbag: 170 +- max nodes: 243 +- max leaves: 122 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 1 4 5 7 6 + + + -- linear combo weights (showing up to 5) + + 0.3359 0.3125 0.3678 3.6232 0.9929 + + + -- cutpoint (score) + --- -0.363884 (0.5141), N = 254 moving right + --- 0.0730221 (0.585766), N = 185 moving right + --- 0.163839 (0.6019), N = 171 moving right + --- 0.495569 (0.675422), N = 97 moving right + --- 1.7204 (0.618429), N = 25 moving right + + -- best stat: 0.675422, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 17 11 12 1 4 + + + -- linear combo weights (showing up to 5) + + 0.5085 1.3091 0.0235 0.1801 0.0178 + + + -- cutpoint (score) + --- 0.57238 (0.627138), N = 215 moving right + --- 0.995682 (0.6724), N = 165 moving right + --- 1.34386 (0.728702), N = 123 moving right + --- 1.61535 (0.7414), N = 104 moving right + --- 4.30021 (0.542596), N = 11 moving right + + -- best stat: 0.7414, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 2 10 1 16 3 + + + -- linear combo weights (showing up to 5) + + -1.2267 -0.4188 0.0687 0.8004 4.6072 + + + -- cutpoint (score) + --- -1.99759 (0.572692), N = 216 moving right + --- -1.61084 (0.630989), N = 171 moving right + --- -1.40544 (0.683064), N = 138 moving right + --- -0.615285 (0.71944), N = 74 moving right + --- -0.560396 (0.715095), N = 63 moving right + + -- best stat: 0.71944, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.1000e+01 9.8551e-01 1.4559e-02 + 7.7000e+01 9.8188e-01 1.8235e-02 + 1.1000e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 309 -------------- + +- N obs inbag: 276 +- N row inbag: 179 +- max nodes: 217 +- max leaves: 109 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 1 16 10 8 6 + + + -- linear combo weights (showing up to 5) + + 0.2346 0.3431 -0.3617 1.5474 -0.1440 + + + -- cutpoint (score) + --- -1.2562 (0.585368), N = 221 moving right + --- -0.895447 (0.686717), N = 162 moving right + --- -0.390404 (0.7447), N = 117 moving right + --- -0.097021 (0.739279), N = 99 moving right + --- -0.0176599 (0.746005), N = 88 moving right + + -- best stat: 0.746005, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 6 7 4 2 8 + + + -- linear combo weights (showing up to 5) + + 0.4569 6.2228 0.3538 -0.5043 1.3010 + + + -- cutpoint (score) + --- 0.108198 (0.73171), N = 67 moving right + --- 0.320582 (0.72665), N = 61 moving right + --- 2.01715 (0.643611), N = 28 moving right + --- 2.81334 (0.622651), N = 24 moving right + --- 5.95879 (0.580268), N = 14 moving right + + -- best stat: 0.73171, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 6 4 1 16 5 + + + -- linear combo weights (showing up to 5) + + 0.1241 0.7053 0.1967 0.4540 0.7118 + + + -- cutpoint (score) + --- -0.159566 (0.599261), N = 213 moving right + --- 0.338745 (0.660818), N = 162 moving right + --- 0.396642 (0.683926), N = 151 moving right + --- 0.579482 (0.684268), N = 136 moving right + --- 0.59109 (0.686034), N = 135 moving right + + -- best stat: 0.686034, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 3.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.9275e-01 7.2596e-03 + 1.1000e+02 9.8913e-01 1.0909e-02 + 1.3100e+02 9.8551e-01 1.4572e-02 + 1.4000e+02 9.8188e-01 1.8249e-02 + + +------------ Growing tree 310 -------------- + +- N obs inbag: 276 +- N row inbag: 179 +- max nodes: 213 +- max leaves: 107 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 13 16 4 2 6 + + + -- linear combo weights (showing up to 5) + + 0.3990 1.1119 0.5417 -0.0314 1.6383 + + + -- cutpoint (score) + --- -0.453846 (0.62478), N = 187 moving right + --- -0.320909 (0.644573), N = 173 moving right + --- 0.122684 (0.689142), N = 136 moving right + --- 0.59371 (0.706643), N = 84 moving right + --- 3.39079 (0.558389), N = 8 moving right + + -- best stat: 0.706643, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 17 14 4 12 6 + + + -- linear combo weights (showing up to 5) + + 0.5010 0.2902 0.3462 -0.0632 1.3911 + + + -- cutpoint (score) + --- 1.19252 (0.586823), N = 214 moving right + --- 1.19279 (0.589821), N = 213 moving right + --- 1.52236 (0.641355), N = 161 moving right + --- 1.53649 (0.649224), N = 158 moving right + --- 2.00159 (0.672126), N = 99 moving right + + -- best stat: 0.672126, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 7 1 15 10 5 + + + -- linear combo weights (showing up to 5) + + 7.8534 0.4945 -0.1594 -0.5869 0.6863 + + + -- cutpoint (score) + --- -0.97925 (0.536876), N = 238 moving right + --- -0.162607 (0.642325), N = 171 moving right + --- -0.0136899 (0.666108), N = 154 moving right + --- 0.532322 (0.696129), N = 82 moving right + --- 0.718473 (0.69657), N = 75 moving right + + -- best stat: 0.69657, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8551e-01 1.4546e-02 + 7.1000e+01 9.7826e-01 2.1899e-02 + 1.4000e+02 9.7101e-01 2.9306e-02 + 1.7900e+02 9.6739e-01 3.3037e-02 + + +------------ Growing tree 311 -------------- + +- N obs inbag: 276 +- N row inbag: 176 +- max nodes: 203 +- max leaves: 102 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 0 5 9 13 10 + + + -- linear combo weights (showing up to 5) + + -0.1979 0.8363 -0.1259 0.4454 -0.8771 + + + -- cutpoint (score) + --- -1.59624 (0.51717), N = 259 moving right + --- -1.5316 (0.529865), N = 255 moving right + --- -0.882018 (0.575682), N = 214 moving right + --- -0.674494 (0.612527), N = 190 moving right + --- 0.190524 (0.706421), N = 112 moving right + + -- best stat: 0.706421, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 17 11 5 8 4 + + + -- linear combo weights (showing up to 5) + + 0.4049 0.7383 0.1623 1.6995 0.1035 + + + -- cutpoint (score) + --- -0.773713 (0.530198), N = 260 moving right + --- 0.159152 (0.69716), N = 163 moving right + --- 0.208255 (0.689804), N = 160 moving right + --- 2.02578 (0.716944), N = 46 moving right + --- 2.49924 (0.682537), N = 40 moving right + + -- best stat: 0.716944, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 8 7 10 1 4 + + + -- linear combo weights (showing up to 5) + + 1.6474 4.9593 -0.5811 0.4701 0.1298 + + + -- cutpoint (score) + --- -1.43197 (0.572669), N = 231 moving right + --- -0.516693 (0.763559), N = 128 moving right + --- -0.443455 (0.764467), N = 124 moving right + --- 0.576127 (0.74681), N = 58 moving right + --- 2.70179 (0.639379), N = 27 moving right + + -- best stat: 0.764467, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 3.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + 3.4800e+02 1.0000e+00 1.0000e+00 + 3.8800e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.8913e-01 1.0870e-02 + 5.1000e+01 9.8551e-01 1.4533e-02 + 1.1000e+02 9.7826e-01 2.1886e-02 + 1.7900e+02 9.7464e-01 2.5589e-02 + 1.9100e+02 9.6739e-01 3.3024e-02 + + +------------ Growing tree 312 -------------- + +- N obs inbag: 276 +- N row inbag: 177 +- max nodes: 213 +- max leaves: 107 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 17 15 12 7 13 + + + -- linear combo weights (showing up to 5) + + 0.5291 0.0132 0.0545 9.4861 0.3268 + + + -- cutpoint (score) + --- 1.09467 (0.596406), N = 217 moving right + --- 2.16702 (0.638781), N = 50 moving right + --- 2.16725 (0.626431), N = 47 moving right + --- 2.29028 (0.623927), N = 36 moving right + --- 2.75994 (0.597942), N = 18 moving right + + -- best stat: 0.638781, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 1 0 11 8 3 + + + -- linear combo weights (showing up to 5) + + 0.5280 -0.1042 0.4989 1.0070 14.0993 + + + -- cutpoint (score) + --- -1.00131 (0.627714), N = 200 moving right + --- -0.747907 (0.686353), N = 169 moving right + --- 0.588055 (0.735104), N = 57 moving right + --- 1.21129 (0.697925), N = 39 moving right + --- 5.70849 (0.618267), N = 17 moving right + + -- best stat: 0.735104, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 17 8 7 14 6 + + + -- linear combo weights (showing up to 5) + + 0.3893 1.3088 8.3404 0.0085 0.5617 + + + -- cutpoint (score) + --- 0.0505942 (0.586602), N = 237 moving right + --- 0.133852 (0.597753), N = 228 moving right + --- 0.248022 (0.606211), N = 224 moving right + --- 1.84614 (0.699272), N = 50 moving right + --- 2.65427 (0.655929), N = 34 moving right + + -- best stat: 0.699272, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 3.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.7000e+01 9.8551e-01 1.4559e-02 + 1.1000e+02 9.8188e-01 1.8235e-02 + 1.3100e+02 9.7464e-01 2.5615e-02 + + +------------ Growing tree 313 -------------- + +- N obs inbag: 276 +- N row inbag: 175 +- max nodes: 189 +- max leaves: 95 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 1 11 10 17 9 + + + -- linear combo weights (showing up to 5) + + 0.3224 0.8344 -0.8293 0.4350 0.1551 + + + -- cutpoint (score) + --- 0.344866 (0.647676), N = 197 moving right + --- 0.358249 (0.659552), N = 193 moving right + --- 0.715433 (0.707616), N = 163 moving right + --- 0.75714 (0.710679), N = 160 moving right + --- 1.93785 (0.755143), N = 86 moving right + + -- best stat: 0.755143, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 0 11 1 7 10 + + + -- linear combo weights (showing up to 5) + + 0.0808 0.6421 0.2631 17.6559 -0.6509 + + + -- cutpoint (score) + --- -1.30239 (0.530017), N = 259 moving right + --- -0.372807 (0.683584), N = 166 moving right + --- -0.154455 (0.703385), N = 143 moving right + --- 0.0476334 (0.744693), N = 121 moving right + --- 0.485685 (0.757013), N = 81 moving right + + -- best stat: 0.757013, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 4 6 11 14 17 + + + -- linear combo weights (showing up to 5) + + 0.3413 0.8385 1.0719 0.1144 0.4292 + + + -- cutpoint (score) + --- 0.841942 (0.645783), N = 189 moving right + --- 1.10497 (0.69387), N = 160 moving right + --- 1.14403 (0.700884), N = 154 moving right + --- 1.17453 (0.700884), N = 150 moving right + --- 1.47429 (0.738966), N = 112 moving right + + -- best stat: 0.738966, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + 3.3400e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.8551e-01 1.4559e-02 + 1.1000e+02 9.8188e-01 1.8235e-02 + 1.4000e+02 9.7464e-01 2.5615e-02 + + +------------ Growing tree 314 -------------- + +- N obs inbag: 276 +- N row inbag: 169 +- max nodes: 205 +- max leaves: 103 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 10 1 9 12 15 + + + -- linear combo weights (showing up to 5) + + -0.7281 0.4759 0.3436 -0.1463 -0.2162 + + + -- cutpoint (score) + --- -1.09563 (0.581786), N = 224 moving right + --- -1.04084 (0.591426), N = 221 moving right + --- 0.190053 (0.711193), N = 105 moving right + --- 0.362584 (0.671293), N = 81 moving right + --- 1.15691 (0.622356), N = 44 moving right + + -- best stat: 0.711193, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 1 5 15 14 0 + + + -- linear combo weights (showing up to 5) + + 0.5715 0.9791 -0.1960 0.2201 -0.2099 + + + -- cutpoint (score) + --- 0.174798 (0.649491), N = 130 moving right + --- 0.531822 (0.694658), N = 85 moving right + --- 0.587967 (0.695461), N = 82 moving right + --- 0.702322 (0.699322), N = 69 moving right + --- 0.827614 (0.686178), N = 60 moving right + + -- best stat: 0.699322, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 15 0 2 7 13 + + + -- linear combo weights (showing up to 5) + + -0.1153 -0.2237 -0.3982 6.9127 0.1861 + + + -- cutpoint (score) + --- -0.716027 (0.571923), N = 221 moving right + --- -0.551057 (0.602963), N = 172 moving right + --- -0.486102 (0.603878), N = 139 moving right + --- -0.360318 (0.624007), N = 98 moving right + --- -0.214164 (0.5958), N = 67 moving right + + -- best stat: 0.624007, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 2.0000e+00 + 3.3400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 1.3100e+02 9.9638e-01 3.6232e-03 + 1.4000e+02 9.9275e-01 7.2596e-03 + 1.7900e+02 9.8551e-01 1.4559e-02 + 1.8600e+02 9.8188e-01 1.8235e-02 + 1.9800e+02 9.7464e-01 2.5615e-02 + + +------------ Growing tree 315 -------------- + +- N obs inbag: 276 +- N row inbag: 173 +- max nodes: 215 +- max leaves: 108 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 10 3 11 8 7 + + + -- linear combo weights (showing up to 5) + + -0.4505 2.8961 0.6760 1.0635 4.5578 + + + -- cutpoint (score) + --- -1.22773 (0.596718), N = 218 moving right + --- -1.17604 (0.612608), N = 212 moving right + --- -1.0251 (0.64053), N = 199 moving right + --- 0.545937 (0.733371), N = 79 moving right + --- 1.69409 (0.664615), N = 41 moving right + + -- best stat: 0.733371, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 17 16 7 11 8 + + + -- linear combo weights (showing up to 5) + + 0.2702 0.5968 5.3470 0.6793 0.8693 + + + -- cutpoint (score) + --- 0.290966 (0.732891), N = 145 moving right + --- 0.358678 (0.738347), N = 131 moving right + --- 1.01592 (0.768688), N = 94 moving right + --- 2.23261 (0.693756), N = 51 moving right + --- 8.13906 (0.56174), N = 9 moving right + + -- best stat: 0.768688, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 3 12 13 2 5 + + + -- linear combo weights (showing up to 5) + + 6.5686 0.2209 0.5699 -0.8275 0.6810 + + + -- cutpoint (score) + --- -0.852396 (0.665374), N = 180 moving right + --- -0.667061 (0.675787), N = 160 moving right + --- -0.603996 (0.676827), N = 156 moving right + --- -0.455886 (0.690418), N = 135 moving right + --- 1.42209 (0.558103), N = 14 moving right + + -- best stat: 0.690418, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 3.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.8551e-01 1.4532e-02 + 1.3100e+02 9.8188e-01 1.8209e-02 + 1.4000e+02 9.7464e-01 2.5589e-02 + 1.7900e+02 9.7101e-01 2.9306e-02 + + +------------ Growing tree 316 -------------- + +- N obs inbag: 276 +- N row inbag: 185 +- max nodes: 203 +- max leaves: 102 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 10 4 13 6 2 + + + -- linear combo weights (showing up to 5) + + -0.6429 0.7767 0.7910 0.8779 -1.0088 + + + -- cutpoint (score) + --- -2.34696 (0.537559), N = 258 moving right + --- -1.60047 (0.591256), N = 222 moving right + --- -0.9989 (0.659948), N = 172 moving right + --- -0.914888 (0.657989), N = 167 moving right + --- -0.803328 (0.681777), N = 153 moving right + + -- best stat: 0.681777, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 9 3 16 17 5 + + + -- linear combo weights (showing up to 5) + + 0.7416 10.1219 0.3502 0.5380 0.2741 + + + -- cutpoint (score) + --- 0.740862 (0.588216), N = 230 moving right + --- 1.70346 (0.734719), N = 125 moving right + --- 1.82325 (0.749918), N = 101 moving right + --- 3.32259 (0.652726), N = 28 moving right + --- 5.06578 (0.634446), N = 21 moving right + + -- best stat: 0.749918, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 15 1 14 17 8 + + + -- linear combo weights (showing up to 5) + + 0.0045 0.4647 0.2071 0.4828 2.0210 + + + -- cutpoint (score) + --- -0.423664 (0.56759), N = 243 moving right + --- 0.314332 (0.661825), N = 178 moving right + --- 0.612109 (0.689285), N = 145 moving right + --- 0.65539 (0.709993), N = 134 moving right + --- 0.99136 (0.753366), N = 110 moving right + + -- best stat: 0.753366, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.1000e+01 9.8551e-01 1.4559e-02 + 1.1000e+02 9.8188e-01 1.8235e-02 + 1.3100e+02 9.7826e-01 2.1926e-02 + + +------------ Growing tree 317 -------------- + +- N obs inbag: 276 +- N row inbag: 175 +- max nodes: 211 +- max leaves: 106 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 14 8 4 0 5 + + + -- linear combo weights (showing up to 5) + + -0.2210 1.9899 0.0977 -0.1978 0.9568 + + + -- cutpoint (score) + --- -1.35982 (0.522092), N = 264 moving right + --- -1.3218 (0.528838), N = 262 moving right + --- -1.03459 (0.627501), N = 199 moving right + --- -0.0379176 (0.716511), N = 97 moving right + --- 0.572039 (0.736251), N = 70 moving right + + -- best stat: 0.736251, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 0 10 15 5 6 + + + -- linear combo weights (showing up to 5) + + -0.4216 -0.8049 -0.2478 1.1086 -0.2324 + + + -- cutpoint (score) + --- -0.877987 (0.558068), N = 216 moving right + --- -0.133257 (0.696171), N = 121 moving right + --- 0.265284 (0.677936), N = 94 moving right + --- 0.281995 (0.682949), N = 92 moving right + --- 0.466523 (0.685858), N = 81 moving right + + -- best stat: 0.696171, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 13 12 7 9 10 + + + -- linear combo weights (showing up to 5) + + 0.1017 0.0313 17.1521 0.5462 -0.4550 + + + -- cutpoint (score) + --- -0.616936 (0.600767), N = 212 moving right + --- -0.433484 (0.605244), N = 188 moving right + --- -0.271076 (0.626511), N = 150 moving right + --- 0.0553716 (0.676451), N = 95 moving right + --- 0.113325 (0.662465), N = 85 moving right + + -- best stat: 0.676451, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 3.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 2.0000e+00 + 3.3400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.9275e-01 7.2596e-03 + 1.1000e+02 9.8188e-01 1.8208e-02 + 1.4000e+02 9.7464e-01 2.5589e-02 + 1.7900e+02 9.6739e-01 3.3023e-02 + + +------------ Growing tree 318 -------------- + +- N obs inbag: 276 +- N row inbag: 174 +- max nodes: 191 +- max leaves: 96 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 16 15 11 17 5 + + + -- linear combo weights (showing up to 5) + + 0.4998 0.0726 1.3469 0.4843 1.0748 + + + -- cutpoint (score) + --- 0.346476 (0.652786), N = 192 moving right + --- 0.817755 (0.709107), N = 150 moving right + --- 1.25485 (0.740904), N = 128 moving right + --- 1.50186 (0.746789), N = 118 moving right + --- 2.27998 (0.740837), N = 71 moving right + + -- best stat: 0.746789, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 2 12 7 3 11 + + + -- linear combo weights (showing up to 5) + + 0.2451 0.0401 9.7642 7.7889 1.2103 + + + -- cutpoint (score) + --- -0.729058 (0.550571), N = 245 moving right + --- -0.577091 (0.622757), N = 211 moving right + --- -0.572376 (0.625621), N = 209 moving right + --- -0.511013 (0.633587), N = 205 moving right + --- 0.0144892 (0.750347), N = 105 moving right + + -- best stat: 0.750347, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 11 15 7 12 6 + + + -- linear combo weights (showing up to 5) + + 1.1652 0.0556 14.3702 0.0447 0.9992 + + + -- cutpoint (score) + --- -1.00937 (0.542023), N = 249 moving right + --- -0.728856 (0.624883), N = 208 moving right + --- 0.282862 (0.752763), N = 81 moving right + --- 0.302399 (0.756456), N = 79 moving right + --- 1.07437 (0.728619), N = 51 moving right + + -- best stat: 0.756456, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 3.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 5.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8188e-01 1.8195e-02 + 7.1000e+01 9.7826e-01 2.1885e-02 + 1.3100e+02 9.6014e-01 4.0404e-02 + 1.4000e+02 9.5652e-01 4.4177e-02 + + +------------ Growing tree 319 -------------- + +- N obs inbag: 276 +- N row inbag: 174 +- max nodes: 203 +- max leaves: 102 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 15 8 2 16 0 + + + -- linear combo weights (showing up to 5) + + -0.2433 2.0685 0.2066 0.7466 -0.1889 + + + -- cutpoint (score) + --- -1.50879 (0.573435), N = 235 moving right + --- -1.4794 (0.588413), N = 230 moving right + --- -1.33276 (0.607083), N = 208 moving right + --- -1.19709 (0.63425), N = 194 moving right + --- -0.582421 (0.758916), N = 119 moving right + + -- best stat: 0.758916, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 14 1 6 9 12 + + + -- linear combo weights (showing up to 5) + + 0.5482 0.4001 0.6421 0.0829 0.1521 + + + -- cutpoint (score) + --- -0.493959 (0.626116), N = 210 moving right + --- -0.476927 (0.630625), N = 208 moving right + --- -0.372309 (0.631984), N = 187 moving right + --- -0.283893 (0.642679), N = 171 moving right + --- -0.0781333 (0.653895), N = 128 moving right + + -- best stat: 0.653895, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 7 5 9 6 17 + + + -- linear combo weights (showing up to 5) + + 12.4082 0.2832 0.2840 1.2416 0.4089 + + + -- cutpoint (score) + --- 1.05812 (0.63058), N = 201 moving right + --- 1.271 (0.653011), N = 156 moving right + --- 1.43442 (0.672158), N = 128 moving right + --- 1.50326 (0.678706), N = 109 moving right + --- 2.97719 (0.617574), N = 23 moving right + + -- best stat: 0.678706, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 3.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 4.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + 3.3400e+02 1.0000e+00 1.0000e+00 + 3.4800e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.8913e-01 1.0870e-02 + 1.1000e+02 9.8188e-01 1.8196e-02 + 1.7900e+02 9.6739e-01 3.2956e-02 + 1.8600e+02 9.6377e-01 3.6701e-02 + 2.1600e+02 9.6014e-01 4.0460e-02 + + +------------ Growing tree 320 -------------- + +- N obs inbag: 276 +- N row inbag: 172 +- max nodes: 217 +- max leaves: 109 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 6 14 16 4 7 + + + -- linear combo weights (showing up to 5) + + -0.1765 0.2722 0.4378 0.8381 9.9872 + + + -- cutpoint (score) + --- -0.705577 (0.504027), N = 269 moving right + --- -0.21743 (0.580088), N = 230 moving right + --- -0.0690105 (0.627123), N = 200 moving right + --- 0.942984 (0.657652), N = 70 moving right + --- 1.02415 (0.664789), N = 62 moving right + + -- best stat: 0.664789, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 10 8 9 13 15 + + + -- linear combo weights (showing up to 5) + + -0.4469 1.7878 -0.4836 0.1502 -0.0249 + + + -- cutpoint (score) + --- -1.34855 (0.556216), N = 243 moving right + --- -0.922045 (0.638412), N = 193 moving right + --- -0.284188 (0.7382), N = 110 moving right + --- 0.0463712 (0.692646), N = 83 moving right + --- 0.966612 (0.64486), N = 42 moving right + + -- best stat: 0.7382, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 7 12 14 15 10 + + + -- linear combo weights (showing up to 5) + + 10.0100 0.1120 0.2370 -0.1367 -0.5591 + + + -- cutpoint (score) + --- -0.589765 (0.574893), N = 239 moving right + --- -0.0344328 (0.596803), N = 148 moving right + --- 0.412341 (0.616084), N = 69 moving right + --- 0.771922 (0.596156), N = 30 moving right + --- 0.913579 (0.589312), N = 22 moving right + + -- best stat: 0.616084, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + 3.2600e+02 1.0000e+00 2.0000e+00 + 3.4800e+02 1.0000e+00 1.0000e+00 + 3.8800e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 1.1000e+02 9.8913e-01 1.0909e-02 + 1.3100e+02 9.8551e-01 1.4572e-02 + 1.8600e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 321 -------------- + +- N obs inbag: 276 +- N row inbag: 179 +- max nodes: 233 +- max leaves: 117 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 4 10 13 17 2 + + + -- linear combo weights (showing up to 5) + + 0.2842 -0.7336 0.3033 0.4963 -0.9418 + + + -- cutpoint (score) + --- -0.709118 (0.53859), N = 258 moving right + --- -0.00445378 (0.626626), N = 204 moving right + --- 0.121006 (0.649511), N = 190 moving right + --- 1.00272 (0.701825), N = 117 moving right + --- 3.4305 (0.533605), N = 8 moving right + + -- best stat: 0.701825, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 1 13 2 17 16 + + + -- linear combo weights (showing up to 5) + + 0.2429 0.4713 -0.6616 0.6423 0.4887 + + + -- cutpoint (score) + --- -0.194311 (0.531488), N = 262 moving right + --- 0.159192 (0.573254), N = 239 moving right + --- 0.496016 (0.628243), N = 213 moving right + --- 0.66004 (0.662503), N = 199 moving right + --- 1.91407 (0.702056), N = 87 moving right + + -- best stat: 0.702056, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 13 8 16 2 0 + + + -- linear combo weights (showing up to 5) + + 0.1567 1.4069 0.4465 -0.4549 -0.4053 + + + -- cutpoint (score) + --- -1.7438 (0.619909), N = 217 moving right + --- -1.67298 (0.630264), N = 207 moving right + --- -0.986667 (0.752675), N = 128 moving right + --- -0.332929 (0.70833), N = 81 moving right + --- 0.236786 (0.648125), N = 52 moving right + + -- best stat: 0.752675, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 3.0000e+00 + 1.9100e+02 1.0000e+00 4.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + 3.3400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 1.1000e+02 9.8913e-01 1.0896e-02 + 1.3100e+02 9.8188e-01 1.8222e-02 + 1.4000e+02 9.7826e-01 2.1912e-02 + 1.7900e+02 9.7464e-01 2.5616e-02 + + +------------ Growing tree 322 -------------- + +- N obs inbag: 276 +- N row inbag: 174 +- max nodes: 231 +- max leaves: 116 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 9 1 14 5 13 + + + -- linear combo weights (showing up to 5) + + 0.2965 0.6509 0.2696 1.2527 0.4470 + + + -- cutpoint (score) + --- -0.675809 (0.603662), N = 226 moving right + --- -0.259618 (0.660254), N = 186 moving right + --- -0.204911 (0.673263), N = 179 moving right + --- 0.203963 (0.699302), N = 128 moving right + --- 0.427076 (0.724986), N = 116 moving right + + -- best stat: 0.724986, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 8 17 0 14 3 + + + -- linear combo weights (showing up to 5) + + 1.3997 0.4994 -0.4086 -0.0068 3.3745 + + + -- cutpoint (score) + --- 0.248709 (0.629425), N = 215 moving right + --- 0.270018 (0.6339), N = 213 moving right + --- 1.5871 (0.726918), N = 68 moving right + --- 3.85703 (0.635595), N = 31 moving right + --- 5.72756 (0.558957), N = 12 moving right + + -- best stat: 0.726918, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 17 0 2 15 16 + + + -- linear combo weights (showing up to 5) + + 0.6575 -0.3379 -1.3580 -0.0690 0.4849 + + + -- cutpoint (score) + --- -0.55501 (0.569443), N = 243 moving right + --- -0.197785 (0.628755), N = 211 moving right + --- -0.0123634 (0.64752), N = 185 moving right + --- 0.0669987 (0.667764), N = 174 moving right + --- 0.945288 (0.673874), N = 86 moving right + + -- best stat: 0.673874, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 3.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.8551e-01 1.4532e-02 + 1.3100e+02 9.8188e-01 1.8209e-02 + 1.8600e+02 9.7826e-01 2.1899e-02 + 1.9100e+02 9.7101e-01 2.9306e-02 + + +------------ Growing tree 323 -------------- + +- N obs inbag: 276 +- N row inbag: 180 +- max nodes: 211 +- max leaves: 106 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 15 2 16 12 14 + + + -- linear combo weights (showing up to 5) + + -0.2548 0.2357 0.4427 0.0559 0.6124 + + + -- cutpoint (score) + --- -0.666763 (0.551148), N = 246 moving right + --- -0.438953 (0.575847), N = 216 moving right + --- -0.293188 (0.594041), N = 202 moving right + --- 0.330807 (0.644634), N = 100 moving right + --- 0.884895 (0.596152), N = 45 moving right + + -- best stat: 0.644634, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 13 0 5 1 11 + + + -- linear combo weights (showing up to 5) + + 0.2100 -0.0560 1.2186 0.4077 0.6455 + + + -- cutpoint (score) + --- 0.343732 (0.728607), N = 110 moving right + --- 0.561435 (0.71229), N = 99 moving right + --- 1.04429 (0.698959), N = 58 moving right + --- 1.72462 (0.590201), N = 26 moving right + --- 2.00683 (0.544216), N = 14 moving right + + -- best stat: 0.728607, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 8 10 2 16 11 + + + -- linear combo weights (showing up to 5) + + 1.6010 -0.2981 0.1391 0.2424 0.2911 + + + -- cutpoint (score) + --- -1.118 (0.578065), N = 219 moving right + --- -1.01356 (0.615818), N = 199 moving right + --- -0.929677 (0.653976), N = 177 moving right + --- -0.320507 (0.709816), N = 110 moving right + --- -0.0378721 (0.739037), N = 96 moving right + + -- best stat: 0.739037, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + 3.4800e+02 1.0000e+00 2.0000e+00 + 4.0000e+02 1.0000e+00 1.0000e+00 + 4.6000e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.8913e-01 1.0896e-02 + 1.1000e+02 9.8188e-01 1.8222e-02 + 2.2300e+02 9.7826e-01 2.1912e-02 + 2.6400e+02 9.7464e-01 2.5616e-02 + + +------------ Growing tree 324 -------------- + +- N obs inbag: 276 +- N row inbag: 178 +- max nodes: 211 +- max leaves: 106 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 5 2 6 11 4 + + + -- linear combo weights (showing up to 5) + + 0.8336 0.4650 0.0981 0.9751 0.7280 + + + -- cutpoint (score) + --- -0.449308 (0.518202), N = 267 moving right + --- -0.294651 (0.5513), N = 252 moving right + --- 0.797863 (0.693629), N = 128 moving right + --- 1.2349 (0.709321), N = 96 moving right + --- 1.284 (0.712545), N = 87 moving right + + -- best stat: 0.712545, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 5 15 6 7 4 + + + -- linear combo weights (showing up to 5) + + 0.6283 -0.0927 0.1291 9.3336 0.5735 + + + -- cutpoint (score) + --- -0.0739033 (0.523385), N = 251 moving right + --- -0.0191441 (0.575909), N = 216 moving right + --- 0.0107246 (0.60766), N = 200 moving right + --- 0.0366107 (0.634759), N = 186 moving right + --- 1.20565 (0.660531), N = 40 moving right + + -- best stat: 0.660531, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 4 6 15 11 17 + + + -- linear combo weights (showing up to 5) + + 0.3395 0.1583 -0.1307 0.9064 0.5448 + + + -- cutpoint (score) + --- 0.850154 (0.615904), N = 217 moving right + --- 1.15302 (0.631882), N = 199 moving right + --- 1.80062 (0.713566), N = 125 moving right + --- 2.21197 (0.733624), N = 89 moving right + --- 3.53358 (0.581602), N = 24 moving right + + -- best stat: 0.733624, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8551e-01 1.4546e-02 + 7.7000e+01 9.8188e-01 1.8222e-02 + 1.7900e+02 9.7826e-01 2.1912e-02 + 1.8600e+02 9.7101e-01 2.9320e-02 + + +------------ Growing tree 325 -------------- + +- N obs inbag: 276 +- N row inbag: 175 +- max nodes: 235 +- max leaves: 118 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 7 2 16 1 8 + + + -- linear combo weights (showing up to 5) + + 10.9179 0.0331 0.0436 0.3482 1.2212 + + + -- cutpoint (score) + --- -0.578165 (0.656205), N = 180 moving right + --- -0.523857 (0.689585), N = 163 moving right + --- -0.517779 (0.693396), N = 160 moving right + --- -0.485369 (0.709737), N = 150 moving right + --- -0.395682 (0.743615), N = 133 moving right + + -- best stat: 0.743615, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 2 13 5 17 0 + + + -- linear combo weights (showing up to 5) + + 0.0654 0.3508 0.5357 0.6801 -0.2037 + + + -- cutpoint (score) + --- 1.30986 (0.597606), N = 228 moving right + --- 1.58111 (0.604868), N = 214 moving right + --- 1.61692 (0.619693), N = 204 moving right + --- 1.86532 (0.650479), N = 178 moving right + --- 2.85142 (0.641381), N = 68 moving right + + -- best stat: 0.650479, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 15 8 2 5 7 + + + -- linear combo weights (showing up to 5) + + 0.0086 1.2094 -0.2745 0.0449 11.1864 + + + -- cutpoint (score) + --- -1.01068 (0.545311), N = 248 moving right + --- -0.821694 (0.70421), N = 156 moving right + --- -0.617656 (0.739246), N = 127 moving right + --- 0.135984 (0.67919), N = 57 moving right + --- 1.13942 (0.652973), N = 34 moving right + + -- best stat: 0.739246, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 4.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 3.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + 3.3400e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 1.1000e+02 9.8551e-01 1.4559e-02 + 1.7900e+02 9.7101e-01 2.9265e-02 + 1.8600e+02 9.6739e-01 3.2996e-02 + + +------------ Growing tree 326 -------------- + +- N obs inbag: 276 +- N row inbag: 176 +- max nodes: 207 +- max leaves: 104 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 0 4 1 8 17 + + + -- linear combo weights (showing up to 5) + + -0.5533 0.2142 0.2791 1.4424 0.5168 + + + -- cutpoint (score) + --- 0.265307 (0.635826), N = 210 moving right + --- 0.811727 (0.700591), N = 152 moving right + --- 1.17784 (0.758368), N = 115 moving right + --- 2.17498 (0.695329), N = 52 moving right + --- 6.43053 (0.534205), N = 6 moving right + + -- best stat: 0.758368, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 8 0 14 17 3 + + + -- linear combo weights (showing up to 5) + + 1.4359 -0.5472 -0.1530 0.5104 4.4742 + + + -- cutpoint (score) + --- 0.144957 (0.602549), N = 226 moving right + --- 0.756652 (0.701044), N = 158 moving right + --- 0.859184 (0.716874), N = 149 moving right + --- 0.956264 (0.743465), N = 131 moving right + --- 1.45952 (0.739001), N = 78 moving right + + -- best stat: 0.743465, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 11 2 8 6 16 + + + -- linear combo weights (showing up to 5) + + 0.4829 0.6998 1.3582 0.4390 0.2526 + + + -- cutpoint (score) + --- 0.923724 (0.670204), N = 72 moving right + --- 0.93557 (0.672986), N = 70 moving right + --- 1.09689 (0.680426), N = 60 moving right + --- 1.91379 (0.663647), N = 42 moving right + --- 2.75568 (0.602873), N = 20 moving right + + -- best stat: 0.680426, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + 3.3400e+02 1.0000e+00 1.0000e+00 + 3.8800e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 1.1000e+02 9.9275e-01 7.2596e-03 + 1.7900e+02 9.8913e-01 1.0909e-02 + 1.8600e+02 9.8551e-01 1.4572e-02 + 1.9800e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 327 -------------- + +- N obs inbag: 276 +- N row inbag: 178 +- max nodes: 203 +- max leaves: 102 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 17 5 7 11 1 + + + -- linear combo weights (showing up to 5) + + 0.4510 0.4430 9.5859 1.1441 0.5407 + + + -- cutpoint (score) + --- 0.649695 (0.685771), N = 174 moving right + --- 0.940354 (0.732596), N = 151 moving right + --- 1.29971 (0.76263), N = 127 moving right + --- 1.73809 (0.784155), N = 105 moving right + --- 2.3908 (0.749776), N = 59 moving right + + -- best stat: 0.784155, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 0 12 13 5 14 + + + -- linear combo weights (showing up to 5) + + 0.0400 0.1274 0.3031 1.3930 0.1868 + + + -- cutpoint (score) + --- -0.140367 (0.621787), N = 187 moving right + --- -0.018716 (0.649106), N = 165 moving right + --- 0.0367333 (0.654309), N = 155 moving right + --- 0.20168 (0.643863), N = 116 moving right + --- 0.883804 (0.623031), N = 70 moving right + + -- best stat: 0.654309, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 2 9 4 17 5 + + + -- linear combo weights (showing up to 5) + + -1.5362 0.3404 0.2473 0.5295 1.0262 + + + -- cutpoint (score) + --- -0.0307588 (0.681099), N = 184 moving right + --- 0.640832 (0.710969), N = 127 moving right + --- 0.837442 (0.700849), N = 107 moving right + --- 1.23291 (0.68977), N = 80 moving right + --- 1.96656 (0.562087), N = 24 moving right + + -- best stat: 0.710969, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 4.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 3.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 1.1000e+02 9.8188e-01 1.8169e-02 + 1.8600e+02 9.7826e-01 2.1859e-02 + 1.9100e+02 9.6739e-01 3.2970e-02 + 1.9800e+02 9.6014e-01 4.0460e-02 + + +------------ Growing tree 328 -------------- + +- N obs inbag: 276 +- N row inbag: 168 +- max nodes: 219 +- max leaves: 110 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 0 1 12 7 4 + + + -- linear combo weights (showing up to 5) + + -0.4254 0.4515 0.2340 5.4871 0.6520 + + + -- cutpoint (score) + --- -1.10678 (0.507363), N = 269 moving right + --- 0.0803287 (0.677381), N = 153 moving right + --- 0.130264 (0.69227), N = 139 moving right + --- 0.6391 (0.631654), N = 77 moving right + --- 0.74188 (0.6165), N = 62 moving right + + -- best stat: 0.69227, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 16 11 0 1 17 + + + -- linear combo weights (showing up to 5) + + 0.3154 1.0563 -0.3277 0.3881 0.3386 + + + -- cutpoint (score) + --- 0.061142 (0.658515), N = 188 moving right + --- 0.757339 (0.749031), N = 130 moving right + --- 1.19465 (0.761554), N = 98 moving right + --- 1.47124 (0.763635), N = 85 moving right + --- 4.11213 (0.5031), N = 5 moving right + + -- best stat: 0.763635, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 14 5 8 9 3 + + + -- linear combo weights (showing up to 5) + + -0.1445 0.8768 1.4103 -0.0720 5.5614 + + + -- cutpoint (score) + --- -0.694047 (0.594473), N = 227 moving right + --- -0.34852 (0.710422), N = 157 moving right + --- 0.171188 (0.697532), N = 121 moving right + --- 0.437583 (0.716337), N = 88 moving right + --- 0.838303 (0.715847), N = 63 moving right + + -- best stat: 0.716337, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 4.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.8188e-01 1.8169e-02 + 7.7000e+01 9.7826e-01 2.1859e-02 + 1.7900e+02 9.7101e-01 2.9266e-02 + 1.8600e+02 9.6739e-01 3.2997e-02 + + +------------ Growing tree 329 -------------- + +- N obs inbag: 276 +- N row inbag: 173 +- max nodes: 215 +- max leaves: 108 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 10 2 1 14 8 + + + -- linear combo weights (showing up to 5) + + -0.7312 -0.3843 0.2809 0.0685 1.7845 + + + -- cutpoint (score) + --- -2.64722 (0.515862), N = 266 moving right + --- -1.21246 (0.717004), N = 145 moving right + --- -0.917872 (0.738511), N = 127 moving right + --- -0.187624 (0.7415), N = 80 moving right + --- 1.71489 (0.658219), N = 33 moving right + + -- best stat: 0.7415, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 13 6 12 2 0 + + + -- linear combo weights (showing up to 5) + + 0.2736 0.6253 0.0688 -0.4107 0.0006 + + + -- cutpoint (score) + --- -0.264676 (0.6449), N = 106 moving right + --- -0.225198 (0.604609), N = 94 moving right + --- -0.191201 (0.60423), N = 84 moving right + --- 0.060509 (0.535361), N = 39 moving right + --- 0.123068 (0.553699), N = 33 moving right + + -- best stat: 0.6449, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 10 2 1 6 8 + + + -- linear combo weights (showing up to 5) + + -0.7242 -0.4141 0.2863 0.0158 1.8243 + + + -- cutpoint (score) + --- -1.85545 (0.585512), N = 226 moving right + --- -0.914248 (0.742861), N = 122 moving right + --- -0.904437 (0.748795), N = 119 moving right + --- 2.34162 (0.632251), N = 29 moving right + --- 3.95697 (0.579221), N = 17 moving right + + -- best stat: 0.748795, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 3.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 3.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + 3.8800e+02 1.0000e+00 1.0000e+00 + 4.0000e+02 1.0000e+00 5.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.8551e-01 1.4532e-02 + 1.1000e+02 9.8188e-01 1.8209e-02 + 1.3100e+02 9.7826e-01 2.1899e-02 + 1.4000e+02 9.7101e-01 2.9306e-02 + + +------------ Growing tree 330 -------------- + +- N obs inbag: 276 +- N row inbag: 175 +- max nodes: 221 +- max leaves: 111 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 14 2 17 7 9 + + + -- linear combo weights (showing up to 5) + + 0.3289 -0.5932 0.5974 6.6503 0.3064 + + + -- cutpoint (score) + --- 0.898559 (0.60522), N = 191 moving right + --- 0.901944 (0.608505), N = 190 moving right + --- 1.51929 (0.699112), N = 110 moving right + --- 2.07121 (0.660787), N = 56 moving right + --- 2.67264 (0.634965), N = 35 moving right + + -- best stat: 0.699112, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 6 15 9 11 7 + + + -- linear combo weights (showing up to 5) + + 1.1001 0.1743 0.3045 0.8180 6.2837 + + + -- cutpoint (score) + --- -0.325287 (0.671478), N = 166 moving right + --- -0.307804 (0.685872), N = 157 moving right + --- 0.252208 (0.736502), N = 98 moving right + --- 1.01801 (0.705583), N = 67 moving right + --- 1.14621 (0.694394), N = 59 moving right + + -- best stat: 0.736502, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 1 14 9 0 3 + + + -- linear combo weights (showing up to 5) + + 0.2351 0.0039 0.3789 0.0014 5.5851 + + + -- cutpoint (score) + --- -0.170638 (0.594091), N = 190 moving right + --- -0.155174 (0.598113), N = 188 moving right + --- -0.0199381 (0.681313), N = 123 moving right + --- -0.00640059 (0.678546), N = 120 moving right + --- 0.00910248 (0.690093), N = 115 moving right + + -- best stat: 0.690093, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 3.0000e+00 + 7.7000e+01 1.0000e+00 3.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9275e-01 7.2464e-03 + 7.1000e+01 9.8188e-01 1.8195e-02 + 7.7000e+01 9.7101e-01 2.9265e-02 + 1.1000e+02 9.6739e-01 3.2997e-02 + 1.4000e+02 9.6014e-01 4.0487e-02 + + +------------ Growing tree 331 -------------- + +- N obs inbag: 276 +- N row inbag: 180 +- max nodes: 211 +- max leaves: 106 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 12 3 16 1 4 + + + -- linear combo weights (showing up to 5) + + 0.1500 5.0679 0.6106 0.1257 0.9606 + + + -- cutpoint (score) + --- -0.798683 (0.523851), N = 263 moving right + --- -0.0957722 (0.641331), N = 184 moving right + --- 0.0652239 (0.662661), N = 173 moving right + --- 0.821052 (0.737944), N = 97 moving right + --- 2.20466 (0.604536), N = 26 moving right + + -- best stat: 0.737944, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 0 10 2 15 11 + + + -- linear combo weights (showing up to 5) + + 0.1261 -0.7016 -0.0908 -0.3006 0.7177 + + + -- cutpoint (score) + --- -2.00639 (0.512722), N = 269 moving right + --- -1.55775 (0.535867), N = 256 moving right + --- 0.550457 (0.70498), N = 73 moving right + --- 1.26639 (0.637903), N = 36 moving right + --- 1.92133 (0.565786), N = 18 moving right + + -- best stat: 0.70498, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 1 2 14 16 12 + + + -- linear combo weights (showing up to 5) + + 0.3330 0.3016 0.4742 0.7896 0.1644 + + + -- cutpoint (score) + --- -0.598472 (0.573427), N = 229 moving right + --- 0.171637 (0.727097), N = 122 moving right + --- 0.428727 (0.724819), N = 100 moving right + --- 0.444723 (0.724375), N = 98 moving right + --- 0.519479 (0.720625), N = 90 moving right + + -- best stat: 0.727097, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 7.1000e+01 1.0000e+00 3.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 7.1000e+01 9.8913e-01 1.0870e-02 + 7.7000e+01 9.8188e-01 1.8196e-02 + 1.1000e+02 9.7464e-01 2.5576e-02 + 1.3100e+02 9.7101e-01 2.9293e-02 + 1.4000e+02 9.6739e-01 3.3024e-02 + + +------------ Growing tree 332 -------------- + +- N obs inbag: 276 +- N row inbag: 175 +- max nodes: 205 +- max leaves: 103 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 13 8 15 4 9 + + + -- linear combo weights (showing up to 5) + + -0.0229 1.8320 -0.1652 0.1960 -0.0434 + + + -- cutpoint (score) + --- -1.00114 (0.590224), N = 221 moving right + --- -0.361829 (0.738563), N = 112 moving right + --- 0.792643 (0.653951), N = 53 moving right + --- 0.966879 (0.651335), N = 41 moving right + --- 0.973688 (0.652095), N = 40 moving right + + -- best stat: 0.738563, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 16 9 15 4 2 + + + -- linear combo weights (showing up to 5) + + 0.8164 0.8548 -0.1532 0.3409 -0.4849 + + + -- cutpoint (score) + --- -1.60927 (0.534278), N = 258 moving right + --- -1.55855 (0.54528), N = 253 moving right + --- -1.49523 (0.556236), N = 244 moving right + --- -0.734235 (0.712133), N = 149 moving right + --- -0.594185 (0.709964), N = 135 moving right + + -- best stat: 0.712133, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 0 6 9 15 1 + + + -- linear combo weights (showing up to 5) + + 0.1740 0.5688 1.0755 -0.2406 0.5512 + + + -- cutpoint (score) + --- -0.496674 (0.616743), N = 203 moving right + --- 0.265992 (0.681208), N = 93 moving right + --- 0.630867 (0.642749), N = 56 moving right + --- 1.01566 (0.642547), N = 37 moving right + --- 1.33191 (0.572962), N = 23 moving right + + -- best stat: 0.681208, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 7.1000e+01 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 3.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + 3.3400e+02 1.0000e+00 1.0000e+00 + 4.0000e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 7.1000e+01 9.9275e-01 7.2464e-03 + 1.3100e+02 9.8913e-01 1.0896e-02 + 1.4000e+02 9.8551e-01 1.4559e-02 + 1.8600e+02 9.8188e-01 1.8235e-02 + 1.9100e+02 9.7101e-01 2.9306e-02 + + +------------ Growing tree 333 -------------- + +- N obs inbag: 276 +- N row inbag: 179 +- max nodes: 215 +- max leaves: 108 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 7 2 3 12 14 + + + -- linear combo weights (showing up to 5) + + 8.2379 -0.9539 3.2960 0.0585 0.2825 + + + -- cutpoint (score) + --- -1.13967 (0.584851), N = 211 moving right + --- -1.12478 (0.600676), N = 201 moving right + --- -0.81016 (0.670315), N = 90 moving right + --- 0.012146 (0.597455), N = 33 moving right + --- 4.3915 (0.593524), N = 15 moving right + + -- best stat: 0.670315, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 3 17 9 15 16 + + + -- linear combo weights (showing up to 5) + + 5.2900 0.6603 0.6653 -0.0737 0.4047 + + + -- cutpoint (score) + --- 1.00674 (0.567506), N = 237 moving right + --- 1.28354 (0.636374), N = 200 moving right + --- 1.36958 (0.646193), N = 196 moving right + --- 2.58024 (0.724308), N = 68 moving right + --- 2.8723 (0.664526), N = 42 moving right + + -- best stat: 0.724308, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 2 13 11 1 8 + + + -- linear combo weights (showing up to 5) + + -0.0393 0.0277 0.9168 0.5062 1.4476 + + + -- cutpoint (score) + --- -1.42381 (0.621143), N = 210 moving right + --- -0.91325 (0.748864), N = 136 moving right + --- 1.07891 (0.683611), N = 48 moving right + --- 1.91233 (0.659904), N = 37 moving right + --- 3.36547 (0.605555), N = 20 moving right + + -- best stat: 0.748864, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.9275e-01 7.2596e-03 + 1.1000e+02 9.8913e-01 1.0909e-02 + 1.3100e+02 9.8188e-01 1.8235e-02 + 1.7900e+02 9.7464e-01 2.5615e-02 + + +------------ Growing tree 334 -------------- + +- N obs inbag: 276 +- N row inbag: 179 +- max nodes: 219 +- max leaves: 110 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 7 5 1 16 12 + + + -- linear combo weights (showing up to 5) + + 7.7139 0.8824 0.5657 0.2138 0.0879 + + + -- cutpoint (score) + --- -0.54712 (0.564184), N = 232 moving right + --- -0.455428 (0.590552), N = 220 moving right + --- 0.308552 (0.702075), N = 133 moving right + --- 1.12921 (0.688762), N = 60 moving right + --- 1.33673 (0.66539), N = 42 moving right + + -- best stat: 0.702075, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 11 7 15 4 17 + + + -- linear combo weights (showing up to 5) + + 0.4863 7.3023 -0.0455 0.5786 0.3583 + + + -- cutpoint (score) + --- 0.793744 (0.633546), N = 215 moving right + --- 0.962039 (0.666561), N = 190 moving right + --- 1.59968 (0.727233), N = 115 moving right + --- 1.84964 (0.750089), N = 86 moving right + --- 9.65332 (0.545851), N = 10 moving right + + -- best stat: 0.750089, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 3 17 4 1 9 + + + -- linear combo weights (showing up to 5) + + 5.3703 0.3119 0.7847 0.3522 0.1571 + + + -- cutpoint (score) + --- 1.33865 (0.71769), N = 152 moving right + --- 2.05511 (0.681104), N = 67 moving right + --- 2.056 (0.674557), N = 66 moving right + --- 2.35748 (0.666779), N = 43 moving right + --- 2.47333 (0.650966), N = 39 moving right + + -- best stat: 0.71769, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 3.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 4.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9275e-01 7.2464e-03 + 7.7000e+01 9.8188e-01 1.8195e-02 + 1.1000e+02 9.7826e-01 2.1885e-02 + 1.3100e+02 9.6377e-01 3.6700e-02 + 1.4000e+02 9.6014e-01 4.0460e-02 + + +------------ Growing tree 335 -------------- + +- N obs inbag: 276 +- N row inbag: 178 +- max nodes: 233 +- max leaves: 117 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 4 8 14 7 6 + + + -- linear combo weights (showing up to 5) + + 0.2820 1.5355 -0.0956 2.4468 0.8762 + + + -- cutpoint (score) + --- -0.667888 (0.633185), N = 199 moving right + --- -0.35833 (0.747569), N = 135 moving right + --- -0.0190781 (0.75312), N = 118 moving right + --- 0.472048 (0.744694), N = 89 moving right + --- 2.82734 (0.641099), N = 32 moving right + + -- best stat: 0.75312, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 11 7 13 1 12 + + + -- linear combo weights (showing up to 5) + + 0.7688 3.1715 0.4613 0.5342 0.0017 + + + -- cutpoint (score) + --- -0.822638 (0.61586), N = 212 moving right + --- -0.0766039 (0.741485), N = 134 moving right + --- -0.00606165 (0.751939), N = 129 moving right + --- 0.576438 (0.708666), N = 84 moving right + --- 0.964357 (0.702071), N = 69 moving right + + -- best stat: 0.751939, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 17 7 13 16 12 + + + -- linear combo weights (showing up to 5) + + 0.4922 2.8645 0.4695 0.4952 0.1180 + + + -- cutpoint (score) + --- 0.160073 (0.528921), N = 264 moving right + --- 0.559273 (0.572351), N = 243 moving right + --- 0.692943 (0.592767), N = 223 moving right + --- 0.9892 (0.651219), N = 191 moving right + --- 2.227 (0.703705), N = 79 moving right + + -- best stat: 0.703705, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.8188e-01 1.8222e-02 + 1.1000e+02 9.7464e-01 2.5602e-02 + 1.4000e+02 9.6739e-01 3.3037e-02 + + +------------ Growing tree 336 -------------- + +- N obs inbag: 276 +- N row inbag: 188 +- max nodes: 209 +- max leaves: 105 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 12 11 8 4 17 + + + -- linear combo weights (showing up to 5) + + -0.0649 0.4438 1.9354 0.1249 0.4170 + + + -- cutpoint (score) + --- -0.405845 (0.588739), N = 232 moving right + --- -0.155035 (0.633557), N = 209 moving right + --- 0.377951 (0.715431), N = 164 moving right + --- 0.434727 (0.728108), N = 158 moving right + --- 1.29626 (0.769045), N = 98 moving right + + -- best stat: 0.769045, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 0 12 14 3 8 + + + -- linear combo weights (showing up to 5) + + 0.0187 0.0347 -0.0651 6.4857 1.8312 + + + -- cutpoint (score) + --- -1.10962 (0.523053), N = 263 moving right + --- -0.985816 (0.602274), N = 223 moving right + --- -0.677774 (0.764462), N = 125 moving right + --- -0.569698 (0.770195), N = 117 moving right + --- -0.466991 (0.783379), N = 109 moving right + + -- best stat: 0.783379, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 0 1 16 9 8 + + + -- linear combo weights (showing up to 5) + + -0.1314 0.4716 0.2749 -0.5393 2.5280 + + + -- cutpoint (score) + --- -2.06176 (0.527597), N = 254 moving right + --- -1.89117 (0.56044), N = 237 moving right + --- -0.618889 (0.773725), N = 112 moving right + --- 0.80302 (0.704997), N = 49 moving right + --- 8.22993 (0.541483), N = 7 moving right + + -- best stat: 0.773725, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 3.0000e+00 + 1.1000e+02 1.0000e+00 3.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.1000e+01 9.8913e-01 1.0909e-02 + 7.7000e+01 9.7826e-01 2.1898e-02 + 1.1000e+02 9.6739e-01 3.3009e-02 + + +------------ Growing tree 337 -------------- + +- N obs inbag: 276 +- N row inbag: 169 +- max nodes: 219 +- max leaves: 110 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 5 11 0 7 1 + + + -- linear combo weights (showing up to 5) + + 0.9986 0.6458 0.1967 24.2718 0.2565 + + + -- cutpoint (score) + --- -0.139487 (0.671857), N = 180 moving right + --- -0.032769 (0.699573), N = 157 moving right + --- 0.280698 (0.720659), N = 126 moving right + --- 0.828052 (0.735204), N = 84 moving right + --- 24.9227 (0.556697), N = 8 moving right + + -- best stat: 0.735204, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 7 10 5 1 15 + + + -- linear combo weights (showing up to 5) + + 24.5482 -0.5565 0.9716 0.1606 -0.0819 + + + -- cutpoint (score) + --- -0.648596 (0.53585), N = 255 moving right + --- 0.263002 (0.678377), N = 123 moving right + --- 0.799089 (0.690915), N = 64 moving right + --- 1.62047 (0.628418), N = 20 moving right + --- 2.30721 (0.604649), N = 16 moving right + + -- best stat: 0.690915, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 8 11 1 2 13 + + + -- linear combo weights (showing up to 5) + + 2.1302 0.3821 0.5736 0.3980 0.0489 + + + -- cutpoint (score) + --- -1.61263 (0.542348), N = 256 moving right + --- -0.501596 (0.762659), N = 138 moving right + --- 1.35792 (0.673296), N = 43 moving right + --- 1.94042 (0.637795), N = 32 moving right + --- 6.9397 (0.563762), N = 10 moving right + + -- best stat: 0.762659, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.7000e+01 9.8913e-01 1.0896e-02 + 1.1000e+02 9.8188e-01 1.8222e-02 + 1.3100e+02 9.7464e-01 2.5602e-02 + 1.7900e+02 9.7101e-01 2.9319e-02 + + +------------ Growing tree 338 -------------- + +- N obs inbag: 276 +- N row inbag: 168 +- max nodes: 231 +- max leaves: 116 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 4 9 7 16 17 + + + -- linear combo weights (showing up to 5) + + 0.3003 0.3865 2.6382 0.4475 0.5697 + + + -- cutpoint (score) + --- 1.02877 (0.591148), N = 227 moving right + --- 1.48121 (0.668752), N = 182 moving right + --- 1.90251 (0.720069), N = 126 moving right + --- 2.49749 (0.693886), N = 72 moving right + --- 2.87851 (0.628585), N = 44 moving right + + -- best stat: 0.720069, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 1 13 15 12 9 + + + -- linear combo weights (showing up to 5) + + 0.4110 0.1145 -0.3508 0.2110 0.2881 + + + -- cutpoint (score) + --- -0.395376 (0.612418), N = 196 moving right + --- -0.26834 (0.631231), N = 183 moving right + --- -0.00728209 (0.690736), N = 131 moving right + --- 0.574879 (0.591946), N = 46 moving right + --- 1.30469 (0.508525), N = 7 moving right + + -- best stat: 0.690736, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 1 17 13 12 14 + + + -- linear combo weights (showing up to 5) + + 0.2785 0.6299 0.2821 0.1011 0.1679 + + + -- cutpoint (score) + --- 0.86499 (0.552408), N = 250 moving right + --- 1.20268 (0.612481), N = 215 moving right + --- 2.02528 (0.706925), N = 126 moving right + --- 2.74759 (0.584345), N = 28 moving right + --- 2.80225 (0.574014), N = 20 moving right + + -- best stat: 0.706925, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 7.1000e+01 9.9638e-01 3.6232e-03 + 7.7000e+01 9.9275e-01 7.2596e-03 + 1.1000e+02 9.8551e-01 1.4559e-02 + 1.4000e+02 9.7826e-01 2.1912e-02 + 1.8600e+02 9.7101e-01 2.9319e-02 + + +------------ Growing tree 339 -------------- + +- N obs inbag: 276 +- N row inbag: 177 +- max nodes: 215 +- max leaves: 108 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 7 17 14 10 4 + + + -- linear combo weights (showing up to 5) + + 7.3419 0.4678 0.3938 -0.5430 0.3100 + + + -- cutpoint (score) + --- 1.07197 (0.660919), N = 188 moving right + --- 1.7312 (0.676301), N = 105 moving right + --- 1.82796 (0.670025), N = 93 moving right + --- 1.93709 (0.651596), N = 80 moving right + --- 2.25648 (0.683209), N = 58 moving right + + -- best stat: 0.683209, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 12 13 3 16 0 + + + -- linear combo weights (showing up to 5) + + 0.1896 0.2252 14.3340 0.6267 -0.0154 + + + -- cutpoint (score) + --- -0.620507 (0.601136), N = 203 moving right + --- -0.608968 (0.604838), N = 200 moving right + --- -0.370105 (0.645004), N = 174 moving right + --- -0.234561 (0.658841), N = 160 moving right + --- 0.660675 (0.67828), N = 55 moving right + + -- best stat: 0.67828, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 17 16 1 0 12 + + + -- linear combo weights (showing up to 5) + + 0.5898 0.6682 0.6357 -0.1590 0.1426 + + + -- cutpoint (score) + --- 0.276346 (0.562594), N = 240 moving right + --- 0.406254 (0.581657), N = 230 moving right + --- 0.52734 (0.599632), N = 222 moving right + --- 0.894534 (0.646706), N = 190 moving right + --- 1.23327 (0.692969), N = 165 moving right + + -- best stat: 0.692969, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.1000e+01 9.8551e-01 1.4559e-02 + 7.7000e+01 9.7826e-01 2.1912e-02 + 1.1000e+02 9.7464e-01 2.5616e-02 + + +------------ Growing tree 340 -------------- + +- N obs inbag: 276 +- N row inbag: 177 +- max nodes: 189 +- max leaves: 95 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 1 14 15 6 7 + + + -- linear combo weights (showing up to 5) + + 0.3589 0.6539 -0.1252 1.9522 8.5551 + + + -- cutpoint (score) + --- -0.565105 (0.619112), N = 205 moving right + --- 0.36569 (0.674662), N = 82 moving right + --- 0.652992 (0.675807), N = 55 moving right + --- 1.89632 (0.642206), N = 31 moving right + --- 2.57442 (0.613092), N = 22 moving right + + -- best stat: 0.675807, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 17 8 14 9 7 + + + -- linear combo weights (showing up to 5) + + 0.5438 1.8740 0.1990 -0.2145 6.0113 + + + -- cutpoint (score) + --- 0.546198 (0.642916), N = 195 moving right + --- 1.13801 (0.71783), N = 127 moving right + --- 1.63983 (0.744289), N = 73 moving right + --- 2.97454 (0.684619), N = 44 moving right + --- 3.68603 (0.665827), N = 32 moving right + + -- best stat: 0.744289, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 7 15 1 0 12 + + + -- linear combo weights (showing up to 5) + + 8.2810 -0.1598 0.4541 -0.3118 0.0328 + + + -- cutpoint (score) + --- -0.745204 (0.518723), N = 237 moving right + --- -0.671248 (0.540215), N = 226 moving right + --- -0.223352 (0.621218), N = 133 moving right + --- -0.035229 (0.633028), N = 106 moving right + --- 0.386545 (0.626734), N = 57 moving right + + -- best stat: 0.633028, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + 3.3400e+02 1.0000e+00 1.0000e+00 + 4.0000e+02 1.0000e+00 3.0000e+00 + 5.1500e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 7.7000e+01 9.9638e-01 3.6232e-03 + 1.1000e+02 9.9275e-01 7.2596e-03 + 1.3100e+02 9.8551e-01 1.4559e-02 + 1.9100e+02 9.8188e-01 1.8235e-02 + 2.6400e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 341 -------------- + +- N obs inbag: 276 +- N row inbag: 156 +- max nodes: 217 +- max leaves: 109 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 11 0 16 14 1 + + + -- linear combo weights (showing up to 5) + + 1.0847 0.2629 0.3991 0.3943 0.2770 + + + -- cutpoint (score) + --- -1.25665 (0.549892), N = 253 moving right + --- -1.07869 (0.598496), N = 228 moving right + --- 0.167459 (0.713438), N = 105 moving right + --- 0.798399 (0.70357), N = 65 moving right + --- 2.48822 (0.568478), N = 16 moving right + + -- best stat: 0.713438, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 17 8 7 2 16 + + + -- linear combo weights (showing up to 5) + + 0.3698 1.6493 5.2934 -0.5055 0.1651 + + + -- cutpoint (score) + --- -0.203631 (0.706836), N = 158 moving right + --- -0.0130855 (0.725721), N = 137 moving right + --- 1.81042 (0.660533), N = 45 moving right + --- 2.31846 (0.657933), N = 40 moving right + --- 2.67693 (0.657841), N = 35 moving right + + -- best stat: 0.725721, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 5 7 16 9 14 + + + -- linear combo weights (showing up to 5) + + 0.8365 6.9432 0.3617 0.1858 0.5378 + + + -- cutpoint (score) + --- -0.539226 (0.573561), N = 229 moving right + --- -0.214035 (0.653241), N = 176 moving right + --- 0.0906959 (0.688687), N = 134 moving right + --- 0.203988 (0.698187), N = 124 moving right + --- 7.34613 (0.568846), N = 13 moving right + + -- best stat: 0.698187, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 3.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8551e-01 1.4532e-02 + 7.7000e+01 9.7826e-01 2.1885e-02 + 1.1000e+02 9.7101e-01 2.9293e-02 + 1.3100e+02 9.6739e-01 3.3024e-02 + + +------------ Growing tree 342 -------------- + +- N obs inbag: 276 +- N row inbag: 175 +- max nodes: 211 +- max leaves: 106 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 10 4 16 6 3 + + + -- linear combo weights (showing up to 5) + + -0.4167 0.4209 0.1457 0.1102 5.3844 + + + -- cutpoint (score) + --- -0.21666 (0.574104), N = 201 moving right + --- 0.218245 (0.660693), N = 126 moving right + --- 0.524934 (0.646351), N = 68 moving right + --- 0.62077 (0.615004), N = 55 moving right + --- 1.1184 (0.60677), N = 17 moving right + + -- best stat: 0.660693, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 11 13 1 10 3 + + + -- linear combo weights (showing up to 5) + + 1.3276 0.2069 0.5207 -0.1626 5.3995 + + + -- cutpoint (score) + --- -1.09052 (0.635924), N = 206 moving right + --- -0.748368 (0.69459), N = 157 moving right + --- 1.04797 (0.686267), N = 41 moving right + --- 1.07418 (0.689198), N = 39 moving right + --- 2.40958 (0.625073), N = 23 moving right + + -- best stat: 0.69459, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 2 7 8 15 0 + + + -- linear combo weights (showing up to 5) + + -0.5558 11.6057 2.2490 0.0798 -0.5484 + + + -- cutpoint (score) + --- -1.92614 (0.658948), N = 185 moving right + --- -1.60031 (0.728979), N = 140 moving right + --- -1.57289 (0.737549), N = 134 moving right + --- -1.38418 (0.749139), N = 115 moving right + --- -0.521452 (0.717143), N = 68 moving right + + -- best stat: 0.749139, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 3.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 3.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 3.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + 3.8800e+02 1.0000e+00 1.0000e+00 + 4.6000e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.7000e+01 9.8551e-01 1.4532e-02 + 1.3100e+02 9.7826e-01 2.1885e-02 + 1.4000e+02 9.7464e-01 2.5589e-02 + 1.9800e+02 9.6377e-01 3.6741e-02 + + +------------ Growing tree 343 -------------- + +- N obs inbag: 276 +- N row inbag: 171 +- max nodes: 239 +- max leaves: 120 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 10 6 4 15 9 + + + -- linear combo weights (showing up to 5) + + -0.5911 0.7977 0.5504 -0.3146 0.1312 + + + -- cutpoint (score) + --- -0.748693 (0.54936), N = 249 moving right + --- 0.104874 (0.678685), N = 156 moving right + --- 0.132167 (0.677677), N = 154 moving right + --- 0.260682 (0.701884), N = 139 moving right + --- 0.578075 (0.716836), N = 115 moving right + + -- best stat: 0.716836, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 14 17 6 4 11 + + + -- linear combo weights (showing up to 5) + + 0.0990 0.4882 1.2465 0.3006 0.7809 + + + -- cutpoint (score) + --- 0.651901 (0.598145), N = 227 moving right + --- 1.223 (0.674715), N = 184 moving right + --- 1.46725 (0.695652), N = 152 moving right + --- 1.50476 (0.707931), N = 145 moving right + --- 1.76398 (0.746822), N = 126 moving right + + -- best stat: 0.746822, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 7 5 14 17 8 + + + -- linear combo weights (showing up to 5) + + 3.3674 0.4169 0.0774 0.4575 1.1763 + + + -- cutpoint (score) + --- 0.507337 (0.610382), N = 224 moving right + --- 1.87056 (0.772654), N = 91 moving right + --- 2.67449 (0.694233), N = 53 moving right + --- 3.76031 (0.663527), N = 40 moving right + --- 3.82712 (0.668072), N = 37 moving right + + -- best stat: 0.772654, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 4.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 3.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 4.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.1000e+01 9.7826e-01 2.1858e-02 + 7.7000e+01 9.7464e-01 2.5562e-02 + 1.1000e+02 9.6377e-01 3.6714e-02 + + +------------ Growing tree 344 -------------- + +- N obs inbag: 276 +- N row inbag: 168 +- max nodes: 199 +- max leaves: 100 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 13 12 11 2 7 + + + -- linear combo weights (showing up to 5) + + 0.1539 -0.0277 0.5227 0.2487 4.0459 + + + -- cutpoint (score) + --- -0.0430641 (0.616826), N = 181 moving right + --- 0.260667 (0.66521), N = 99 moving right + --- 0.303468 (0.660518), N = 95 moving right + --- 0.359354 (0.662082), N = 83 moving right + --- 1.46179 (0.556005), N = 15 moving right + + -- best stat: 0.66521, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 1 13 16 11 7 + + + -- linear combo weights (showing up to 5) + + 0.6512 0.3683 0.5297 0.3504 3.4148 + + + -- cutpoint (score) + --- -0.79513 (0.610099), N = 210 moving right + --- -0.756158 (0.607219), N = 207 moving right + --- -0.717717 (0.621667), N = 200 moving right + --- -0.101937 (0.683184), N = 118 moving right + --- 0.0128972 (0.701703), N = 97 moving right + + -- best stat: 0.701703, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 1 6 7 13 17 + + + -- linear combo weights (showing up to 5) + + 0.5253 0.3810 3.9558 0.1910 0.6945 + + + -- cutpoint (score) + --- 1.07818 (0.576709), N = 237 moving right + --- 1.83347 (0.65883), N = 181 moving right + --- 2.1553 (0.720148), N = 125 moving right + --- 2.5941 (0.727595), N = 84 moving right + --- 3.19177 (0.65034), N = 45 moving right + + -- best stat: 0.727595, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.9275e-01 7.2596e-03 + 7.7000e+01 9.8913e-01 1.0909e-02 + 1.4000e+02 9.8551e-01 1.4572e-02 + 1.8600e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 345 -------------- + +- N obs inbag: 276 +- N row inbag: 174 +- max nodes: 231 +- max leaves: 116 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 12 16 0 2 9 + + + -- linear combo weights (showing up to 5) + + 0.1087 0.7535 -0.1176 -0.1620 0.3309 + + + -- cutpoint (score) + --- -0.916857 (0.603966), N = 221 moving right + --- -0.775483 (0.616135), N = 208 moving right + --- -0.360686 (0.672648), N = 150 moving right + --- 0.395734 (0.636236), N = 49 moving right + --- 0.523048 (0.598503), N = 38 moving right + + -- best stat: 0.672648, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 4 7 17 15 2 + + + -- linear combo weights (showing up to 5) + + 0.6485 6.0125 0.4618 0.0365 -0.5856 + + + -- cutpoint (score) + --- 0.761754 (0.614561), N = 221 moving right + --- 0.825164 (0.671384), N = 180 moving right + --- 1.4768 (0.692535), N = 107 moving right + --- 1.53003 (0.689016), N = 100 moving right + --- 1.97947 (0.605482), N = 28 moving right + + -- best stat: 0.692535, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 15 12 16 7 5 + + + -- linear combo weights (showing up to 5) + + -0.1027 0.1952 0.5555 5.2976 0.7333 + + + -- cutpoint (score) + --- -0.306129 (0.595859), N = 198 moving right + --- -0.285175 (0.594635), N = 192 moving right + --- 0.697206 (0.663453), N = 73 moving right + --- 5.48536 (0.573736), N = 15 moving right + --- 6.62764 (0.53297), N = 7 moving right + + -- best stat: 0.663453, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.1000e+01 9.8551e-01 1.4559e-02 + 7.7000e+01 9.7826e-01 2.1912e-02 + 1.1000e+02 9.7101e-01 2.9319e-02 + + +------------ Growing tree 346 -------------- + +- N obs inbag: 276 +- N row inbag: 172 +- max nodes: 195 +- max leaves: 98 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 14 6 8 15 5 + + + -- linear combo weights (showing up to 5) + + -0.0631 0.8997 1.5909 -0.3430 0.6557 + + + -- cutpoint (score) + --- -0.916681 (0.592349), N = 226 moving right + --- -0.273569 (0.721332), N = 134 moving right + --- -0.162128 (0.712601), N = 115 moving right + --- 2.1078 (0.606661), N = 25 moving right + --- 4.86331 (0.535911), N = 6 moving right + + -- best stat: 0.721332, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 0 15 6 16 3 + + + -- linear combo weights (showing up to 5) + + -0.2715 -0.1902 0.5130 0.5760 10.1145 + + + -- cutpoint (score) + --- -0.861617 (0.545496), N = 244 moving right + --- -0.616735 (0.571232), N = 202 moving right + --- 0.160726 (0.700959), N = 68 moving right + --- 0.592345 (0.681876), N = 41 moving right + --- 11.1136 (0.557379), N = 9 moving right + + -- best stat: 0.700959, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 13 15 7 17 6 + + + -- linear combo weights (showing up to 5) + + 0.2974 -0.0335 12.2099 0.6707 1.9501 + + + -- cutpoint (score) + --- 1.84938 (0.650166), N = 170 moving right + --- 2.5365 (0.723608), N = 99 moving right + --- 2.64872 (0.752582), N = 82 moving right + --- 2.83382 (0.68947), N = 60 moving right + --- 4.94448 (0.616662), N = 16 moving right + + -- best stat: 0.752582, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.3400e+02 1.0000e+00 1.0000e+00 + 3.4800e+02 1.0000e+00 4.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.8913e-01 1.0896e-02 + 1.1000e+02 9.8551e-01 1.4559e-02 + 1.3100e+02 9.7826e-01 2.1912e-02 + 1.7900e+02 9.7101e-01 2.9319e-02 + + +------------ Growing tree 347 -------------- + +- N obs inbag: 276 +- N row inbag: 178 +- max nodes: 207 +- max leaves: 104 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 6 2 9 13 14 + + + -- linear combo weights (showing up to 5) + + 0.8275 -0.1945 0.3182 0.6822 0.3115 + + + -- cutpoint (score) + --- -0.883393 (0.575101), N = 224 moving right + --- -0.872751 (0.578138), N = 221 moving right + --- -0.41807 (0.667881), N = 161 moving right + --- 0.969221 (0.612152), N = 44 moving right + --- 1.07603 (0.621133), N = 40 moving right + + -- best stat: 0.667881, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 14 13 4 6 5 + + + -- linear combo weights (showing up to 5) + + 0.3679 0.6958 0.8188 0.3942 0.8861 + + + -- cutpoint (score) + --- -0.949384 (0.521715), N = 263 moving right + --- -0.371215 (0.614408), N = 216 moving right + --- 0.601164 (0.703132), N = 139 moving right + --- 1.01205 (0.711788), N = 100 moving right + --- 1.02734 (0.702286), N = 98 moving right + + -- best stat: 0.711788, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 0 16 10 14 1 + + + -- linear combo weights (showing up to 5) + + 0.0550 0.4953 -1.0864 0.5178 0.1599 + + + -- cutpoint (score) + --- -0.82554 (0.644757), N = 206 moving right + --- -0.733828 (0.652089), N = 196 moving right + --- -0.434201 (0.673977), N = 172 moving right + --- 0.344789 (0.735889), N = 99 moving right + --- 1.00418 (0.710378), N = 68 moving right + + -- best stat: 0.735889, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 3.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.8913e-01 1.0870e-02 + 7.1000e+01 9.8551e-01 1.4533e-02 + 7.7000e+01 9.8188e-01 1.8209e-02 + 1.4000e+02 9.7826e-01 2.1899e-02 + 1.7900e+02 9.7464e-01 2.5603e-02 + + +------------ Growing tree 348 -------------- + +- N obs inbag: 276 +- N row inbag: 167 +- max nodes: 185 +- max leaves: 93 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 5 17 15 3 14 + + + -- linear combo weights (showing up to 5) + + 0.4384 0.3736 -0.1307 4.1186 0.1157 + + + -- cutpoint (score) + --- 0.498231 (0.530402), N = 257 moving right + --- 0.759128 (0.569589), N = 236 moving right + --- 0.94458 (0.59707), N = 204 moving right + --- 1.15033 (0.643223), N = 155 moving right + --- 2.0808 (0.602552), N = 23 moving right + + -- best stat: 0.643223, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 2 3 9 4 10 + + + -- linear combo weights (showing up to 5) + + -0.3928 3.9083 0.4352 0.9813 -0.4994 + + + -- cutpoint (score) + --- -1.08978 (0.534735), N = 257 moving right + --- -0.615633 (0.620338), N = 209 moving right + --- -0.371668 (0.681165), N = 179 moving right + --- -0.0824343 (0.700124), N = 162 moving right + --- 0.282116 (0.710083), N = 138 moving right + + -- best stat: 0.710083, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 15 9 4 11 3 + + + -- linear combo weights (showing up to 5) + + -0.0250 0.4352 1.0656 0.3737 4.0641 + + + -- cutpoint (score) + --- -0.59179 (0.533083), N = 261 moving right + --- -0.360551 (0.595705), N = 229 moving right + --- 0.501331 (0.689639), N = 150 moving right + --- 0.895912 (0.740173), N = 110 moving right + --- 1.68763 (0.632642), N = 32 moving right + + -- best stat: 0.740173, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 7.1000e+01 1.0000e+00 3.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + 3.3400e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 7.1000e+01 9.8913e-01 1.0870e-02 + 1.1000e+02 9.8551e-01 1.4533e-02 + 1.3100e+02 9.8188e-01 1.8209e-02 + 1.8600e+02 9.7826e-01 2.1899e-02 + 1.9100e+02 9.7464e-01 2.5603e-02 + + +------------ Growing tree 349 -------------- + +- N obs inbag: 276 +- N row inbag: 177 +- max nodes: 227 +- max leaves: 114 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 3 15 10 9 4 + + + -- linear combo weights (showing up to 5) + + 7.1952 -0.1650 -0.2568 0.5381 0.7514 + + + -- cutpoint (score) + --- -0.604391 (0.533466), N = 254 moving right + --- -0.425244 (0.578165), N = 233 moving right + --- 0.98284 (0.704466), N = 54 moving right + --- 1.42817 (0.667603), N = 39 moving right + --- 7.95011 (0.575985), N = 14 moving right + + -- best stat: 0.704466, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 8 7 13 5 14 + + + -- linear combo weights (showing up to 5) + + 1.1233 11.8660 0.2548 0.4508 0.0258 + + + -- cutpoint (score) + --- -0.346984 (0.726757), N = 138 moving right + --- -0.316897 (0.73202), N = 136 moving right + --- -0.294283 (0.727208), N = 135 moving right + --- 0.200243 (0.756118), N = 92 moving right + --- 0.511237 (0.716191), N = 67 moving right + + -- best stat: 0.756118, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 12 15 11 8 9 + + + -- linear combo weights (showing up to 5) + + 0.0201 -0.2227 0.3693 2.0438 -0.4210 + + + -- cutpoint (score) + --- -1.1322 (0.642327), N = 190 moving right + --- -1.07516 (0.649574), N = 182 moving right + --- -1.07094 (0.655701), N = 179 moving right + --- -0.846144 (0.727366), N = 143 moving right + --- 2.02091 (0.64215), N = 34 moving right + + -- best stat: 0.727366, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 3.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.8188e-01 1.8222e-02 + 1.1000e+02 9.7464e-01 2.5602e-02 + 1.3100e+02 9.7101e-01 2.9319e-02 + + +------------ Growing tree 350 -------------- + +- N obs inbag: 276 +- N row inbag: 174 +- max nodes: 235 +- max leaves: 118 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 15 9 5 7 1 + + + -- linear combo weights (showing up to 5) + + -0.1943 0.3810 0.6294 6.3111 0.4640 + + + -- cutpoint (score) + --- -0.600525 (0.547507), N = 249 moving right + --- -0.111778 (0.636468), N = 190 moving right + --- 0.0275848 (0.645031), N = 172 moving right + --- 1.05879 (0.658129), N = 42 moving right + --- 2.92237 (0.600736), N = 20 moving right + + -- best stat: 0.658129, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 4 1 6 15 3 + + + -- linear combo weights (showing up to 5) + + 0.6793 0.3266 -0.5240 -0.1590 8.7226 + + + -- cutpoint (score) + --- -0.50081 (0.515901), N = 264 moving right + --- 0.277702 (0.641995), N = 154 moving right + --- 0.443078 (0.654801), N = 121 moving right + --- 0.500477 (0.658168), N = 110 moving right + --- 1.06672 (0.641509), N = 37 moving right + + -- best stat: 0.658168, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 12 5 8 1 7 + + + -- linear combo weights (showing up to 5) + + 0.0221 0.2428 2.0749 0.4854 5.1290 + + + -- cutpoint (score) + --- -1.15511 (0.592211), N = 218 moving right + --- -1.04074 (0.622961), N = 202 moving right + --- -0.85576 (0.683235), N = 169 moving right + --- -0.822839 (0.691954), N = 164 moving right + --- -0.458014 (0.736581), N = 131 moving right + + -- best stat: 0.736581, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 3.0000e+00 + 1.1000e+02 1.0000e+00 3.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 7.7000e+01 9.8188e-01 1.8195e-02 + 1.1000e+02 9.7101e-01 2.9265e-02 + 1.3100e+02 9.6739e-01 3.2997e-02 + 1.4000e+02 9.6014e-01 4.0487e-02 + + +------------ Growing tree 351 -------------- + +- N obs inbag: 276 +- N row inbag: 185 +- max nodes: 249 +- max leaves: 125 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 4 3 2 11 0 + + + -- linear combo weights (showing up to 5) + + 0.5707 3.9239 0.1717 0.6866 -0.0681 + + + -- cutpoint (score) + --- 0.186138 (0.671132), N = 156 moving right + --- 0.347606 (0.703153), N = 125 moving right + --- 0.45837 (0.686665), N = 110 moving right + --- 1.67703 (0.632643), N = 27 moving right + --- 5.04935 (0.518219), N = 6 moving right + + -- best stat: 0.703153, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 12 7 9 14 13 + + + -- linear combo weights (showing up to 5) + + 0.1045 5.0971 0.3054 0.2629 0.3696 + + + -- cutpoint (score) + --- -0.762922 (0.539655), N = 247 moving right + --- -0.463866 (0.596823), N = 217 moving right + --- -0.217226 (0.656853), N = 170 moving right + --- -0.197682 (0.661271), N = 165 moving right + --- 0.220073 (0.672492), N = 95 moving right + + -- best stat: 0.672492, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 16 10 5 8 12 + + + -- linear combo weights (showing up to 5) + + 0.2350 -0.4781 0.1083 1.3506 0.0554 + + + -- cutpoint (score) + --- -1.71068 (0.491447), N = 270 moving right + --- -0.260593 (0.708595), N = 119 moving right + --- -0.0735808 (0.725207), N = 102 moving right + --- 0.834119 (0.671026), N = 48 moving right + --- 5.48963 (0.539443), N = 7 moving right + + -- best stat: 0.725207, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.1000e+01 9.8913e-01 1.0909e-02 + 7.7000e+01 9.8551e-01 1.4572e-02 + 1.1000e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 352 -------------- + +- N obs inbag: 276 +- N row inbag: 167 +- max nodes: 219 +- max leaves: 110 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 12 3 17 7 15 + + + -- linear combo weights (showing up to 5) + + 0.0727 4.5867 0.6098 5.4469 0.0013 + + + -- cutpoint (score) + --- 1.22471 (0.615474), N = 211 moving right + --- 1.27154 (0.618573), N = 210 moving right + --- 1.81704 (0.717831), N = 141 moving right + --- 2.16156 (0.713771), N = 99 moving right + --- 2.42291 (0.665605), N = 62 moving right + + -- best stat: 0.717831, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 14 13 1 12 6 + + + -- linear combo weights (showing up to 5) + + 0.1687 0.8442 0.4965 -0.0198 0.6081 + + + -- cutpoint (score) + --- -0.506663 (0.653055), N = 179 moving right + --- -0.386179 (0.664622), N = 161 moving right + --- 0.180192 (0.698778), N = 97 moving right + --- 0.193746 (0.698232), N = 95 moving right + --- 1.38049 (0.57045), N = 22 moving right + + -- best stat: 0.698778, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 2 5 6 16 14 + + + -- linear combo weights (showing up to 5) + + -0.3238 1.2663 0.4250 0.4040 0.2877 + + + -- cutpoint (score) + --- -0.607143 (0.584941), N = 208 moving right + --- -0.549846 (0.588455), N = 190 moving right + --- -0.357533 (0.662178), N = 141 moving right + --- 0.422866 (0.660279), N = 93 moving right + --- 1.18506 (0.648865), N = 35 moving right + + -- best stat: 0.662178, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 4.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.9275e-01 7.2596e-03 + 7.7000e+01 9.8551e-01 1.4559e-02 + 1.3100e+02 9.7826e-01 2.1912e-02 + 1.4000e+02 9.7464e-01 2.5615e-02 + + +------------ Growing tree 353 -------------- + +- N obs inbag: 276 +- N row inbag: 173 +- max nodes: 221 +- max leaves: 111 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 7 3 5 17 0 + + + -- linear combo weights (showing up to 5) + + 19.8499 0.7003 0.6664 0.3895 -0.2306 + + + -- cutpoint (score) + --- 0.937989 (0.646741), N = 153 moving right + --- 1.16859 (0.67592), N = 120 moving right + --- 1.21487 (0.682418), N = 117 moving right + --- 1.6044 (0.668188), N = 71 moving right + --- 2.92481 (0.595065), N = 15 moving right + + -- best stat: 0.682418, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 6 10 11 14 13 + + + -- linear combo weights (showing up to 5) + + 0.1867 -0.5919 0.6827 0.2864 0.3712 + + + -- cutpoint (score) + --- -1.02934 (0.587744), N = 214 moving right + --- -0.859401 (0.599774), N = 208 moving right + --- -0.544766 (0.667448), N = 156 moving right + --- 0.148651 (0.707012), N = 105 moving right + --- 0.373755 (0.70111), N = 88 moving right + + -- best stat: 0.707012, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 5 9 10 17 0 + + + -- linear combo weights (showing up to 5) + + 0.6618 0.2741 -0.5399 0.4236 -0.1366 + + + -- cutpoint (score) + --- 0.603274 (0.598828), N = 211 moving right + --- 0.624033 (0.607773), N = 207 moving right + --- 1.27474 (0.694859), N = 134 moving right + --- 1.57537 (0.693173), N = 113 moving right + --- 2.43257 (0.636377), N = 40 moving right + + -- best stat: 0.694859, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8551e-01 1.4546e-02 + 7.1000e+01 9.7826e-01 2.1899e-02 + 1.1000e+02 9.7101e-01 2.9306e-02 + 1.3100e+02 9.6739e-01 3.3037e-02 + + +------------ Growing tree 354 -------------- + +- N obs inbag: 276 +- N row inbag: 174 +- max nodes: 229 +- max leaves: 115 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 14 17 2 3 11 + + + -- linear combo weights (showing up to 5) + + 0.0529 0.2229 0.7417 8.8985 1.2390 + + + -- cutpoint (score) + --- 0.680897 (0.637425), N = 200 moving right + --- 0.910132 (0.689992), N = 166 moving right + --- 1.36986 (0.739812), N = 110 moving right + --- 2.76188 (0.642615), N = 37 moving right + --- 3.53749 (0.623652), N = 26 moving right + + -- best stat: 0.739812, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 13 5 7 8 3 + + + -- linear combo weights (showing up to 5) + + 0.1970 0.8115 1.0778 1.2993 7.8452 + + + -- cutpoint (score) + --- -0.955435 (0.540995), N = 254 moving right + --- -0.780433 (0.610748), N = 214 moving right + --- -0.621761 (0.663112), N = 182 moving right + --- 0.0557711 (0.701381), N = 115 moving right + --- 1.86324 (0.662668), N = 37 moving right + + -- best stat: 0.701381, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 14 13 0 17 5 + + + -- linear combo weights (showing up to 5) + + 0.3966 0.3021 -0.6006 0.3891 1.1700 + + + -- cutpoint (score) + --- 0.406581 (0.606789), N = 214 moving right + --- 1.02192 (0.661436), N = 142 moving right + --- 1.08916 (0.646613), N = 136 moving right + --- 1.48434 (0.644897), N = 104 moving right + --- 2.01636 (0.628903), N = 54 moving right + + -- best stat: 0.661436, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 5.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 3.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 7.1000e+01 9.9638e-01 3.6232e-03 + 7.7000e+01 9.9275e-01 7.2596e-03 + 1.3100e+02 9.7464e-01 2.5508e-02 + 1.4000e+02 9.7101e-01 2.9225e-02 + 1.7900e+02 9.6739e-01 3.2957e-02 + + +------------ Growing tree 355 -------------- + +- N obs inbag: 276 +- N row inbag: 172 +- max nodes: 251 +- max leaves: 126 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 9 8 13 5 12 + + + -- linear combo weights (showing up to 5) + + -0.0969 1.6092 -0.0033 0.2708 0.0513 + + + -- cutpoint (score) + --- -0.934561 (0.553643), N = 249 moving right + --- -0.901552 (0.594165), N = 232 moving right + --- 0.172668 (0.701469), N = 84 moving right + --- 0.234866 (0.694815), N = 75 moving right + --- 0.356625 (0.684292), N = 64 moving right + + -- best stat: 0.701469, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 10 11 4 3 1 + + + -- linear combo weights (showing up to 5) + + -0.3444 0.7180 0.5911 4.7908 0.2859 + + + -- cutpoint (score) + --- 0.12414 (0.693619), N = 148 moving right + --- 0.564807 (0.750869), N = 103 moving right + --- 1.15911 (0.717749), N = 65 moving right + --- 6.01958 (0.57824), N = 17 moving right + --- 6.85479 (0.529737), N = 7 moving right + + -- best stat: 0.750869, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 17 16 9 12 7 + + + -- linear combo weights (showing up to 5) + + 0.4123 0.5342 0.5960 0.0742 5.2049 + + + -- cutpoint (score) + --- 0.613706 (0.614986), N = 211 moving right + --- 1.16034 (0.682722), N = 158 moving right + --- 1.34671 (0.69003), N = 123 moving right + --- 1.48319 (0.694105), N = 106 moving right + --- 3.48696 (0.595903), N = 22 moving right + + -- best stat: 0.694105, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.3400e+02 1.0000e+00 4.0000e+00 + 3.4800e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.9275e-01 7.2596e-03 + 7.7000e+01 9.8913e-01 1.0909e-02 + 1.4000e+02 9.8188e-01 1.8235e-02 + 1.9100e+02 9.7464e-01 2.5615e-02 + + +------------ Growing tree 356 -------------- + +- N obs inbag: 276 +- N row inbag: 175 +- max nodes: 247 +- max leaves: 124 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 13 14 16 0 4 + + + -- linear combo weights (showing up to 5) + + 0.2408 0.4275 0.8725 -0.3868 0.4978 + + + -- cutpoint (score) + --- -1.05678 (0.542992), N = 247 moving right + --- -0.81254 (0.572899), N = 231 moving right + --- -0.732756 (0.579254), N = 226 moving right + --- -0.613679 (0.609122), N = 211 moving right + --- -0.476141 (0.645541), N = 193 moving right + + -- best stat: 0.645541, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 14 0 3 16 7 + + + -- linear combo weights (showing up to 5) + + 0.5015 -0.2759 2.5969 0.6815 5.1229 + + + -- cutpoint (score) + --- -0.752728 (0.574197), N = 228 moving right + --- -0.607589 (0.598398), N = 204 moving right + --- -0.35936 (0.63106), N = 149 moving right + --- 0.100423 (0.669487), N = 100 moving right + --- 0.172797 (0.66929), N = 89 moving right + + -- best stat: 0.669487, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 14 1 2 15 8 + + + -- linear combo weights (showing up to 5) + + -0.1273 0.4487 -0.3743 -0.0293 2.4208 + + + -- cutpoint (score) + --- -1.79684 (0.577424), N = 226 moving right + --- -1.59501 (0.605364), N = 206 moving right + --- -1.50332 (0.633933), N = 186 moving right + --- -1.14748 (0.715823), N = 148 moving right + --- -0.870976 (0.758815), N = 120 moving right + + -- best stat: 0.758815, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 3.0000e+00 + 1.7900e+02 1.0000e+00 3.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 1.3100e+02 9.8913e-01 1.0896e-02 + 1.4000e+02 9.7826e-01 2.1885e-02 + 1.7900e+02 9.6739e-01 3.2996e-02 + 1.8600e+02 9.6377e-01 3.6741e-02 + + +------------ Growing tree 357 -------------- + +- N obs inbag: 276 +- N row inbag: 181 +- max nodes: 213 +- max leaves: 107 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 12 9 3 16 7 + + + -- linear combo weights (showing up to 5) + + 0.2118 0.4007 7.3644 0.2078 4.9603 + + + -- cutpoint (score) + --- -0.522166 (0.526409), N = 261 moving right + --- -0.393998 (0.584871), N = 217 moving right + --- -0.341859 (0.590516), N = 207 moving right + --- 0.182155 (0.661462), N = 79 moving right + --- 1.45724 (0.60166), N = 23 moving right + + -- best stat: 0.661462, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 5 16 13 8 6 + + + -- linear combo weights (showing up to 5) + + 0.6288 0.1382 0.1089 1.4609 1.3793 + + + -- cutpoint (score) + --- -0.987365 (0.556876), N = 243 moving right + --- -0.578876 (0.700684), N = 168 moving right + --- -0.469406 (0.689148), N = 158 moving right + --- 0.775005 (0.71739), N = 69 moving right + --- 1.75631 (0.627472), N = 32 moving right + + -- best stat: 0.71739, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 2 1 15 6 17 + + + -- linear combo weights (showing up to 5) + + -0.2083 0.2288 -0.1260 1.4496 0.4935 + + + -- cutpoint (score) + --- 0.579729 (0.556073), N = 247 moving right + --- 1.15355 (0.624835), N = 167 moving right + --- 1.45215 (0.648628), N = 119 moving right + --- 1.73209 (0.669455), N = 84 moving right + --- 2.84252 (0.55768), N = 18 moving right + + -- best stat: 0.669455, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 3.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.8551e-01 1.4532e-02 + 7.7000e+01 9.7826e-01 2.1885e-02 + 1.4000e+02 9.7464e-01 2.5589e-02 + 1.8600e+02 9.7101e-01 2.9306e-02 + + +------------ Growing tree 358 -------------- + +- N obs inbag: 276 +- N row inbag: 170 +- max nodes: 237 +- max leaves: 119 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 6 8 7 5 15 + + + -- linear combo weights (showing up to 5) + + 1.6245 1.1250 6.6313 0.2115 0.0044 + + + -- cutpoint (score) + --- -0.591155 (0.629949), N = 210 moving right + --- -0.51465 (0.659595), N = 188 moving right + --- -0.405248 (0.685813), N = 163 moving right + --- -0.329058 (0.704192), N = 150 moving right + --- 1.10045 (0.734488), N = 56 moving right + + -- best stat: 0.734488, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 17 5 2 3 16 + + + -- linear combo weights (showing up to 5) + + 0.1175 0.5058 -0.9879 4.2118 0.7175 + + + -- cutpoint (score) + --- -0.991582 (0.611787), N = 193 moving right + --- -0.849274 (0.650475), N = 179 moving right + --- -0.329613 (0.693358), N = 121 moving right + --- -0.0588257 (0.696234), N = 98 moving right + --- -0.0124568 (0.697613), N = 96 moving right + + -- best stat: 0.697613, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 8 4 14 11 9 + + + -- linear combo weights (showing up to 5) + + 1.1957 0.2799 -0.0104 0.7574 -0.2765 + + + -- cutpoint (score) + --- -1.22496 (0.527597), N = 262 moving right + --- -1.10036 (0.556987), N = 250 moving right + --- 0.520779 (0.726155), N = 83 moving right + --- 1.08608 (0.676142), N = 50 moving right + --- 3.82466 (0.570677), N = 15 moving right + + -- best stat: 0.726155, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.8913e-01 1.0896e-02 + 1.1000e+02 9.8551e-01 1.4559e-02 + 1.3100e+02 9.8188e-01 1.8235e-02 + 1.4000e+02 9.7464e-01 2.5615e-02 + + +------------ Growing tree 359 -------------- + +- N obs inbag: 276 +- N row inbag: 163 +- max nodes: 221 +- max leaves: 111 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 10 9 17 6 8 + + + -- linear combo weights (showing up to 5) + + -0.5920 -0.0894 0.3793 -0.8439 1.4918 + + + -- cutpoint (score) + --- 0.317289 (0.662449), N = 178 moving right + --- 1.06035 (0.772865), N = 107 moving right + --- 1.34256 (0.769956), N = 88 moving right + --- 2.8527 (0.666045), N = 34 moving right + --- 2.91834 (0.657055), N = 31 moving right + + -- best stat: 0.772865, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 5 9 7 0 3 + + + -- linear combo weights (showing up to 5) + + 0.5576 0.5204 7.3202 0.0545 4.3114 + + + -- cutpoint (score) + --- -0.437209 (0.513097), N = 270 moving right + --- -0.220892 (0.567595), N = 227 moving right + --- -0.118047 (0.616587), N = 202 moving right + --- -0.0191998 (0.68336), N = 152 moving right + --- 0.094727 (0.688244), N = 130 moving right + + -- best stat: 0.688244, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 6 15 13 7 12 + + + -- linear combo weights (showing up to 5) + + 0.6601 0.0671 0.4906 9.8249 0.0399 + + + -- cutpoint (score) + --- -0.470918 (0.599183), N = 229 moving right + --- -0.184205 (0.671328), N = 188 moving right + --- 0.117096 (0.697523), N = 118 moving right + --- 0.364542 (0.655079), N = 83 moving right + --- 0.395485 (0.661073), N = 78 moving right + + -- best stat: 0.697523, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 7.1000e+01 9.9638e-01 3.6232e-03 + 1.1000e+02 9.8913e-01 1.0896e-02 + 1.7900e+02 9.8188e-01 1.8222e-02 + 1.8600e+02 9.7826e-01 2.1912e-02 + 1.9100e+02 9.7101e-01 2.9319e-02 + + +------------ Growing tree 360 -------------- + +- N obs inbag: 276 +- N row inbag: 172 +- max nodes: 235 +- max leaves: 118 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 16 3 7 4 8 + + + -- linear combo weights (showing up to 5) + + 0.2731 4.3279 3.6653 -0.0267 1.1158 + + + -- cutpoint (score) + --- -0.883577 (0.522804), N = 258 moving right + --- -0.529879 (0.713954), N = 148 moving right + --- -0.232771 (0.75312), N = 113 moving right + --- -0.0494773 (0.742139), N = 103 moving right + --- 0.283465 (0.738698), N = 78 moving right + + -- best stat: 0.75312, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 11 15 8 14 4 + + + -- linear combo weights (showing up to 5) + + 0.4076 -0.1653 1.3393 -0.0610 0.0566 + + + -- cutpoint (score) + --- -1.11075 (0.539226), N = 254 moving right + --- -0.69712 (0.706673), N = 158 moving right + --- -0.508999 (0.739818), N = 142 moving right + --- -0.14436 (0.738098), N = 121 moving right + --- 2.70769 (0.611358), N = 21 moving right + + -- best stat: 0.739818, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 6 8 17 2 1 + + + -- linear combo weights (showing up to 5) + + 0.1370 1.3468 0.4268 -0.4870 0.2347 + + + -- cutpoint (score) + --- -0.302937 (0.586734), N = 233 moving right + --- 0.13075 (0.651564), N = 181 moving right + --- 0.140327 (0.654425), N = 180 moving right + --- 0.23479 (0.696311), N = 160 moving right + --- 3.27517 (0.607337), N = 25 moving right + + -- best stat: 0.696311, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8551e-01 1.4546e-02 + 7.1000e+01 9.8188e-01 1.8222e-02 + 1.1000e+02 9.7464e-01 2.5602e-02 + 1.4000e+02 9.6739e-01 3.3037e-02 + + +------------ Growing tree 361 -------------- + +- N obs inbag: 276 +- N row inbag: 178 +- max nodes: 229 +- max leaves: 115 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 3 5 12 8 11 + + + -- linear combo weights (showing up to 5) + + 5.5665 0.8149 0.0475 1.3451 0.5089 + + + -- cutpoint (score) + --- -1.11188 (0.581108), N = 235 moving right + --- -0.168681 (0.724848), N = 133 moving right + --- 0.141484 (0.764043), N = 109 moving right + --- 1.26553 (0.730087), N = 58 moving right + --- 2.14731 (0.671), N = 39 moving right + + -- best stat: 0.764043, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 8 6 13 7 14 + + + -- linear combo weights (showing up to 5) + + 1.3374 0.3568 -0.0302 15.8549 0.1925 + + + -- cutpoint (score) + --- -0.398031 (0.73832), N = 135 moving right + --- -0.152483 (0.726562), N = 99 moving right + --- -0.048516 (0.730147), N = 82 moving right + --- 0.0113298 (0.722091), N = 76 moving right + --- 0.636989 (0.708836), N = 52 moving right + + -- best stat: 0.73832, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 2 15 5 1 14 + + + -- linear combo weights (showing up to 5) + + -0.0904 -0.1781 1.1120 0.5878 0.5292 + + + -- cutpoint (score) + --- -0.529774 (0.586918), N = 214 moving right + --- -0.093749 (0.635606), N = 176 moving right + --- 0.162026 (0.667376), N = 148 moving right + --- 1.07892 (0.672792), N = 58 moving right + --- 1.31294 (0.641692), N = 40 moving right + + -- best stat: 0.672792, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + 3.0400e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.1000e+01 9.8551e-01 1.4559e-02 + 7.7000e+01 9.8188e-01 1.8235e-02 + 1.1000e+02 9.7826e-01 2.1926e-02 + + +------------ Growing tree 362 -------------- + +- N obs inbag: 276 +- N row inbag: 181 +- max nodes: 241 +- max leaves: 121 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 8 6 10 9 13 + + + -- linear combo weights (showing up to 5) + + 1.7874 0.0538 -0.6237 -0.5195 0.1019 + + + -- cutpoint (score) + --- -1.51684 (0.528734), N = 245 moving right + --- -1.06979 (0.595666), N = 208 moving right + --- -0.874654 (0.639767), N = 184 moving right + --- -0.307276 (0.734743), N = 123 moving right + --- 6.15895 (0.555834), N = 10 moving right + + -- best stat: 0.734743, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 7 8 15 10 12 + + + -- linear combo weights (showing up to 5) + + 12.9432 1.0310 -0.2195 -0.3888 0.2527 + + + -- cutpoint (score) + --- -0.888391 (0.587002), N = 223 moving right + --- -0.788875 (0.620241), N = 209 moving right + --- -0.384545 (0.70461), N = 158 moving right + --- 0.382637 (0.706063), N = 74 moving right + --- 1.89605 (0.646451), N = 30 moving right + + -- best stat: 0.706063, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 9 2 6 3 13 + + + -- linear combo weights (showing up to 5) + + 0.1456 -0.7855 0.7129 5.1215 0.2875 + + + -- cutpoint (score) + --- -1.20842 (0.526573), N = 262 moving right + --- -1.10609 (0.555108), N = 248 moving right + --- -0.669058 (0.651755), N = 133 moving right + --- -0.294458 (0.667121), N = 82 moving right + --- 0.547458 (0.604112), N = 29 moving right + + -- best stat: 0.667121, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 3.0000e+00 + 1.8600e+02 1.0000e+00 3.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 4.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.9275e-01 7.2596e-03 + 7.7000e+01 9.8913e-01 1.0909e-02 + 1.1000e+02 9.8551e-01 1.4572e-02 + 1.3100e+02 9.7464e-01 2.5602e-02 + + +------------ Growing tree 363 -------------- + +- N obs inbag: 276 +- N row inbag: 172 +- max nodes: 223 +- max leaves: 112 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 14 5 15 7 16 + + + -- linear combo weights (showing up to 5) + + 0.4864 0.7423 -0.0807 7.1645 0.7280 + + + -- cutpoint (score) + --- -0.763181 (0.555396), N = 245 moving right + --- 0.0267076 (0.699547), N = 143 moving right + --- 0.059414 (0.694844), N = 140 moving right + --- 0.534221 (0.70351), N = 104 moving right + --- 0.571545 (0.703837), N = 103 moving right + + -- best stat: 0.703837, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 8 13 3 4 9 + + + -- linear combo weights (showing up to 5) + + 1.9072 0.1195 4.4313 0.4149 -0.0215 + + + -- cutpoint (score) + --- -1.24803 (0.537802), N = 256 moving right + --- -1.24379 (0.542636), N = 254 moving right + --- -0.926751 (0.647178), N = 206 moving right + --- -0.392104 (0.75932), N = 128 moving right + --- 1.77209 (0.641342), N = 31 moving right + + -- best stat: 0.75932, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 16 6 2 4 1 + + + -- linear combo weights (showing up to 5) + + 0.8043 -0.3521 0.4904 0.7524 0.3767 + + + -- cutpoint (score) + --- 0.235195 (0.661658), N = 185 moving right + --- 1.5037 (0.678883), N = 66 moving right + --- 1.65324 (0.657194), N = 55 moving right + --- 1.76868 (0.629867), N = 47 moving right + --- 1.84337 (0.624423), N = 36 moving right + + -- best stat: 0.678883, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 3.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.1000e+01 9.8551e-01 1.4559e-02 + 7.7000e+01 9.8188e-01 1.8235e-02 + 1.1000e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 364 -------------- + +- N obs inbag: 276 +- N row inbag: 175 +- max nodes: 193 +- max leaves: 97 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 12 5 10 6 8 + + + -- linear combo weights (showing up to 5) + + 0.0648 0.8180 -0.2457 0.8679 1.2611 + + + -- cutpoint (score) + --- -0.956368 (0.547986), N = 240 moving right + --- -0.711463 (0.644861), N = 192 moving right + --- -0.570817 (0.702544), N = 159 moving right + --- 0.314942 (0.736955), N = 98 moving right + --- 0.664166 (0.741758), N = 81 moving right + + -- best stat: 0.741758, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 14 12 16 5 8 + + + -- linear combo weights (showing up to 5) + + -0.1822 0.0630 0.4980 0.6687 1.4293 + + + -- cutpoint (score) + --- -1.03048 (0.607135), N = 211 moving right + --- -0.563908 (0.7133), N = 149 moving right + --- 0.771205 (0.745975), N = 71 moving right + --- 1.10788 (0.7324), N = 59 moving right + --- 1.82903 (0.693298), N = 44 moving right + + -- best stat: 0.745975, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 6 11 9 15 4 + + + -- linear combo weights (showing up to 5) + + 1.8494 1.1298 0.2633 -0.0217 0.4536 + + + -- cutpoint (score) + --- -1.17528 (0.521242), N = 264 moving right + --- -0.923245 (0.540748), N = 247 moving right + --- -0.63381 (0.611284), N = 210 moving right + --- -0.403503 (0.685045), N = 174 moving right + --- 1.05819 (0.7041), N = 67 moving right + + -- best stat: 0.7041, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 4.0000e+00 + 1.4000e+02 1.0000e+00 3.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + 3.8800e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9275e-01 7.2464e-03 + 7.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.7464e-01 2.5548e-02 + 1.4000e+02 9.6377e-01 3.6700e-02 + 1.8600e+02 9.6014e-01 4.0460e-02 + + +------------ Growing tree 365 -------------- + +- N obs inbag: 276 +- N row inbag: 172 +- max nodes: 247 +- max leaves: 124 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 9 1 13 16 14 + + + -- linear combo weights (showing up to 5) + + 0.0797 0.6545 0.5746 0.5315 0.5737 + + + -- cutpoint (score) + --- -0.600449 (0.640719), N = 186 moving right + --- 0.0112522 (0.704797), N = 111 moving right + --- 0.0240568 (0.695059), N = 108 moving right + --- 0.986707 (0.685501), N = 59 moving right + --- 1.52938 (0.605374), N = 29 moving right + + -- best stat: 0.704797, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 15 9 4 12 16 + + + -- linear combo weights (showing up to 5) + + -0.1527 0.3880 0.5924 0.1869 0.4546 + + + -- cutpoint (score) + --- -0.710826 (0.521299), N = 254 moving right + --- -0.314493 (0.588202), N = 214 moving right + --- 0.483863 (0.675904), N = 114 moving right + --- 0.88162 (0.628817), N = 67 moving right + --- 1.28652 (0.548609), N = 25 moving right + + -- best stat: 0.675904, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 9 15 11 7 10 + + + -- linear combo weights (showing up to 5) + + 0.2719 -0.0922 0.8650 2.6220 -0.4908 + + + -- cutpoint (score) + --- -1.2796 (0.535305), N = 246 moving right + --- -0.590739 (0.670033), N = 170 moving right + --- -0.450538 (0.700108), N = 155 moving right + --- -0.317989 (0.704436), N = 144 moving right + --- 3.71018 (0.560171), N = 18 moving right + + -- best stat: 0.704436, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.1000e+01 9.8551e-01 1.4559e-02 + 7.7000e+01 9.7826e-01 2.1912e-02 + 1.1000e+02 9.7464e-01 2.5616e-02 + + +------------ Growing tree 366 -------------- + +- N obs inbag: 276 +- N row inbag: 183 +- max nodes: 245 +- max leaves: 123 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 0 11 2 12 15 + + + -- linear combo weights (showing up to 5) + + -0.0157 1.4275 0.5722 -0.1513 -0.2786 + + + -- cutpoint (score) + --- -0.944918 (0.534603), N = 253 moving right + --- -0.661937 (0.55893), N = 238 moving right + --- -0.140049 (0.660868), N = 181 moving right + --- 0.466604 (0.703045), N = 120 moving right + --- 2.11966 (0.640167), N = 38 moving right + + -- best stat: 0.703045, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 9 17 0 5 1 + + + -- linear combo weights (showing up to 5) + + 0.5941 0.3446 -0.0453 1.4735 0.4156 + + + -- cutpoint (score) + --- 0.123501 (0.533885), N = 258 moving right + --- 0.277819 (0.567807), N = 242 moving right + --- 0.316125 (0.575646), N = 239 moving right + --- 1.43292 (0.716852), N = 114 moving right + --- 1.51709 (0.705783), N = 109 moving right + + -- best stat: 0.716852, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 13 17 3 15 0 + + + -- linear combo weights (showing up to 5) + + 0.7296 0.3248 8.2235 -0.1189 -0.2033 + + + -- cutpoint (score) + --- 0.247464 (0.598972), N = 224 moving right + --- 1.21463 (0.712016), N = 95 moving right + --- 1.41952 (0.671672), N = 65 moving right + --- 10.3057 (0.53362), N = 6 moving right + --- 10.4533 (0.526009), N = 5 moving right + + -- best stat: 0.712016, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 3.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.8913e-01 1.0870e-02 + 5.1000e+01 9.8551e-01 1.4533e-02 + 7.7000e+01 9.7826e-01 2.1886e-02 + 1.1000e+02 9.7464e-01 2.5589e-02 + 1.3100e+02 9.6739e-01 3.3024e-02 + + +------------ Growing tree 367 -------------- + +- N obs inbag: 276 +- N row inbag: 174 +- max nodes: 217 +- max leaves: 109 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 10 4 2 17 0 + + + -- linear combo weights (showing up to 5) + + -0.7278 0.1548 -0.8929 0.5312 -0.0793 + + + -- cutpoint (score) + --- -0.159884 (0.598752), N = 218 moving right + --- -0.0594252 (0.607843), N = 215 moving right + --- 0.676977 (0.660707), N = 158 moving right + --- 0.723496 (0.663427), N = 148 moving right + --- 1.46107 (0.647815), N = 64 moving right + + -- best stat: 0.663427, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 8 10 13 16 7 + + + -- linear combo weights (showing up to 5) + + 1.3030 -0.6812 -0.1013 0.2603 3.2431 + + + -- cutpoint (score) + --- -0.517967 (0.693984), N = 140 moving right + --- 0.0586261 (0.692515), N = 93 moving right + --- 0.0616543 (0.694567), N = 92 moving right + --- 0.439712 (0.705558), N = 59 moving right + --- 0.441827 (0.700052), N = 58 moving right + + -- best stat: 0.705558, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 12 15 14 2 3 + + + -- linear combo weights (showing up to 5) + + 0.0951 0.0068 0.2195 -0.5778 14.0828 + + + -- cutpoint (score) + --- -0.816975 (0.533256), N = 239 moving right + --- -0.799017 (0.528116), N = 236 moving right + --- -0.765543 (0.571823), N = 218 moving right + --- -0.700365 (0.590222), N = 185 moving right + --- -0.599101 (0.633713), N = 145 moving right + + -- best stat: 0.633713, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 4.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.8551e-01 1.4493e-02 + 7.1000e+01 9.8188e-01 1.8169e-02 + 7.7000e+01 9.7826e-01 2.1859e-02 + 1.1000e+02 9.7464e-01 2.5563e-02 + 1.7900e+02 9.7101e-01 2.9280e-02 + + +------------ Growing tree 368 -------------- + +- N obs inbag: 276 +- N row inbag: 179 +- max nodes: 213 +- max leaves: 107 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 14 7 5 1 6 + + + -- linear combo weights (showing up to 5) + + 0.6264 2.8187 0.7803 0.3653 2.0621 + + + -- cutpoint (score) + --- -0.612878 (0.571736), N = 230 moving right + --- -0.553523 (0.578761), N = 227 moving right + --- -0.482869 (0.613908), N = 211 moving right + --- 0.631956 (0.689784), N = 80 moving right + --- 0.863199 (0.666513), N = 59 moving right + + -- best stat: 0.689784, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 2 12 7 15 13 + + + -- linear combo weights (showing up to 5) + + -0.2362 0.0829 2.6645 -0.1179 0.2118 + + + -- cutpoint (score) + --- -0.630542 (0.512963), N = 266 moving right + --- -0.525724 (0.535293), N = 253 moving right + --- -0.40696 (0.600903), N = 213 moving right + --- -0.245016 (0.667977), N = 151 moving right + --- 0.00689135 (0.619595), N = 71 moving right + + -- best stat: 0.667977, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 9 2 11 3 13 + + + -- linear combo weights (showing up to 5) + + 0.2989 0.2968 0.5869 7.3609 0.0132 + + + -- cutpoint (score) + --- -0.521851 (0.520427), N = 268 moving right + --- -0.46391 (0.53615), N = 261 moving right + --- 0.599316 (0.698649), N = 63 moving right + --- 1.10764 (0.63996), N = 36 moving right + --- 7.90549 (0.538555), N = 8 moving right + + -- best stat: 0.698649, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.9275e-01 7.2596e-03 + 7.7000e+01 9.8913e-01 1.0909e-02 + 1.7900e+02 9.8551e-01 1.4572e-02 + 1.8600e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 369 -------------- + +- N obs inbag: 276 +- N row inbag: 175 +- max nodes: 203 +- max leaves: 102 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 11 17 15 7 2 + + + -- linear combo weights (showing up to 5) + + 0.5816 0.4885 -0.0466 3.2806 0.2496 + + + -- cutpoint (score) + --- 0.760863 (0.549903), N = 252 moving right + --- 1.25344 (0.606839), N = 213 moving right + --- 1.32355 (0.648479), N = 193 moving right + --- 1.3957 (0.678706), N = 173 moving right + --- 2.04668 (0.728414), N = 89 moving right + + -- best stat: 0.728414, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 14 3 9 17 8 + + + -- linear combo weights (showing up to 5) + + -0.1750 2.3525 -0.3665 0.4138 1.8068 + + + -- cutpoint (score) + --- -0.150044 (0.530227), N = 255 moving right + --- 0.0272802 (0.575016), N = 229 moving right + --- 0.808287 (0.698921), N = 132 moving right + --- 0.880546 (0.715922), N = 118 moving right + --- 0.910779 (0.725523), N = 112 moving right + + -- best stat: 0.725523, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 11 3 10 15 5 + + + -- linear combo weights (showing up to 5) + + 0.5643 2.2697 -0.4869 -0.0408 0.5146 + + + -- cutpoint (score) + --- -0.699746 (0.543279), N = 236 moving right + --- -0.574728 (0.581251), N = 217 moving right + --- -0.460288 (0.612082), N = 199 moving right + --- -0.285517 (0.672643), N = 167 moving right + --- 3.77018 (0.543301), N = 11 moving right + + -- best stat: 0.672643, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 3.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 3.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 7.1000e+01 9.8551e-01 1.4546e-02 + 1.3100e+02 9.8188e-01 1.8222e-02 + 1.8600e+02 9.7101e-01 2.9292e-02 + 1.9100e+02 9.6377e-01 3.6755e-02 + + +------------ Growing tree 370 -------------- + +- N obs inbag: 276 +- N row inbag: 177 +- max nodes: 191 +- max leaves: 96 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 0 5 1 13 4 + + + -- linear combo weights (showing up to 5) + + -0.2487 1.7992 0.6626 0.4272 0.0646 + + + -- cutpoint (score) + --- -0.47542 (0.630416), N = 208 moving right + --- -0.263294 (0.644209), N = 193 moving right + --- 0.796419 (0.738972), N = 95 moving right + --- 0.838812 (0.733288), N = 90 moving right + --- 2.74707 (0.536725), N = 8 moving right + + -- best stat: 0.738972, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 6 2 15 9 0 + + + -- linear combo weights (showing up to 5) + + 0.4465 -0.6803 -0.1726 0.3114 -0.2401 + + + -- cutpoint (score) + --- -1.31 (0.509356), N = 270 moving right + --- -0.853405 (0.616688), N = 153 moving right + --- -0.801353 (0.634198), N = 139 moving right + --- -0.316731 (0.586456), N = 50 moving right + --- -0.313317 (0.5811), N = 48 moving right + + -- best stat: 0.634198, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 11 13 5 4 3 + + + -- linear combo weights (showing up to 5) + + 0.5061 0.3220 1.1946 0.1170 7.5025 + + + -- cutpoint (score) + --- -0.285165 (0.664167), N = 191 moving right + --- 0.00373535 (0.72402), N = 151 moving right + --- 0.205081 (0.729791), N = 135 moving right + --- 0.795305 (0.71556), N = 96 moving right + --- 1.7508 (0.680409), N = 46 moving right + + -- best stat: 0.729791, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 4.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 4.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 3.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8551e-01 1.4546e-02 + 7.1000e+01 9.8188e-01 1.8222e-02 + 7.7000e+01 9.6739e-01 3.2982e-02 + 1.1000e+02 9.6377e-01 3.6728e-02 + + +------------ Growing tree 371 -------------- + +- N obs inbag: 276 +- N row inbag: 171 +- max nodes: 217 +- max leaves: 109 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 6 15 9 3 17 + + + -- linear combo weights (showing up to 5) + + 0.4583 -0.2740 0.3483 6.1882 0.4830 + + + -- cutpoint (score) + --- 0.587575 (0.542348), N = 247 moving right + --- 0.631562 (0.551852), N = 243 moving right + --- 1.86053 (0.678698), N = 71 moving right + --- 2.32012 (0.62784), N = 31 moving right + --- 2.57924 (0.590067), N = 23 moving right + + -- best stat: 0.678698, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 5 1 16 14 13 + + + -- linear combo weights (showing up to 5) + + 0.7945 0.5867 0.5240 0.4394 0.3558 + + + -- cutpoint (score) + --- -0.530086 (0.626514), N = 205 moving right + --- -0.178204 (0.685992), N = 151 moving right + --- 1.11363 (0.676709), N = 54 moving right + --- 1.14842 (0.667094), N = 46 moving right + --- 1.32182 (0.644616), N = 40 moving right + + -- best stat: 0.685992, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 5 11 7 17 0 + + + -- linear combo weights (showing up to 5) + + 0.2160 0.8797 8.5689 0.4316 -0.1592 + + + -- cutpoint (score) + --- 1.18755 (0.736783), N = 114 moving right + --- 2.09428 (0.672885), N = 50 moving right + --- 2.81507 (0.618314), N = 25 moving right + --- 9.8631 (0.561157), N = 11 moving right + --- 10.786 (0.529993), N = 7 moving right + + -- best stat: 0.736783, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 3.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.7000e+01 9.8913e-01 1.0896e-02 + 1.4000e+02 9.7826e-01 2.1885e-02 + 1.8600e+02 9.7464e-01 2.5589e-02 + 1.9100e+02 9.7101e-01 2.9306e-02 + + +------------ Growing tree 372 -------------- + +- N obs inbag: 276 +- N row inbag: 168 +- max nodes: 249 +- max leaves: 125 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 8 7 9 14 13 + + + -- linear combo weights (showing up to 5) + + 1.2294 6.6923 -0.1013 0.1157 0.0173 + + + -- cutpoint (score) + --- -0.513694 (0.711065), N = 158 moving right + --- -0.505595 (0.722268), N = 153 moving right + --- -0.316838 (0.742933), N = 128 moving right + --- 0.0174255 (0.705839), N = 85 moving right + --- 0.342313 (0.686302), N = 68 moving right + + -- best stat: 0.742933, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 9 7 12 3 6 + + + -- linear combo weights (showing up to 5) + + 0.3231 5.9061 0.2411 4.8375 1.3534 + + + -- cutpoint (score) + --- -0.334017 (0.536203), N = 249 moving right + --- -0.171156 (0.635273), N = 179 moving right + --- 0.135059 (0.68947), N = 97 moving right + --- 0.157307 (0.681849), N = 94 moving right + --- 1.23766 (0.650297), N = 37 moving right + + -- best stat: 0.68947, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 2 0 7 3 9 + + + -- linear combo weights (showing up to 5) + + -0.4346 -0.2764 5.9386 4.9307 0.3126 + + + -- cutpoint (score) + --- -0.840514 (0.534105), N = 240 moving right + --- -0.741998 (0.589667), N = 207 moving right + --- -0.435797 (0.663599), N = 106 moving right + --- -0.351089 (0.667439), N = 87 moving right + --- 10.1899 (0.543211), N = 8 moving right + + -- best stat: 0.667439, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 3.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.1000e+01 9.8551e-01 1.4559e-02 + 7.7000e+01 9.8188e-01 1.8235e-02 + 1.1000e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 373 -------------- + +- N obs inbag: 276 +- N row inbag: 179 +- max nodes: 195 +- max leaves: 98 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 4 7 14 15 5 + + + -- linear combo weights (showing up to 5) + + 0.5982 32.5569 0.2078 0.0155 0.7195 + + + -- cutpoint (score) + --- -0.102791 (0.583396), N = 227 moving right + --- -0.0867247 (0.592794), N = 221 moving right + --- 0.536621 (0.693774), N = 129 moving right + --- 1.28671 (0.598178), N = 28 moving right + --- 33.3405 (0.538918), N = 6 moving right + + -- best stat: 0.693774, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 7 4 12 9 14 + + + -- linear combo weights (showing up to 5) + + 33.1771 0.6992 0.1396 0.4391 0.1187 + + + -- cutpoint (score) + --- -0.216181 (0.575718), N = 216 moving right + --- -0.0448025 (0.615519), N = 196 moving right + --- 0.328121 (0.670653), N = 147 moving right + --- 0.42358 (0.688391), N = 122 moving right + --- 2.3062 (0.580241), N = 14 moving right + + -- best stat: 0.688391, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 8 7 10 1 4 + + + -- linear combo weights (showing up to 5) + + 1.4357 29.5081 -0.4241 0.2576 0.2099 + + + -- cutpoint (score) + --- -1.33213 (0.542095), N = 256 moving right + --- -1.27151 (0.550435), N = 252 moving right + --- -0.962226 (0.638155), N = 215 moving right + --- -0.5225 (0.716873), N = 169 moving right + --- 0.875746 (0.701739), N = 49 moving right + + -- best stat: 0.716873, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 3.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.7000e+01 9.8913e-01 1.0909e-02 + 1.3100e+02 9.8551e-01 1.4572e-02 + 1.4000e+02 9.8188e-01 1.8249e-02 + + +------------ Growing tree 374 -------------- + +- N obs inbag: 276 +- N row inbag: 163 +- max nodes: 203 +- max leaves: 102 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 9 11 2 5 0 + + + -- linear combo weights (showing up to 5) + + 0.0294 1.0887 0.1015 0.9948 0.1468 + + + -- cutpoint (score) + --- 0.0496497 (0.707076), N = 146 moving right + --- 0.684339 (0.737733), N = 100 moving right + --- 1.33242 (0.661308), N = 53 moving right + --- 2.43874 (0.606984), N = 26 moving right + --- 3.31443 (0.532103), N = 13 moving right + + -- best stat: 0.737733, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 8 16 4 11 10 + + + -- linear combo weights (showing up to 5) + + 1.0992 0.7632 0.0687 0.6840 -0.5315 + + + -- cutpoint (score) + --- -2.31627 (0.50993), N = 266 moving right + --- -2.2606 (0.513087), N = 265 moving right + --- -1.57605 (0.593657), N = 223 moving right + --- 0.983493 (0.775668), N = 71 moving right + --- 6.0551 (0.577798), N = 14 moving right + + -- best stat: 0.775668, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 6 12 17 16 9 + + + -- linear combo weights (showing up to 5) + + 1.3956 0.1456 0.6972 0.8284 0.2627 + + + -- cutpoint (score) + --- 1.11747 (0.591343), N = 229 moving right + --- 1.79525 (0.677118), N = 170 moving right + --- 3.22046 (0.703726), N = 66 moving right + --- 3.70692 (0.651379), N = 37 moving right + --- 4.50647 (0.587752), N = 21 moving right + + -- best stat: 0.703726, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 3.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + 3.0400e+02 1.0000e+00 5.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 7.1000e+01 9.9275e-01 7.2464e-03 + 7.7000e+01 9.8913e-01 1.0896e-02 + 1.3100e+02 9.8188e-01 1.8222e-02 + 1.4000e+02 9.7826e-01 2.1912e-02 + 1.9100e+02 9.7464e-01 2.5616e-02 + + +------------ Growing tree 375 -------------- + +- N obs inbag: 276 +- N row inbag: 180 +- max nodes: 207 +- max leaves: 104 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 10 15 9 1 11 + + + -- linear combo weights (showing up to 5) + + -0.6821 -0.0222 0.2828 0.5344 0.9393 + + + -- cutpoint (score) + --- -0.59706 (0.695943), N = 166 moving right + --- -0.510248 (0.708528), N = 160 moving right + --- -0.311543 (0.729755), N = 140 moving right + --- 0.456682 (0.748247), N = 86 moving right + --- 1.40581 (0.662193), N = 49 moving right + + -- best stat: 0.748247, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 9 1 2 10 3 + + + -- linear combo weights (showing up to 5) + + 0.4802 0.3841 -0.4472 -0.4311 6.6174 + + + -- cutpoint (score) + --- -0.855157 (0.643325), N = 194 moving right + --- -0.595812 (0.700639), N = 159 moving right + --- -0.391082 (0.722116), N = 130 moving right + --- -0.316862 (0.734847), N = 116 moving right + --- 0.124725 (0.685382), N = 62 moving right + + -- best stat: 0.734847, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 8 3 4 1 16 + + + -- linear combo weights (showing up to 5) + + 1.7461 4.8864 0.1692 0.5171 0.0444 + + + -- cutpoint (score) + --- -1.09637 (0.589664), N = 225 moving right + --- -0.840808 (0.629237), N = 186 moving right + --- -0.832756 (0.634392), N = 183 moving right + --- 0.548269 (0.752192), N = 66 moving right + --- 2.2514 (0.667474), N = 32 moving right + + -- best stat: 0.752192, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.8551e-01 1.4559e-02 + 1.3100e+02 9.7826e-01 2.1912e-02 + 1.4000e+02 9.7464e-01 2.5616e-02 + + +------------ Growing tree 376 -------------- + +- N obs inbag: 276 +- N row inbag: 172 +- max nodes: 241 +- max leaves: 121 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 17 3 10 9 4 + + + -- linear combo weights (showing up to 5) + + 0.2745 3.2055 -0.4009 0.3936 0.7112 + + + -- cutpoint (score) + --- 0.0338293 (0.549403), N = 254 moving right + --- 0.957022 (0.682874), N = 172 moving right + --- 1.58136 (0.69474), N = 102 moving right + --- 2.4107 (0.606945), N = 34 moving right + --- 5.62552 (0.53362), N = 9 moving right + + -- best stat: 0.69474, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 14 7 9 4 12 + + + -- linear combo weights (showing up to 5) + + 0.2860 8.7863 0.2814 0.9399 0.0519 + + + -- cutpoint (score) + --- -0.177488 (0.607154), N = 222 moving right + --- 0.516719 (0.696604), N = 159 moving right + --- 0.764685 (0.679908), N = 104 moving right + --- 0.905834 (0.647505), N = 88 moving right + --- 1.40957 (0.627558), N = 41 moving right + + -- best stat: 0.696604, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 7 9 16 14 17 + + + -- linear combo weights (showing up to 5) + + 7.8133 0.3167 0.4012 0.2740 0.6087 + + + -- cutpoint (score) + --- 1.44686 (0.659941), N = 197 moving right + --- 2.01556 (0.713014), N = 130 moving right + --- 2.17819 (0.723378), N = 106 moving right + --- 2.47865 (0.680859), N = 65 moving right + --- 3.56443 (0.58848), N = 19 moving right + + -- best stat: 0.723378, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 3.0000e+00 + 7.1000e+01 1.0000e+00 4.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 4.0000e+00 + 3.3400e+02 1.0000e+00 1.0000e+00 + 3.4800e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.8913e-01 1.0870e-02 + 7.1000e+01 9.7464e-01 2.5522e-02 + 1.4000e+02 9.7101e-01 2.9239e-02 + 1.7900e+02 9.6377e-01 3.6702e-02 + 1.8600e+02 9.5652e-01 4.4221e-02 + + +------------ Growing tree 377 -------------- + +- N obs inbag: 276 +- N row inbag: 176 +- max nodes: 241 +- max leaves: 121 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 2 0 4 10 6 + + + -- linear combo weights (showing up to 5) + + -0.9615 -0.0228 0.9911 -0.7017 0.5326 + + + -- cutpoint (score) + --- -2.02451 (0.509937), N = 268 moving right + --- -1.24993 (0.59367), N = 218 moving right + --- -1.22709 (0.601094), N = 216 moving right + --- 0.642587 (0.621085), N = 42 moving right + --- 1.83498 (0.529754), N = 7 moving right + + -- best stat: 0.621085, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 6 7 5 3 13 + + + -- linear combo weights (showing up to 5) + + 0.3832 7.0331 0.4167 5.2570 0.3613 + + + -- cutpoint (score) + --- -0.296974 (0.576928), N = 239 moving right + --- 0.0387356 (0.696369), N = 154 moving right + --- 0.0803967 (0.692754), N = 145 moving right + --- 0.524144 (0.605889), N = 57 moving right + --- 1.30258 (0.598581), N = 28 moving right + + -- best stat: 0.696369, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 16 17 12 14 8 + + + -- linear combo weights (showing up to 5) + + 0.2379 0.4169 0.0987 -0.0103 1.2657 + + + -- cutpoint (score) + --- 0.0181723 (0.56786), N = 242 moving right + --- 0.15978 (0.577102), N = 234 moving right + --- 0.210895 (0.59048), N = 228 moving right + --- 0.584449 (0.698341), N = 170 moving right + --- 1.24503 (0.739908), N = 99 moving right + + -- best stat: 0.739908, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + 3.3400e+02 1.0000e+00 1.0000e+00 + 3.4800e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 1.1000e+02 9.8913e-01 1.0896e-02 + 1.8600e+02 9.8551e-01 1.4559e-02 + 1.9100e+02 9.8188e-01 1.8235e-02 + 2.2300e+02 9.7464e-01 2.5615e-02 + + +------------ Growing tree 378 -------------- + +- N obs inbag: 276 +- N row inbag: 174 +- max nodes: 201 +- max leaves: 101 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 2 9 14 6 8 + + + -- linear combo weights (showing up to 5) + + -0.1188 -0.2468 -0.1857 -0.2758 2.2079 + + + -- cutpoint (score) + --- -1.20391 (0.629037), N = 206 moving right + --- -1.15326 (0.626915), N = 190 moving right + --- -1.04053 (0.669391), N = 160 moving right + --- -0.763708 (0.75488), N = 113 moving right + --- 0.889613 (0.633012), N = 34 moving right + + -- best stat: 0.75488, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 8 1 9 14 7 + + + -- linear combo weights (showing up to 5) + + 1.6976 0.4257 -0.0980 -0.1495 5.2340 + + + -- cutpoint (score) + --- -0.90517 (0.598106), N = 205 moving right + --- -0.831483 (0.615838), N = 193 moving right + --- -0.658477 (0.692059), N = 155 moving right + --- 0.3687 (0.748135), N = 57 moving right + --- 1.42891 (0.65789), N = 33 moving right + + -- best stat: 0.748135, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 9 13 14 0 17 + + + -- linear combo weights (showing up to 5) + + 0.2413 0.3203 0.0858 0.0558 0.4869 + + + -- cutpoint (score) + --- 0.923875 (0.606503), N = 217 moving right + --- 1.31346 (0.648265), N = 156 moving right + --- 1.91596 (0.628121), N = 67 moving right + --- 1.97883 (0.620952), N = 52 moving right + --- 2.55067 (0.547367), N = 17 moving right + + -- best stat: 0.648265, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 3.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + 3.2600e+02 1.0000e+00 2.0000e+00 + 3.3400e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 1.1000e+02 9.9638e-01 3.6232e-03 + 1.4000e+02 9.8551e-01 1.4532e-02 + 1.9100e+02 9.8188e-01 1.8209e-02 + 1.9800e+02 9.7826e-01 2.1899e-02 + 2.2300e+02 9.7101e-01 2.9306e-02 + + +------------ Growing tree 379 -------------- + +- N obs inbag: 276 +- N row inbag: 171 +- max nodes: 235 +- max leaves: 118 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 15 11 14 7 16 + + + -- linear combo weights (showing up to 5) + + -0.0560 0.6563 0.3841 10.2177 0.4807 + + + -- cutpoint (score) + --- -0.72254 (0.619958), N = 215 moving right + --- -0.717507 (0.632248), N = 207 moving right + --- 0.0543662 (0.726408), N = 106 moving right + --- 0.205723 (0.731155), N = 100 moving right + --- 0.97028 (0.673151), N = 45 moving right + + -- best stat: 0.731155, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 12 16 10 6 7 + + + -- linear combo weights (showing up to 5) + + 0.0650 0.5969 -0.8349 -0.4714 10.2036 + + + -- cutpoint (score) + --- -1.10936 (0.556071), N = 243 moving right + --- -0.950974 (0.581261), N = 227 moving right + --- -0.502458 (0.632836), N = 187 moving right + --- -0.473944 (0.634664), N = 186 moving right + --- 1.35224 (0.643929), N = 32 moving right + + -- best stat: 0.643929, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 14 17 4 8 1 + + + -- linear combo weights (showing up to 5) + + 0.0381 0.1610 0.5257 2.0872 0.3388 + + + -- cutpoint (score) + --- -0.316246 (0.667857), N = 189 moving right + --- -0.246291 (0.693382), N = 175 moving right + --- 1.23082 (0.713866), N = 53 moving right + --- 4.4367 (0.610021), N = 20 moving right + --- 9.63035 (0.530189), N = 7 moving right + + -- best stat: 0.713866, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 4.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.1000e+01 9.8913e-01 1.0909e-02 + 7.7000e+01 9.8551e-01 1.4572e-02 + 1.3100e+02 9.8188e-01 1.8249e-02 + + +------------ Growing tree 380 -------------- + +- N obs inbag: 276 +- N row inbag: 171 +- max nodes: 227 +- max leaves: 114 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 3 8 13 15 16 + + + -- linear combo weights (showing up to 5) + + 5.1868 1.5659 0.0681 -0.0847 0.1216 + + + -- cutpoint (score) + --- -0.939486 (0.635911), N = 205 moving right + --- -0.905499 (0.655494), N = 195 moving right + --- -0.81949 (0.70025), N = 166 moving right + --- -0.413521 (0.737697), N = 124 moving right + --- -0.123798 (0.74442), N = 99 moving right + + -- best stat: 0.74442, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 5 1 17 14 11 + + + -- linear combo weights (showing up to 5) + + 0.7218 0.3361 0.2700 0.1931 1.0868 + + + -- cutpoint (score) + --- -0.499075 (0.550444), N = 253 moving right + --- 0.554886 (0.693644), N = 163 moving right + --- 0.61683 (0.698804), N = 158 moving right + --- 1.0589 (0.744049), N = 121 moving right + --- 2.90729 (0.604757), N = 28 moving right + + -- best stat: 0.744049, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 17 12 7 1 11 + + + -- linear combo weights (showing up to 5) + + 0.3152 -0.0152 6.9237 0.4009 1.0205 + + + -- cutpoint (score) + --- 0.659918 (0.7393), N = 135 moving right + --- 0.865649 (0.753117), N = 119 moving right + --- 1.09694 (0.750792), N = 101 moving right + --- 3.30658 (0.597936), N = 24 moving right + --- 5.58741 (0.586952), N = 16 moving right + + -- best stat: 0.753117, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 3.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 4.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8551e-01 1.4532e-02 + 7.7000e+01 9.7826e-01 2.1885e-02 + 1.1000e+02 9.7101e-01 2.9293e-02 + 1.3100e+02 9.6739e-01 3.3024e-02 + + +------------ Growing tree 381 -------------- + +- N obs inbag: 276 +- N row inbag: 179 +- max nodes: 217 +- max leaves: 109 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 14 7 17 3 8 + + + -- linear combo weights (showing up to 5) + + 0.1516 1.5935 0.5052 11.8738 1.0958 + + + -- cutpoint (score) + --- 1.03492 (0.703018), N = 170 moving right + --- 1.12315 (0.694681), N = 155 moving right + --- 1.27239 (0.71086), N = 137 moving right + --- 2.7708 (0.678996), N = 45 moving right + --- 14.7505 (0.600161), N = 16 moving right + + -- best stat: 0.71086, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 7 10 11 6 12 + + + -- linear combo weights (showing up to 5) + + 5.5219 -0.7487 0.7440 1.6609 0.0617 + + + -- cutpoint (score) + --- -1.39643 (0.550245), N = 254 moving right + --- -1.09553 (0.566239), N = 245 moving right + --- -1.07378 (0.572455), N = 242 moving right + --- -0.905423 (0.601004), N = 228 moving right + --- 0.983465 (0.729509), N = 67 moving right + + -- best stat: 0.729509, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 2 5 15 17 16 + + + -- linear combo weights (showing up to 5) + + -0.5750 0.8991 -0.1371 0.6849 0.6985 + + + -- cutpoint (score) + --- 0.99062 (0.65337), N = 184 moving right + --- 1.54765 (0.697501), N = 139 moving right + --- 1.61833 (0.705796), N = 133 moving right + --- 2.15599 (0.703059), N = 104 moving right + --- 2.30826 (0.721234), N = 94 moving right + + -- best stat: 0.721234, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 5.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.8551e-01 1.4559e-02 + 1.1000e+02 9.8188e-01 1.8235e-02 + 1.4000e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 382 -------------- + +- N obs inbag: 276 +- N row inbag: 175 +- max nodes: 215 +- max leaves: 108 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 15 7 2 9 16 + + + -- linear combo weights (showing up to 5) + + -0.0828 7.1586 -0.6007 0.5994 0.2465 + + + -- cutpoint (score) + --- -1.15078 (0.547741), N = 251 moving right + --- -0.880188 (0.666207), N = 183 moving right + --- -0.719923 (0.696874), N = 144 moving right + --- -0.550958 (0.724245), N = 110 moving right + --- 0.213777 (0.606376), N = 37 moving right + + -- best stat: 0.724245, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 0 17 14 4 11 + + + -- linear combo weights (showing up to 5) + + -0.2137 0.5582 0.1073 0.1034 1.3382 + + + -- cutpoint (score) + --- 0.130949 (0.592392), N = 234 moving right + --- 1.15703 (0.718293), N = 144 moving right + --- 1.51455 (0.720888), N = 111 moving right + --- 1.93485 (0.710014), N = 75 moving right + --- 2.89495 (0.664518), N = 42 moving right + + -- best stat: 0.720888, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 2 1 10 9 7 + + + -- linear combo weights (showing up to 5) + + -0.7208 0.5194 -0.7812 0.6255 6.6031 + + + -- cutpoint (score) + --- -2.01661 (0.541356), N = 250 moving right + --- -0.886688 (0.715327), N = 147 moving right + --- -0.834086 (0.715018), N = 143 moving right + --- -0.680616 (0.735655), N = 132 moving right + --- 1.74792 (0.598241), N = 22 moving right + + -- best stat: 0.735655, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 3.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.8188e-01 1.8222e-02 + 1.1000e+02 9.7826e-01 2.1912e-02 + 1.3100e+02 9.7464e-01 2.5616e-02 + + +------------ Growing tree 383 -------------- + +- N obs inbag: 276 +- N row inbag: 174 +- max nodes: 217 +- max leaves: 109 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 14 1 3 5 0 + + + -- linear combo weights (showing up to 5) + + 0.1304 0.4892 5.9073 1.0863 0.1243 + + + -- cutpoint (score) + --- -0.698937 (0.522986), N = 266 moving right + --- -0.106055 (0.60545), N = 203 moving right + --- 1.15019 (0.681785), N = 56 moving right + --- 1.25015 (0.664949), N = 46 moving right + --- 1.53754 (0.643299), N = 34 moving right + + -- best stat: 0.681785, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 2 7 16 10 1 + + + -- linear combo weights (showing up to 5) + + -0.6724 10.1585 0.3362 -0.5244 0.3490 + + + -- cutpoint (score) + --- -1.76198 (0.520038), N = 260 moving right + --- -1.14431 (0.613974), N = 203 moving right + --- -0.838084 (0.68821), N = 155 moving right + --- -0.680145 (0.696183), N = 137 moving right + --- -0.171122 (0.746544), N = 88 moving right + + -- best stat: 0.746544, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 15 12 11 17 10 + + + -- linear combo weights (showing up to 5) + + -0.0331 -0.1315 0.6628 0.4693 -0.5381 + + + -- cutpoint (score) + --- 0.560857 (0.589334), N = 218 moving right + --- 0.968629 (0.670759), N = 172 moving right + --- 1.62068 (0.724067), N = 103 moving right + --- 1.75617 (0.727205), N = 94 moving right + --- 2.52582 (0.677884), N = 44 moving right + + -- best stat: 0.727205, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 3.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 3.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8551e-01 1.4532e-02 + 1.1000e+02 9.7826e-01 2.1885e-02 + 1.3100e+02 9.7101e-01 2.9293e-02 + 1.4000e+02 9.6739e-01 3.3024e-02 + + +------------ Growing tree 384 -------------- + +- N obs inbag: 276 +- N row inbag: 175 +- max nodes: 221 +- max leaves: 111 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 14 1 3 9 4 + + + -- linear combo weights (showing up to 5) + + 0.0119 0.2362 5.0621 0.8769 0.4217 + + + -- cutpoint (score) + --- -0.810574 (0.516746), N = 269 moving right + --- -0.192705 (0.619234), N = 186 moving right + --- 0.103686 (0.660957), N = 136 moving right + --- 0.600902 (0.702319), N = 62 moving right + --- 4.77642 (0.573303), N = 16 moving right + + -- best stat: 0.702319, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 0 7 5 14 1 + + + -- linear combo weights (showing up to 5) + + -0.0937 8.8861 0.5768 0.3155 0.2604 + + + -- cutpoint (score) + --- -0.0175916 (0.619093), N = 173 moving right + --- 0.217693 (0.674865), N = 101 moving right + --- 0.339369 (0.666532), N = 81 moving right + --- 0.57075 (0.649384), N = 48 moving right + --- 9.23752 (0.5759), N = 15 moving right + + -- best stat: 0.674865, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 11 15 14 1 16 + + + -- linear combo weights (showing up to 5) + + 0.7185 -0.1969 0.1078 0.1730 0.3787 + + + -- cutpoint (score) + --- -0.725057 (0.604339), N = 211 moving right + --- -0.687776 (0.618127), N = 205 moving right + --- -0.271295 (0.719205), N = 149 moving right + --- 0.813272 (0.654215), N = 54 moving right + --- 1.22601 (0.594215), N = 32 moving right + + -- best stat: 0.719205, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.1000e+01 9.8913e-01 1.0909e-02 + 1.1000e+02 9.8188e-01 1.8235e-02 + 1.4000e+02 9.7464e-01 2.5615e-02 + + +------------ Growing tree 385 -------------- + +- N obs inbag: 276 +- N row inbag: 169 +- max nodes: 215 +- max leaves: 108 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 8 5 1 14 11 + + + -- linear combo weights (showing up to 5) + + 1.2691 0.7610 0.4500 -0.1962 0.7005 + + + -- cutpoint (score) + --- -1.02901 (0.622838), N = 210 moving right + --- -0.227935 (0.764129), N = 119 moving right + --- 0.14624 (0.769567), N = 103 moving right + --- 1.08478 (0.740322), N = 70 moving right + --- 5.62312 (0.547405), N = 10 moving right + + -- best stat: 0.769567, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 15 10 11 13 4 + + + -- linear combo weights (showing up to 5) + + -0.1942 -0.7296 0.9927 0.1551 0.2436 + + + -- cutpoint (score) + --- -1.60188 (0.544088), N = 248 moving right + --- -1.55369 (0.548749), N = 245 moving right + --- -0.66688 (0.686177), N = 179 moving right + --- -0.270557 (0.719642), N = 148 moving right + --- -0.182098 (0.720986), N = 138 moving right + + -- best stat: 0.720986, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 12 11 17 5 15 + + + -- linear combo weights (showing up to 5) + + -0.0791 1.0322 0.2876 1.2139 -0.1978 + + + -- cutpoint (score) + --- 0.0729281 (0.608331), N = 221 moving right + --- 0.329215 (0.657373), N = 186 moving right + --- 0.420172 (0.684288), N = 164 moving right + --- 0.525255 (0.704211), N = 147 moving right + --- 0.904324 (0.741035), N = 112 moving right + + -- best stat: 0.741035, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 3.0000e+00 + 1.4000e+02 1.0000e+00 4.0000e+00 + 1.8600e+02 1.0000e+00 3.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 3.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9275e-01 7.2464e-03 + 7.1000e+01 9.8551e-01 1.4546e-02 + 1.1000e+02 9.7826e-01 2.1899e-02 + 1.3100e+02 9.6739e-01 3.3010e-02 + 1.4000e+02 9.5290e-01 4.7991e-02 + + +------------ Growing tree 386 -------------- + +- N obs inbag: 276 +- N row inbag: 168 +- max nodes: 207 +- max leaves: 104 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 12 11 13 1 10 + + + -- linear combo weights (showing up to 5) + + -0.1134 0.7249 0.2230 0.4536 -0.8186 + + + -- cutpoint (score) + --- -0.707612 (0.667732), N = 186 moving right + --- -0.676263 (0.660703), N = 176 moving right + --- -0.595719 (0.672245), N = 166 moving right + --- 1.32274 (0.668367), N = 47 moving right + --- 1.47058 (0.665556), N = 33 moving right + + -- best stat: 0.672245, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 2 5 11 8 6 + + + -- linear combo weights (showing up to 5) + + -0.0906 0.9284 0.3421 1.7448 0.1588 + + + -- cutpoint (score) + --- -1.41153 (0.540862), N = 254 moving right + --- -1.40546 (0.550363), N = 249 moving right + --- -0.503183 (0.73288), N = 126 moving right + --- 0.180971 (0.718549), N = 73 moving right + --- 2.12301 (0.622698), N = 25 moving right + + -- best stat: 0.73288, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 5 0 9 13 16 + + + -- linear combo weights (showing up to 5) + + 1.3258 0.0511 0.0186 0.4376 0.7755 + + + -- cutpoint (score) + --- -0.337383 (0.643061), N = 179 moving right + --- -0.0426082 (0.667823), N = 148 moving right + --- 0.239537 (0.67737), N = 121 moving right + --- 0.505883 (0.661927), N = 95 moving right + --- 1.94843 (0.613469), N = 19 moving right + + -- best stat: 0.67737, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 3.0000e+00 + 1.1000e+02 1.0000e+00 4.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 3.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.8913e-01 1.0870e-02 + 1.1000e+02 9.7464e-01 2.5522e-02 + 1.3100e+02 9.7101e-01 2.9239e-02 + 1.7900e+02 9.6014e-01 4.0433e-02 + 1.9100e+02 9.5290e-01 4.7980e-02 + + +------------ Growing tree 387 -------------- + +- N obs inbag: 276 +- N row inbag: 179 +- max nodes: 213 +- max leaves: 107 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 10 17 1 0 8 + + + -- linear combo weights (showing up to 5) + + -0.2699 0.3704 0.4159 -0.0625 2.0475 + + + -- cutpoint (score) + --- -0.962639 (0.522257), N = 256 moving right + --- -0.414355 (0.617426), N = 204 moving right + --- 0.342214 (0.735979), N = 138 moving right + --- 1.3695 (0.758404), N = 78 moving right + --- 5.23487 (0.564831), N = 10 moving right + + -- best stat: 0.758404, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 13 8 17 1 2 + + + -- linear combo weights (showing up to 5) + + 0.0402 2.0441 0.4804 0.3789 -0.9725 + + + -- cutpoint (score) + --- -1.07255 (0.596254), N = 227 moving right + --- -0.875195 (0.627678), N = 203 moving right + --- -0.325926 (0.721886), N = 144 moving right + --- 1.41284 (0.685764), N = 47 moving right + --- 6.30497 (0.546958), N = 7 moving right + + -- best stat: 0.721886, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 14 12 16 0 10 + + + -- linear combo weights (showing up to 5) + + 0.3971 0.1198 0.6678 -0.0706 -0.4926 + + + -- cutpoint (score) + --- -1.42825 (0.505804), N = 265 moving right + --- -1.04971 (0.537249), N = 242 moving right + --- -0.161934 (0.682507), N = 114 moving right + --- -0.0260749 (0.671295), N = 104 moving right + --- 1.34741 (0.59805), N = 24 moving right + + -- best stat: 0.682507, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.9275e-01 7.2596e-03 + 1.1000e+02 9.8913e-01 1.0909e-02 + 1.4000e+02 9.8551e-01 1.4572e-02 + 1.9800e+02 9.8188e-01 1.8249e-02 + + +------------ Growing tree 388 -------------- + +- N obs inbag: 276 +- N row inbag: 173 +- max nodes: 205 +- max leaves: 103 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 5 1 2 16 0 + + + -- linear combo weights (showing up to 5) + + 1.3174 0.2607 -2.1192 0.3539 0.2695 + + + -- cutpoint (score) + --- -2.14582 (0.622636), N = 194 moving right + --- -1.84842 (0.665786), N = 141 moving right + --- -1.35304 (0.674231), N = 109 moving right + --- -0.506627 (0.692066), N = 63 moving right + --- -0.307372 (0.671072), N = 56 moving right + + -- best stat: 0.692066, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 17 11 12 15 5 + + + -- linear combo weights (showing up to 5) + + 0.3048 1.4835 -0.0761 0.0116 0.5426 + + + -- cutpoint (score) + --- -0.455013 (0.551831), N = 251 moving right + --- -0.355804 (0.570376), N = 240 moving right + --- 0.323121 (0.701994), N = 163 moving right + --- 0.38106 (0.698491), N = 157 moving right + --- 0.635242 (0.696858), N = 135 moving right + + -- best stat: 0.701994, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 8 15 13 9 12 + + + -- linear combo weights (showing up to 5) + + 2.2389 -0.1593 0.0644 -0.4217 0.1566 + + + -- cutpoint (score) + --- -1.32464 (0.599321), N = 228 moving right + --- -1.19806 (0.61952), N = 204 moving right + --- -0.97076 (0.688435), N = 159 moving right + --- -0.939128 (0.709451), N = 147 moving right + --- -0.381221 (0.734764), N = 95 moving right + + -- best stat: 0.734764, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 3.0000e+00 + 1.4000e+02 1.0000e+00 3.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9275e-01 7.2464e-03 + 7.7000e+01 9.8913e-01 1.0896e-02 + 1.1000e+02 9.8551e-01 1.4559e-02 + 1.3100e+02 9.7464e-01 2.5588e-02 + 1.4000e+02 9.6377e-01 3.6741e-02 + + +------------ Growing tree 389 -------------- + +- N obs inbag: 276 +- N row inbag: 182 +- max nodes: 221 +- max leaves: 111 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 11 3 8 4 6 + + + -- linear combo weights (showing up to 5) + + 0.4372 4.0514 1.3069 0.2456 0.0100 + + + -- cutpoint (score) + --- -1.21122 (0.517058), N = 267 moving right + --- -0.812621 (0.669795), N = 192 moving right + --- -0.762086 (0.680526), N = 177 moving right + --- -0.712232 (0.699969), N = 164 moving right + --- -0.573649 (0.719893), N = 143 moving right + + -- best stat: 0.719893, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 6 2 0 11 3 + + + -- linear combo weights (showing up to 5) + + 0.6789 0.1984 0.1131 0.8908 5.0920 + + + -- cutpoint (score) + --- -0.180733 (0.668891), N = 187 moving right + --- 0.162388 (0.725086), N = 118 moving right + --- 1.05318 (0.7117), N = 62 moving right + --- 1.98163 (0.633851), N = 36 moving right + --- 3.33926 (0.613716), N = 24 moving right + + -- best stat: 0.725086, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 7 17 10 13 14 + + + -- linear combo weights (showing up to 5) + + 8.4198 0.5507 -0.4579 0.4061 0.2312 + + + -- cutpoint (score) + --- 0.750389 (0.592984), N = 226 moving right + --- 1.02489 (0.62587), N = 208 moving right + --- 2.0029 (0.655487), N = 85 moving right + --- 2.78736 (0.661141), N = 37 moving right + --- 2.88716 (0.658968), N = 34 moving right + + -- best stat: 0.661141, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 7.7000e+01 9.8913e-01 1.0896e-02 + 1.1000e+02 9.8551e-01 1.4559e-02 + 1.4000e+02 9.8188e-01 1.8235e-02 + 1.7900e+02 9.7826e-01 2.1926e-02 + + +------------ Growing tree 390 -------------- + +- N obs inbag: 276 +- N row inbag: 174 +- max nodes: 231 +- max leaves: 116 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 4 2 8 15 1 + + + -- linear combo weights (showing up to 5) + + 0.4440 -0.2877 1.5576 -0.2966 0.4133 + + + -- cutpoint (score) + --- -1.53126 (0.542311), N = 247 moving right + --- -0.519342 (0.733431), N = 152 moving right + --- -0.275332 (0.753005), N = 130 moving right + --- -0.152783 (0.766062), N = 121 moving right + --- 0.349857 (0.794887), N = 79 moving right + + -- best stat: 0.794887, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 7 5 1 6 13 + + + -- linear combo weights (showing up to 5) + + 19.4542 0.7214 0.4640 1.2393 0.4786 + + + -- cutpoint (score) + --- 0.18978 (0.696429), N = 143 moving right + --- 0.413345 (0.734934), N = 114 moving right + --- 0.530318 (0.731069), N = 101 moving right + --- 0.822825 (0.703669), N = 72 moving right + --- 1.13063 (0.69475), N = 62 moving right + + -- best stat: 0.734934, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 15 10 17 14 1 + + + -- linear combo weights (showing up to 5) + + -0.0735 -0.8155 0.4867 0.2360 0.2691 + + + -- cutpoint (score) + --- 0.594005 (0.622853), N = 209 moving right + --- 1.25694 (0.715105), N = 142 moving right + --- 1.2654 (0.719926), N = 140 moving right + --- 1.38519 (0.738193), N = 129 moving right + --- 1.46819 (0.734934), N = 123 moving right + + -- best stat: 0.738193, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 3.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.1000e+01 9.8913e-01 1.0909e-02 + 7.7000e+01 9.8551e-01 1.4572e-02 + 1.1000e+02 9.8188e-01 1.8249e-02 + + +------------ Growing tree 391 -------------- + +- N obs inbag: 276 +- N row inbag: 181 +- max nodes: 237 +- max leaves: 119 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 13 15 12 7 14 + + + -- linear combo weights (showing up to 5) + + 0.2782 -0.2320 0.2552 4.9305 0.4332 + + + -- cutpoint (score) + --- -0.413628 (0.610568), N = 216 moving right + --- -0.379937 (0.624064), N = 209 moving right + --- -0.362236 (0.621787), N = 199 moving right + --- 0.433849 (0.669415), N = 72 moving right + --- 5.12299 (0.537805), N = 6 moving right + + -- best stat: 0.669415, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 7 10 14 16 17 + + + -- linear combo weights (showing up to 5) + + 4.2783 -0.6489 0.4883 0.3243 0.4352 + + + -- cutpoint (score) + --- 0.0448951 (0.564667), N = 237 moving right + --- 0.500774 (0.614112), N = 206 moving right + --- 0.544569 (0.623862), N = 201 moving right + --- 1.15552 (0.709423), N = 145 moving right + --- 1.26774 (0.701913), N = 131 moving right + + -- best stat: 0.709423, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 3 14 12 13 4 + + + -- linear combo weights (showing up to 5) + + 9.2520 0.1201 0.1774 0.3091 0.6644 + + + -- cutpoint (score) + --- -0.198352 (0.612992), N = 212 moving right + --- -0.176133 (0.608292), N = 209 moving right + --- 0.477723 (0.709331), N = 122 moving right + --- 0.515585 (0.713407), N = 114 moving right + --- 1.73421 (0.590298), N = 24 moving right + + -- best stat: 0.713407, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 4.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 3.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 7.1000e+01 9.9275e-01 7.2464e-03 + 7.7000e+01 9.7826e-01 2.1845e-02 + 1.1000e+02 9.7101e-01 2.9252e-02 + 1.3100e+02 9.6739e-01 3.2984e-02 + 1.4000e+02 9.6377e-01 3.6729e-02 + + +------------ Growing tree 392 -------------- + +- N obs inbag: 276 +- N row inbag: 176 +- max nodes: 223 +- max leaves: 112 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 10 17 12 16 9 + + + -- linear combo weights (showing up to 5) + + -0.6192 0.3631 0.0430 0.8958 0.2803 + + + -- cutpoint (score) + --- -0.401829 (0.553116), N = 247 moving right + --- -0.381071 (0.558601), N = 245 moving right + --- 0.520647 (0.700786), N = 164 moving right + --- 0.526045 (0.696532), N = 161 moving right + --- 3.09335 (0.642831), N = 36 moving right + + -- best stat: 0.700786, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 6 10 8 7 11 + + + -- linear combo weights (showing up to 5) + + 0.7943 -0.5034 1.2957 5.0736 0.2536 + + + -- cutpoint (score) + --- -1.33474 (0.564771), N = 243 moving right + --- -1.08599 (0.602763), N = 225 moving right + --- -0.898957 (0.647328), N = 202 moving right + --- -0.294508 (0.733958), N = 138 moving right + --- 0.676825 (0.729603), N = 74 moving right + + -- best stat: 0.733958, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 10 0 14 13 3 + + + -- linear combo weights (showing up to 5) + + -0.4922 0.0240 0.2973 0.7277 7.3039 + + + -- cutpoint (score) + --- -1.64533 (0.517362), N = 266 moving right + --- -0.498789 (0.649889), N = 196 moving right + --- -0.176341 (0.673583), N = 155 moving right + --- -0.0971856 (0.697399), N = 142 moving right + --- 0.195595 (0.724521), N = 105 moving right + + -- best stat: 0.724521, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 3.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.1000e+01 9.8913e-01 1.0909e-02 + 7.7000e+01 9.8551e-01 1.4572e-02 + 1.1000e+02 9.7464e-01 2.5602e-02 + + +------------ Growing tree 393 -------------- + +- N obs inbag: 276 +- N row inbag: 164 +- max nodes: 227 +- max leaves: 114 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 3 16 1 7 9 + + + -- linear combo weights (showing up to 5) + + 4.2379 0.1147 0.3075 4.6657 0.6408 + + + -- cutpoint (score) + --- -0.364286 (0.597514), N = 204 moving right + --- -0.108259 (0.675283), N = 147 moving right + --- 0.021502 (0.707097), N = 117 moving right + --- 0.103639 (0.708335), N = 102 moving right + --- 0.712562 (0.660918), N = 48 moving right + + -- best stat: 0.708335, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 6 5 11 15 0 + + + -- linear combo weights (showing up to 5) + + 1.0280 0.6894 0.6510 -0.0383 -0.0841 + + + -- cutpoint (score) + --- -0.58014 (0.559171), N = 242 moving right + --- -0.51223 (0.581979), N = 230 moving right + --- -0.477635 (0.598527), N = 222 moving right + --- -0.2663 (0.618836), N = 171 moving right + --- 1.1161 (0.609695), N = 38 moving right + + -- best stat: 0.618836, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 17 16 3 15 13 + + + -- linear combo weights (showing up to 5) + + 0.5130 0.2174 5.4541 0.1647 0.2511 + + + -- cutpoint (score) + --- 0.745919 (0.548791), N = 249 moving right + --- 1.06893 (0.594452), N = 222 moving right + --- 1.21316 (0.636894), N = 196 moving right + --- 1.27898 (0.647273), N = 182 moving right + --- 1.8817 (0.692057), N = 88 moving right + + -- best stat: 0.692057, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 1.1000e+02 1.0000e+00 3.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 3.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + 3.3400e+02 1.0000e+00 3.0000e+00 + 3.4800e+02 1.0000e+00 2.0000e+00 + 3.8800e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 1.1000e+02 9.8913e-01 1.0870e-02 + 1.3100e+02 9.8551e-01 1.4533e-02 + 1.7900e+02 9.7826e-01 2.1886e-02 + 1.8600e+02 9.7101e-01 2.9293e-02 + 1.9800e+02 9.6014e-01 4.0487e-02 + + +------------ Growing tree 394 -------------- + +- N obs inbag: 276 +- N row inbag: 174 +- max nodes: 243 +- max leaves: 122 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 0 5 14 4 17 + + + -- linear combo weights (showing up to 5) + + -0.0625 1.1061 0.3257 0.7852 0.3055 + + + -- cutpoint (score) + --- 0.52622 (0.592229), N = 232 moving right + --- 2.27656 (0.613876), N = 62 moving right + --- 2.76794 (0.61113), N = 47 moving right + --- 2.79902 (0.613989), N = 46 moving right + --- 3.4077 (0.52727), N = 8 moving right + + -- best stat: 0.613989, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 15 16 14 10 4 + + + -- linear combo weights (showing up to 5) + + -0.0547 0.2656 0.4484 -0.5793 0.9059 + + + -- cutpoint (score) + --- -1.0386 (0.511585), N = 265 moving right + --- -0.0297867 (0.650549), N = 180 moving right + --- 0.32664 (0.67009), N = 153 moving right + --- 0.508425 (0.678026), N = 132 moving right + --- 1.77246 (0.616527), N = 34 moving right + + -- best stat: 0.678026, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 4 10 14 12 15 + + + -- linear combo weights (showing up to 5) + + 1.0146 -0.6192 0.4490 -0.0827 -0.0581 + + + -- cutpoint (score) + --- 0.673308 (0.654141), N = 122 moving right + --- 1.12066 (0.676766), N = 75 moving right + --- 1.33135 (0.654179), N = 59 moving right + --- 1.42182 (0.657056), N = 56 moving right + --- 2.09209 (0.594373), N = 23 moving right + + -- best stat: 0.676766, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 3.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 4.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.8551e-01 1.4532e-02 + 7.7000e+01 9.8188e-01 1.8209e-02 + 1.8600e+02 9.7826e-01 2.1899e-02 + 1.9100e+02 9.7464e-01 2.5602e-02 + + +------------ Growing tree 395 -------------- + +- N obs inbag: 276 +- N row inbag: 178 +- max nodes: 233 +- max leaves: 117 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 10 6 2 13 4 + + + -- linear combo weights (showing up to 5) + + -0.4904 1.8479 -1.1817 0.3531 0.8807 + + + -- cutpoint (score) + --- -2.17482 (0.515318), N = 267 moving right + --- -1.55058 (0.584573), N = 228 moving right + --- -1.44683 (0.599002), N = 216 moving right + --- -1.14369 (0.651685), N = 186 moving right + --- -0.67903 (0.674561), N = 145 moving right + + -- best stat: 0.674561, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 3 16 0 15 11 + + + -- linear combo weights (showing up to 5) + + 4.7794 0.5284 -0.0478 -0.2237 0.5623 + + + -- cutpoint (score) + --- -0.463183 (0.644471), N = 184 moving right + --- 0.927124 (0.655768), N = 48 moving right + --- 1.43892 (0.622646), N = 31 moving right + --- 5.41483 (0.550845), N = 12 moving right + --- 6.13951 (0.522027), N = 5 moving right + + -- best stat: 0.655768, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 3 7 5 8 6 + + + -- linear combo weights (showing up to 5) + + 4.5660 2.5809 0.0925 1.8122 1.7855 + + + -- cutpoint (score) + --- -0.919145 (0.664114), N = 193 moving right + --- 0.630635 (0.706511), N = 75 moving right + --- 1.08953 (0.705743), N = 58 moving right + --- 3.16442 (0.628708), N = 30 moving right + --- 6.38521 (0.581582), N = 13 moving right + + -- best stat: 0.706511, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 3.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.9275e-01 7.2596e-03 + 7.7000e+01 9.8188e-01 1.8208e-02 + 1.3100e+02 9.7826e-01 2.1898e-02 + 1.8600e+02 9.7101e-01 2.9306e-02 + + +------------ Growing tree 396 -------------- + +- N obs inbag: 276 +- N row inbag: 178 +- max nodes: 217 +- max leaves: 109 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 0 1 8 5 10 + + + -- linear combo weights (showing up to 5) + + -0.0621 0.2660 2.2832 0.9448 -0.4287 + + + -- cutpoint (score) + --- -2.10624 (0.507439), N = 271 moving right + --- -1.32352 (0.65578), N = 201 moving right + --- -1.13024 (0.709803), N = 172 moving right + --- -0.943829 (0.727131), N = 163 moving right + --- -0.00819883 (0.759922), N = 98 moving right + + -- best stat: 0.759922, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 9 11 12 2 0 + + + -- linear combo weights (showing up to 5) + + 0.2787 1.2421 -0.0266 -0.2678 0.1092 + + + -- cutpoint (score) + --- -1.03743 (0.621709), N = 201 moving right + --- -0.801714 (0.666537), N = 161 moving right + --- -0.680769 (0.694405), N = 147 moving right + --- 0.111822 (0.662264), N = 82 moving right + --- 0.24932 (0.654348), N = 73 moving right + + -- best stat: 0.694405, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 15 3 2 10 17 + + + -- linear combo weights (showing up to 5) + + -0.0075 7.6699 -1.1823 -0.5049 0.4415 + + + -- cutpoint (score) + --- -0.133415 (0.647994), N = 195 moving right + --- 0.453405 (0.684971), N = 114 moving right + --- 0.632608 (0.658924), N = 84 moving right + --- 1.20547 (0.640382), N = 39 moving right + --- 8.62093 (0.524658), N = 5 moving right + + -- best stat: 0.684971, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 3.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + 3.4800e+02 1.0000e+00 1.0000e+00 + 3.8800e+02 1.0000e+00 2.0000e+00 + 4.6000e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 7.1000e+01 9.9638e-01 3.6232e-03 + 7.7000e+01 9.9275e-01 7.2596e-03 + 1.1000e+02 9.8188e-01 1.8208e-02 + 1.8600e+02 9.7464e-01 2.5589e-02 + 3.0400e+02 9.6739e-01 3.3023e-02 + + +------------ Growing tree 397 -------------- + +- N obs inbag: 276 +- N row inbag: 183 +- max nodes: 229 +- max leaves: 115 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 12 2 10 14 5 + + + -- linear combo weights (showing up to 5) + + 0.1520 -0.8176 -0.6296 0.2351 1.0640 + + + -- cutpoint (score) + --- -1.76716 (0.513757), N = 259 moving right + --- -1.64733 (0.526333), N = 254 moving right + --- -1.45613 (0.541652), N = 246 moving right + --- -0.124692 (0.642125), N = 99 moving right + --- 0.294306 (0.639743), N = 57 moving right + + -- best stat: 0.642125, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 15 12 17 0 10 + + + -- linear combo weights (showing up to 5) + + 0.0397 0.0914 0.6174 0.0332 -0.5917 + + + -- cutpoint (score) + --- 1.16328 (0.579303), N = 220 moving right + --- 1.46674 (0.630845), N = 175 moving right + --- 2.08741 (0.682177), N = 102 moving right + --- 2.34761 (0.660474), N = 87 moving right + --- 2.88593 (0.636923), N = 37 moving right + + -- best stat: 0.682177, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 13 4 10 14 0 + + + -- linear combo weights (showing up to 5) + + 0.2304 0.9299 -0.5489 0.2895 0.0480 + + + -- cutpoint (score) + --- -1.07519 (0.507793), N = 268 moving right + --- 0.652331 (0.68372), N = 117 moving right + --- 0.952982 (0.69138), N = 86 moving right + --- 1.01506 (0.689646), N = 83 moving right + --- 1.17531 (0.671754), N = 64 moving right + + -- best stat: 0.69138, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 3.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.7000e+01 9.8913e-01 1.0909e-02 + 1.1000e+02 9.8188e-01 1.8235e-02 + 1.4000e+02 9.7464e-01 2.5615e-02 + + +------------ Growing tree 398 -------------- + +- N obs inbag: 276 +- N row inbag: 178 +- max nodes: 205 +- max leaves: 103 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 14 8 10 15 17 + + + -- linear combo weights (showing up to 5) + + 0.0233 2.3852 -0.6557 -0.1819 0.2842 + + + -- cutpoint (score) + --- -1.16224 (0.57504), N = 225 moving right + --- -1.11789 (0.582481), N = 220 moving right + --- 0.475612 (0.733998), N = 94 moving right + --- 1.21453 (0.737131), N = 63 moving right + --- 7.97011 (0.559158), N = 9 moving right + + -- best stat: 0.737131, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 5 6 12 14 10 + + + -- linear combo weights (showing up to 5) + + 0.8846 -1.1338 0.1902 0.4298 -0.9513 + + + -- cutpoint (score) + --- -1.81573 (0.534333), N = 258 moving right + --- -0.743136 (0.618641), N = 201 moving right + --- 0.0285632 (0.672099), N = 115 moving right + --- 0.0301587 (0.673861), N = 114 moving right + --- 2.21482 (0.611092), N = 17 moving right + + -- best stat: 0.673861, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 9 3 8 14 12 + + + -- linear combo weights (showing up to 5) + + 0.0606 6.3767 2.1725 -0.0602 0.1855 + + + -- cutpoint (score) + --- -1.04381 (0.68376), N = 153 moving right + --- -0.0832821 (0.724055), N = 80 moving right + --- 1.11661 (0.686806), N = 48 moving right + --- 5.8935 (0.613093), N = 19 moving right + --- 11.8187 (0.537596), N = 5 moving right + + -- best stat: 0.724055, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 4.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.7826e-01 2.1845e-02 + 7.1000e+01 9.7464e-01 2.5549e-02 + 1.1000e+02 9.7101e-01 2.9266e-02 + 1.3100e+02 9.6377e-01 3.6729e-02 + + +------------ Growing tree 399 -------------- + +- N obs inbag: 276 +- N row inbag: 185 +- max nodes: 203 +- max leaves: 102 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 15 13 17 10 9 + + + -- linear combo weights (showing up to 5) + + -0.0266 0.2891 0.3179 -0.7292 0.3553 + + + -- cutpoint (score) + --- -0.39264 (0.569665), N = 239 moving right + --- 1.02754 (0.707172), N = 114 moving right + --- 1.26237 (0.695726), N = 81 moving right + --- 1.77643 (0.687752), N = 56 moving right + --- 2.27808 (0.594765), N = 22 moving right + + -- best stat: 0.707172, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 15 10 13 11 5 + + + -- linear combo weights (showing up to 5) + + 0.0243 -0.6687 0.2990 0.7492 0.6639 + + + -- cutpoint (score) + --- -1.24033 (0.554767), N = 242 moving right + --- -0.77424 (0.628055), N = 204 moving right + --- -0.137901 (0.733066), N = 145 moving right + --- 0.70965 (0.707901), N = 76 moving right + --- 1.88175 (0.578796), N = 17 moving right + + -- best stat: 0.733066, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 10 14 8 5 11 + + + -- linear combo weights (showing up to 5) + + -0.5168 0.0673 1.7945 0.5279 0.3155 + + + -- cutpoint (score) + --- -1.34305 (0.62186), N = 210 moving right + --- -1.31566 (0.626768), N = 208 moving right + --- -0.135131 (0.73581), N = 97 moving right + --- 0.653501 (0.759153), N = 63 moving right + --- 1.67739 (0.666059), N = 37 moving right + + -- best stat: 0.759153, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + 3.4800e+02 1.0000e+00 3.0000e+00 + 4.6000e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.8913e-01 1.0896e-02 + 1.1000e+02 9.8188e-01 1.8222e-02 + 1.3100e+02 9.7826e-01 2.1912e-02 + 1.9100e+02 9.7101e-01 2.9319e-02 + + +------------ Growing tree 400 -------------- + +- N obs inbag: 276 +- N row inbag: 163 +- max nodes: 197 +- max leaves: 99 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 7 2 12 11 4 + + + -- linear combo weights (showing up to 5) + + 18.0276 0.5206 0.1129 0.8617 0.1912 + + + -- cutpoint (score) + --- -0.182156 (0.566927), N = 246 moving right + --- -0.169644 (0.567463), N = 242 moving right + --- -0.0219213 (0.617061), N = 203 moving right + --- 0.610916 (0.715964), N = 102 moving right + --- 18.8737 (0.566342), N = 11 moving right + + -- best stat: 0.715964, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 4 12 10 1 15 + + + -- linear combo weights (showing up to 5) + + 0.0273 0.1871 -0.9569 0.4849 -0.0608 + + + -- cutpoint (score) + --- -0.221141 (0.683207), N = 139 moving right + --- -0.200502 (0.681379), N = 136 moving right + --- 0.00189334 (0.680575), N = 117 moving right + --- 1.65592 (0.624299), N = 28 moving right + --- 1.77494 (0.617841), N = 26 moving right + + -- best stat: 0.683207, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 6 1 15 9 13 + + + -- linear combo weights (showing up to 5) + + 0.3936 0.6653 -0.0532 0.4960 0.1115 + + + -- cutpoint (score) + --- -0.713179 (0.599732), N = 218 moving right + --- -0.179884 (0.648111), N = 153 moving right + --- -0.0761885 (0.677529), N = 134 moving right + --- 0.0763153 (0.691275), N = 116 moving right + --- 1.04478 (0.609627), N = 35 moving right + + -- best stat: 0.691275, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 3.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.8913e-01 1.0870e-02 + 5.1000e+01 9.8551e-01 1.4533e-02 + 7.7000e+01 9.8188e-01 1.8209e-02 + 1.4000e+02 9.7464e-01 2.5589e-02 + 1.7900e+02 9.6739e-01 3.3024e-02 + + +------------ Growing tree 401 -------------- + +- N obs inbag: 276 +- N row inbag: 164 +- max nodes: 223 +- max leaves: 112 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 8 14 12 0 1 + + + -- linear combo weights (showing up to 5) + + 2.6140 -0.1947 0.0436 -0.0527 0.6115 + + + -- cutpoint (score) + --- -1.52047 (0.594857), N = 217 moving right + --- -1.41857 (0.619254), N = 202 moving right + --- -1.36228 (0.638422), N = 189 moving right + --- -0.894893 (0.721332), N = 135 moving right + --- 0.479361 (0.728121), N = 56 moving right + + -- best stat: 0.728121, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 9 14 13 17 12 + + + -- linear combo weights (showing up to 5) + + -0.2892 0.3223 0.3027 0.8747 0.1462 + + + -- cutpoint (score) + --- 1.39835 (0.556233), N = 247 moving right + --- 2.03402 (0.597735), N = 204 moving right + --- 2.72711 (0.680213), N = 145 moving right + --- 2.84828 (0.693911), N = 134 moving right + --- 4.21025 (0.561295), N = 11 moving right + + -- best stat: 0.693911, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 5 16 7 3 9 + + + -- linear combo weights (showing up to 5) + + 0.6432 0.2176 3.1317 8.9218 0.4052 + + + -- cutpoint (score) + --- -0.405146 (0.522359), N = 259 moving right + --- -0.311065 (0.56211), N = 239 moving right + --- -0.00538431 (0.68386), N = 131 moving right + --- 0.329566 (0.720756), N = 94 moving right + --- 1.02795 (0.653224), N = 36 moving right + + -- best stat: 0.720756, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 3.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 5.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.1000e+01 9.8188e-01 1.8208e-02 + 1.1000e+02 9.7826e-01 2.1898e-02 + 1.3100e+02 9.6014e-01 4.0417e-02 + + +------------ Growing tree 402 -------------- + +- N obs inbag: 276 +- N row inbag: 177 +- max nodes: 235 +- max leaves: 118 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 16 15 5 0 2 + + + -- linear combo weights (showing up to 5) + + 0.5478 -0.0114 1.2453 -0.1915 -0.7231 + + + -- cutpoint (score) + --- -0.986071 (0.610236), N = 189 moving right + --- -0.500046 (0.648674), N = 137 moving right + --- 0.435455 (0.64534), N = 60 moving right + --- 0.477383 (0.638863), N = 53 moving right + --- 0.626348 (0.641009), N = 43 moving right + + -- best stat: 0.648674, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 11 7 9 3 15 + + + -- linear combo weights (showing up to 5) + + 0.9868 3.8531 0.3832 4.8145 -0.0692 + + + -- cutpoint (score) + --- -1.08213 (0.531559), N = 261 moving right + --- -0.955601 (0.578294), N = 236 moving right + --- -0.739103 (0.636832), N = 207 moving right + --- -0.193735 (0.72007), N = 132 moving right + --- -0.0572459 (0.708994), N = 116 moving right + + -- best stat: 0.72007, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 11 2 9 5 0 + + + -- linear combo weights (showing up to 5) + + 1.1291 0.1181 0.3163 0.8067 -0.0677 + + + -- cutpoint (score) + --- -0.696324 (0.627903), N = 207 moving right + --- -0.627501 (0.64032), N = 201 moving right + --- -0.588539 (0.648693), N = 197 moving right + --- 1.37885 (0.653982), N = 50 moving right + --- 2.25066 (0.578064), N = 23 moving right + + -- best stat: 0.653982, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + 3.3400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.8913e-01 1.0896e-02 + 1.3100e+02 9.8551e-01 1.4559e-02 + 1.8600e+02 9.8188e-01 1.8235e-02 + 1.9800e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 403 -------------- + +- N obs inbag: 276 +- N row inbag: 177 +- max nodes: 225 +- max leaves: 113 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 1 11 5 16 17 + + + -- linear combo weights (showing up to 5) + + 0.3933 0.7320 0.6460 0.2646 0.3077 + + + -- cutpoint (score) + --- -0.163508 (0.5486), N = 252 moving right + --- 0.975648 (0.726067), N = 129 moving right + --- 2.04449 (0.695456), N = 55 moving right + --- 2.72358 (0.609728), N = 28 moving right + --- 3.18637 (0.550899), N = 14 moving right + + -- best stat: 0.726067, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 9 17 16 11 6 + + + -- linear combo weights (showing up to 5) + + 0.2897 0.4484 0.3254 0.7433 0.3747 + + + -- cutpoint (score) + --- 0.547002 (0.630015), N = 210 moving right + --- 1.49829 (0.7453), N = 119 moving right + --- 1.72927 (0.734582), N = 94 moving right + --- 2.15956 (0.695306), N = 64 moving right + --- 2.66094 (0.627209), N = 37 moving right + + -- best stat: 0.7453, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 6 10 17 4 1 + + + -- linear combo weights (showing up to 5) + + -0.1424 -0.5707 0.2648 0.6329 0.3223 + + + -- cutpoint (score) + --- -0.373967 (0.518932), N = 264 moving right + --- 1.21502 (0.715179), N = 128 moving right + --- 1.31305 (0.722714), N = 117 moving right + --- 2.06977 (0.651415), N = 57 moving right + --- 2.47414 (0.597163), N = 33 moving right + + -- best stat: 0.722714, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.7000e+01 9.8913e-01 1.0909e-02 + 1.1000e+02 9.8551e-01 1.4572e-02 + 1.3100e+02 9.8188e-01 1.8249e-02 + + +------------ Growing tree 404 -------------- + +- N obs inbag: 276 +- N row inbag: 173 +- max nodes: 217 +- max leaves: 109 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 14 4 10 13 5 + + + -- linear combo weights (showing up to 5) + + 0.2175 0.4177 -0.7303 0.6786 0.2271 + + + -- cutpoint (score) + --- -1.1515 (0.558187), N = 248 moving right + --- -0.579632 (0.574234), N = 220 moving right + --- -0.515395 (0.588193), N = 214 moving right + --- 0.322762 (0.661165), N = 128 moving right + --- 0.867808 (0.687258), N = 82 moving right + + -- best stat: 0.687258, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 1 12 17 9 15 + + + -- linear combo weights (showing up to 5) + + 0.3533 -0.0090 0.6558 0.4804 -0.1435 + + + -- cutpoint (score) + --- 1.33192 (0.59252), N = 217 moving right + --- 1.58895 (0.632529), N = 188 moving right + --- 2.14128 (0.70374), N = 120 moving right + --- 2.6325 (0.652011), N = 75 moving right + --- 2.77486 (0.636334), N = 61 moving right + + -- best stat: 0.70374, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 16 7 10 5 3 + + + -- linear combo weights (showing up to 5) + + 0.1565 6.3974 -0.4509 0.0599 3.5654 + + + -- cutpoint (score) + --- -0.260908 (0.568015), N = 201 moving right + --- -0.0799019 (0.625875), N = 155 moving right + --- 0.0251218 (0.639378), N = 134 moving right + --- 0.0593958 (0.654425), N = 125 moving right + --- 0.0804411 (0.652403), N = 111 moving right + + -- best stat: 0.654425, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 3.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 3.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + 3.3400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.8913e-01 1.0870e-02 + 5.1000e+01 9.8188e-01 1.8196e-02 + 1.3100e+02 9.7464e-01 2.5576e-02 + 1.4000e+02 9.7101e-01 2.9293e-02 + 1.9800e+02 9.6014e-01 4.0487e-02 + + +------------ Growing tree 405 -------------- + +- N obs inbag: 276 +- N row inbag: 178 +- max nodes: 235 +- max leaves: 118 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 1 13 8 16 4 + + + -- linear combo weights (showing up to 5) + + 0.3571 -0.0146 1.8871 0.5925 0.3931 + + + -- cutpoint (score) + --- -1.68916 (0.516813), N = 254 moving right + --- -1.5724 (0.531903), N = 247 moving right + --- -1.34657 (0.564956), N = 222 moving right + --- -0.0642883 (0.749043), N = 106 moving right + --- 6.1341 (0.564439), N = 12 moving right + + -- best stat: 0.749043, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 0 16 10 9 6 + + + -- linear combo weights (showing up to 5) + + -0.1740 1.0817 -0.4904 0.3396 -0.2425 + + + -- cutpoint (score) + --- -1.32189 (0.552375), N = 235 moving right + --- -1.22377 (0.562792), N = 229 moving right + --- 0.0571625 (0.691383), N = 103 moving right + --- 0.351674 (0.699923), N = 74 moving right + --- 1.10115 (0.661126), N = 43 moving right + + -- best stat: 0.699923, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 17 1 9 0 3 + + + -- linear combo weights (showing up to 5) + + 0.4706 0.3634 0.2790 -0.0762 6.0085 + + + -- cutpoint (score) + --- 1.12509 (0.646304), N = 194 moving right + --- 1.18547 (0.644408), N = 184 moving right + --- 1.63878 (0.681559), N = 116 moving right + --- 1.72951 (0.692819), N = 106 moving right + --- 7.56815 (0.589927), N = 19 moving right + + -- best stat: 0.692819, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 3.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.7000e+01 9.8913e-01 1.0896e-02 + 1.1000e+02 9.8551e-01 1.4559e-02 + 1.3100e+02 9.8188e-01 1.8235e-02 + 1.4000e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 406 -------------- + +- N obs inbag: 276 +- N row inbag: 173 +- max nodes: 241 +- max leaves: 121 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 14 6 12 8 13 + + + -- linear combo weights (showing up to 5) + + -0.1014 0.2227 -0.0811 1.1831 0.3527 + + + -- cutpoint (score) + --- -1.11821 (0.517411), N = 261 moving right + --- -1.11368 (0.523855), N = 259 moving right + --- -1.0128 (0.539265), N = 248 moving right + --- -0.38044 (0.701729), N = 141 moving right + --- -0.0789256 (0.71828), N = 113 moving right + + -- best stat: 0.71828, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 12 6 16 10 15 + + + -- linear combo weights (showing up to 5) + + 0.0374 1.0861 0.7032 -0.8819 -0.2311 + + + -- cutpoint (score) + --- -1.22144 (0.543408), N = 240 moving right + --- 0.519859 (0.731148), N = 89 moving right + --- 0.739037 (0.723123), N = 77 moving right + --- 2.47999 (0.596302), N = 19 moving right + --- 2.67793 (0.557757), N = 11 moving right + + -- best stat: 0.731148, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 4 8 2 0 10 + + + -- linear combo weights (showing up to 5) + + 0.2725 1.1257 -0.2708 -0.0406 -0.7521 + + + -- cutpoint (score) + --- -1.40087 (0.572787), N = 230 moving right + --- -0.957339 (0.642311), N = 193 moving right + --- -0.74707 (0.674612), N = 176 moving right + --- 0.361922 (0.748699), N = 84 moving right + --- 4.65499 (0.548211), N = 10 moving right + + -- best stat: 0.748699, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 4.0000e+00 + 1.8600e+02 1.0000e+00 4.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8551e-01 1.4546e-02 + 7.1000e+01 9.8188e-01 1.8222e-02 + 7.7000e+01 9.7826e-01 2.1912e-02 + 1.1000e+02 9.7464e-01 2.5616e-02 + + +------------ Growing tree 407 -------------- + +- N obs inbag: 276 +- N row inbag: 176 +- max nodes: 247 +- max leaves: 124 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 5 3 2 17 16 + + + -- linear combo weights (showing up to 5) + + 0.8608 3.8288 -0.5778 0.4836 0.1886 + + + -- cutpoint (score) + --- 1.21888 (0.663602), N = 120 moving right + --- 1.49943 (0.667828), N = 107 moving right + --- 2.04226 (0.672985), N = 54 moving right + --- 2.52855 (0.621826), N = 28 moving right + --- 6.22395 (0.529291), N = 7 moving right + + -- best stat: 0.672985, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 7 15 14 0 4 + + + -- linear combo weights (showing up to 5) + + 5.7182 -0.0628 0.3122 -0.0356 0.6736 + + + -- cutpoint (score) + --- -0.37821 (0.491397), N = 267 moving right + --- -0.264514 (0.538712), N = 245 moving right + --- -0.105828 (0.592954), N = 218 moving right + --- -0.0252365 (0.595067), N = 194 moving right + --- 0.0311956 (0.605363), N = 185 moving right + + -- best stat: 0.605363, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 9 11 12 4 7 + + + -- linear combo weights (showing up to 5) + + 0.2920 0.9275 -0.1017 0.5372 4.6585 + + + -- cutpoint (score) + --- -0.952979 (0.530471), N = 262 moving right + --- -0.135037 (0.675288), N = 154 moving right + --- -0.109627 (0.681816), N = 147 moving right + --- 0.160276 (0.706007), N = 120 moving right + --- 5.46749 (0.553538), N = 14 moving right + + -- best stat: 0.706007, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 3.0000e+00 + 3.0400e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 1.3100e+02 9.8913e-01 1.0909e-02 + 1.7900e+02 9.8551e-01 1.4572e-02 + 1.8600e+02 9.8188e-01 1.8249e-02 + + +------------ Growing tree 408 -------------- + +- N obs inbag: 276 +- N row inbag: 179 +- max nodes: 233 +- max leaves: 117 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 5 1 14 12 7 + + + -- linear combo weights (showing up to 5) + + 1.1164 0.5301 0.5163 0.0048 7.5255 + + + -- cutpoint (score) + --- -0.444184 (0.590347), N = 221 moving right + --- 0.263043 (0.688158), N = 132 moving right + --- 0.98032 (0.681381), N = 54 moving right + --- 1.10814 (0.66757), N = 48 moving right + --- 2.04398 (0.604412), N = 21 moving right + + -- best stat: 0.688158, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 5 16 8 11 13 + + + -- linear combo weights (showing up to 5) + + 1.3078 0.2449 1.3624 1.1660 -0.0536 + + + -- cutpoint (score) + --- -1.37153 (0.641777), N = 204 moving right + --- -1.13267 (0.67643), N = 180 moving right + --- -1.04333 (0.685152), N = 177 moving right + --- 0.783923 (0.743124), N = 81 moving right + --- 5.3009 (0.602762), N = 18 moving right + + -- best stat: 0.743124, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 9 5 0 14 10 + + + -- linear combo weights (showing up to 5) + + 0.1117 1.6320 -0.3734 0.4611 -0.6774 + + + -- cutpoint (score) + --- -0.184927 (0.671656), N = 153 moving right + --- 0.132574 (0.703186), N = 107 moving right + --- 0.211639 (0.680556), N = 99 moving right + --- 0.469413 (0.684426), N = 89 moving right + --- 1.10354 (0.633997), N = 48 moving right + + -- best stat: 0.703186, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 3.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.4800e+02 1.0000e+00 2.0000e+00 + 3.8800e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.8188e-01 1.8222e-02 + 1.3100e+02 9.7101e-01 2.9292e-02 + 1.4000e+02 9.6377e-01 3.6755e-02 + + +------------ Growing tree 409 -------------- + +- N obs inbag: 276 +- N row inbag: 182 +- max nodes: 223 +- max leaves: 112 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 1 8 12 3 9 + + + -- linear combo weights (showing up to 5) + + 0.3041 1.4767 0.1098 5.6072 -0.1576 + + + -- cutpoint (score) + --- -1.22385 (0.525719), N = 264 moving right + --- -0.960898 (0.564721), N = 232 moving right + --- -0.708306 (0.665768), N = 183 moving right + --- -0.653801 (0.689616), N = 166 moving right + --- -0.365623 (0.77573), N = 113 moving right + + -- best stat: 0.77573, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 13 1 3 17 0 + + + -- linear combo weights (showing up to 5) + + 0.7681 0.3839 6.9514 0.4061 -0.0190 + + + -- cutpoint (score) + --- 0.689153 (0.659589), N = 190 moving right + --- 0.790398 (0.698128), N = 168 moving right + --- 1.0555 (0.705313), N = 141 moving right + --- 1.11158 (0.712779), N = 134 moving right + --- 1.58237 (0.698028), N = 88 moving right + + -- best stat: 0.712779, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 12 17 9 8 11 + + + -- linear combo weights (showing up to 5) + + 0.0192 0.3566 -0.3147 1.4009 0.8649 + + + -- cutpoint (score) + --- -0.674801 (0.53705), N = 261 moving right + --- 0.10088 (0.681686), N = 176 moving right + --- 1.43181 (0.727309), N = 71 moving right + --- 1.7184 (0.706561), N = 58 moving right + --- 5.21192 (0.592393), N = 17 moving right + + -- best stat: 0.727309, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 3.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.8551e-01 1.4559e-02 + 1.1000e+02 9.7464e-01 2.5588e-02 + 1.3100e+02 9.7101e-01 2.9306e-02 + + +------------ Growing tree 410 -------------- + +- N obs inbag: 276 +- N row inbag: 173 +- max nodes: 209 +- max leaves: 105 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 12 14 9 8 4 + + + -- linear combo weights (showing up to 5) + + 0.0191 0.0712 -0.0797 2.2884 0.3910 + + + -- cutpoint (score) + --- -1.08312 (0.641025), N = 191 moving right + --- -1.04948 (0.654493), N = 186 moving right + --- -0.962651 (0.68083), N = 166 moving right + --- -0.913277 (0.692856), N = 158 moving right + --- -0.670033 (0.722454), N = 124 moving right + + -- best stat: 0.722454, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 1 13 8 2 12 + + + -- linear combo weights (showing up to 5) + + 0.4726 -0.1710 2.4536 -0.1405 0.0445 + + + -- cutpoint (score) + --- -1.7871 (0.563723), N = 241 moving right + --- -0.85096 (0.75041), N = 122 moving right + --- -0.826996 (0.751808), N = 121 moving right + --- -0.625119 (0.774196), N = 95 moving right + --- -0.0674344 (0.756645), N = 61 moving right + + -- best stat: 0.774196, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 10 0 17 12 3 + + + -- linear combo weights (showing up to 5) + + -0.4960 -0.1501 0.3873 0.1377 4.5343 + + + -- cutpoint (score) + --- 0.671531 (0.611116), N = 185 moving right + --- 0.762763 (0.632638), N = 166 moving right + --- 0.931821 (0.673929), N = 146 moving right + --- 0.960607 (0.703395), N = 131 moving right + --- 1.26449 (0.676614), N = 87 moving right + + -- best stat: 0.703395, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 4.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + 3.3400e+02 1.0000e+00 2.0000e+00 + 3.4800e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.7464e-01 2.5548e-02 + 1.8600e+02 9.7101e-01 2.9265e-02 + 1.9100e+02 9.6739e-01 3.2997e-02 + + +------------ Growing tree 411 -------------- + +- N obs inbag: 276 +- N row inbag: 171 +- max nodes: 229 +- max leaves: 115 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 3 9 12 1 14 + + + -- linear combo weights (showing up to 5) + + 4.1556 0.4186 0.1233 0.2643 0.1599 + + + -- cutpoint (score) + --- -0.257519 (0.613363), N = 201 moving right + --- -0.043522 (0.650006), N = 138 moving right + --- -0.0366828 (0.652593), N = 136 moving right + --- 0.0211938 (0.663655), N = 126 moving right + --- 1.35662 (0.61931), N = 32 moving right + + -- best stat: 0.663655, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 2 1 16 10 12 + + + -- linear combo weights (showing up to 5) + + -0.8114 0.1302 0.2292 -0.8076 0.1363 + + + -- cutpoint (score) + --- -2.28579 (0.506622), N = 265 moving right + --- -1.34537 (0.594753), N = 213 moving right + --- -1.09117 (0.607996), N = 196 moving right + --- -0.585862 (0.675818), N = 131 moving right + --- 0.0828405 (0.670122), N = 70 moving right + + -- best stat: 0.675818, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 7 3 1 14 0 + + + -- linear combo weights (showing up to 5) + + 6.0831 2.5013 0.3281 0.4004 -0.2171 + + + -- cutpoint (score) + --- -0.584498 (0.572532), N = 235 moving right + --- -0.562426 (0.570447), N = 230 moving right + --- -0.183344 (0.641994), N = 159 moving right + --- 0.0185172 (0.68047), N = 116 moving right + --- 0.173801 (0.68242), N = 95 moving right + + -- best stat: 0.68242, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.8551e-01 1.4559e-02 + 1.1000e+02 9.7826e-01 2.1912e-02 + 1.3100e+02 9.7464e-01 2.5616e-02 + + +------------ Growing tree 412 -------------- + +- N obs inbag: 276 +- N row inbag: 172 +- max nodes: 227 +- max leaves: 114 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 7 11 13 10 6 + + + -- linear combo weights (showing up to 5) + + 4.0330 0.6292 0.2019 -0.6374 2.0565 + + + -- cutpoint (score) + --- -0.912301 (0.593221), N = 227 moving right + --- -0.0928593 (0.712326), N = 151 moving right + --- 1.02857 (0.74369), N = 72 moving right + --- 1.22486 (0.742984), N = 64 moving right + --- 1.48795 (0.70751), N = 53 moving right + + -- best stat: 0.74369, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 3 5 0 6 2 + + + -- linear combo weights (showing up to 5) + + 7.8792 1.1724 -0.4489 -0.2523 -0.8832 + + + -- cutpoint (score) + --- -0.883152 (0.70093), N = 117 moving right + --- -0.448881 (0.711994), N = 106 moving right + --- -0.411933 (0.698501), N = 103 moving right + --- -0.252305 (0.692482), N = 102 moving right + --- 0 (0.707012), N = 56 moving right + + -- best stat: 0.711994, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 16 3 6 7 12 + + + -- linear combo weights (showing up to 5) + + 0.1733 6.9577 0.8168 3.5731 0.1469 + + + -- cutpoint (score) + --- -0.275796 (0.507888), N = 268 moving right + --- -0.226329 (0.547098), N = 245 moving right + --- -0.18613 (0.580663), N = 219 moving right + --- 0.0345807 (0.676063), N = 118 moving right + --- 0.114842 (0.686504), N = 88 moving right + + -- best stat: 0.686504, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 3.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 3.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 7.7000e+01 9.8188e-01 1.8195e-02 + 1.1000e+02 9.7464e-01 2.5575e-02 + 1.3100e+02 9.7101e-01 2.9293e-02 + 1.4000e+02 9.6014e-01 4.0487e-02 + + +------------ Growing tree 413 -------------- + +- N obs inbag: 276 +- N row inbag: 173 +- max nodes: 215 +- max leaves: 108 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 16 7 8 15 13 + + + -- linear combo weights (showing up to 5) + + 0.5618 2.2372 1.7541 -0.2035 -0.0757 + + + -- cutpoint (score) + --- -1.36737 (0.574273), N = 227 moving right + --- -0.880635 (0.671343), N = 162 moving right + --- -0.773069 (0.69012), N = 146 moving right + --- -0.174968 (0.733105), N = 101 moving right + --- 5.33188 (0.565441), N = 9 moving right + + -- best stat: 0.733105, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 1 16 17 9 11 + + + -- linear combo weights (showing up to 5) + + 0.3255 0.8120 0.1924 0.3544 0.5862 + + + -- cutpoint (score) + --- -0.477591 (0.590462), N = 230 moving right + --- 0.557858 (0.713837), N = 119 moving right + --- 0.626816 (0.720595), N = 116 moving right + --- 2.09849 (0.611719), N = 29 moving right + --- 2.25962 (0.615291), N = 27 moving right + + -- best stat: 0.720595, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 14 1 16 9 5 + + + -- linear combo weights (showing up to 5) + + 0.5618 0.3578 0.9628 0.3394 0.9114 + + + -- cutpoint (score) + --- -1.07473 (0.56358), N = 242 moving right + --- -0.1608 (0.702032), N = 161 moving right + --- -0.0907058 (0.697861), N = 157 moving right + --- -0.028491 (0.705967), N = 150 moving right + --- 1.00287 (0.699636), N = 66 moving right + + -- best stat: 0.705967, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 3.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.9275e-01 7.2596e-03 + 7.7000e+01 9.8913e-01 1.0909e-02 + 1.1000e+02 9.8551e-01 1.4572e-02 + 1.4000e+02 9.8188e-01 1.8249e-02 + + +------------ Growing tree 414 -------------- + +- N obs inbag: 276 +- N row inbag: 175 +- max nodes: 251 +- max leaves: 126 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 17 14 2 1 12 + + + -- linear combo weights (showing up to 5) + + 0.6065 0.2962 -0.0512 0.2099 0.0515 + + + -- cutpoint (score) + --- 1.53572 (0.646755), N = 198 moving right + --- 1.73378 (0.649214), N = 166 moving right + --- 1.77601 (0.638858), N = 161 moving right + --- 2.52993 (0.606771), N = 38 moving right + --- 2.79162 (0.528513), N = 10 moving right + + -- best stat: 0.649214, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 4 2 8 6 9 + + + -- linear combo weights (showing up to 5) + + 0.4681 -0.1543 2.0462 0.7561 0.0082 + + + -- cutpoint (score) + --- -1.46278 (0.51149), N = 270 moving right + --- -1.33103 (0.548765), N = 249 moving right + --- -1.28443 (0.567863), N = 240 moving right + --- -0.681966 (0.698152), N = 148 moving right + --- -0.680518 (0.691408), N = 145 moving right + + -- best stat: 0.698152, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 7 5 0 15 16 + + + -- linear combo weights (showing up to 5) + + 3.8799 1.1767 0.1867 -0.0720 0.2866 + + + -- cutpoint (score) + --- -0.141643 (0.569708), N = 232 moving right + --- -0.0208182 (0.625235), N = 186 moving right + --- 0.0196542 (0.65054), N = 157 moving right + --- 0.360501 (0.685125), N = 105 moving right + --- 0.754991 (0.672002), N = 87 moving right + + -- best stat: 0.685125, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.9275e-01 7.2596e-03 + 7.7000e+01 9.8551e-01 1.4559e-02 + 1.1000e+02 9.8188e-01 1.8235e-02 + 1.4000e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 415 -------------- + +- N obs inbag: 276 +- N row inbag: 170 +- max nodes: 199 +- max leaves: 100 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 9 4 12 14 15 + + + -- linear combo weights (showing up to 5) + + 0.3614 0.8552 0.0896 0.2366 -0.0843 + + + -- cutpoint (score) + --- -0.241291 (0.580745), N = 208 moving right + --- -0.234593 (0.591106), N = 202 moving right + --- 0.377706 (0.660522), N = 149 moving right + --- 0.401184 (0.644614), N = 146 moving right + --- 0.888273 (0.609446), N = 76 moving right + + -- best stat: 0.660522, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 4 12 6 7 0 + + + -- linear combo weights (showing up to 5) + + 0.7786 0.0943 1.4544 18.6756 -0.0144 + + + -- cutpoint (score) + --- -0.0688337 (0.529433), N = 254 moving right + --- -0.049971 (0.593018), N = 223 moving right + --- -0.00698373 (0.632836), N = 176 moving right + --- 0.104002 (0.642938), N = 164 moving right + --- 0.769586 (0.687028), N = 90 moving right + + -- best stat: 0.687028, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 5 3 4 2 8 + + + -- linear combo weights (showing up to 5) + + 1.0936 6.3054 0.1138 0.3230 1.5045 + + + -- cutpoint (score) + --- -0.66904 (0.512085), N = 270 moving right + --- 0.621991 (0.728876), N = 118 moving right + --- 1.40678 (0.73015), N = 70 moving right + --- 3.59765 (0.639586), N = 25 moving right + --- 8.50259 (0.557591), N = 10 moving right + + -- best stat: 0.73015, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9275e-01 7.2464e-03 + 1.1000e+02 9.8913e-01 1.0896e-02 + 1.3100e+02 9.8551e-01 1.4559e-02 + 1.7900e+02 9.8188e-01 1.8235e-02 + 2.1600e+02 9.7464e-01 2.5616e-02 + + +------------ Growing tree 416 -------------- + +- N obs inbag: 276 +- N row inbag: 180 +- max nodes: 237 +- max leaves: 119 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 9 16 17 10 2 + + + -- linear combo weights (showing up to 5) + + 0.3259 0.8538 0.4483 -0.7797 -1.2248 + + + -- cutpoint (score) + --- -0.562202 (0.662461), N = 186 moving right + --- -0.373175 (0.686388), N = 169 moving right + --- -0.0683626 (0.723264), N = 150 moving right + --- 0.0289943 (0.724848), N = 145 moving right + --- 2.68155 (0.596869), N = 19 moving right + + -- best stat: 0.724848, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 0 11 9 8 13 + + + -- linear combo weights (showing up to 5) + + -0.0137 0.5097 -0.3166 1.7616 0.0718 + + + -- cutpoint (score) + --- -1.1863 (0.643912), N = 191 moving right + --- -1.16261 (0.644833), N = 190 moving right + --- -0.783925 (0.711936), N = 146 moving right + --- 0.178425 (0.695985), N = 83 moving right + --- 3.09569 (0.585154), N = 19 moving right + + -- best stat: 0.711936, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 10 1 16 6 5 + + + -- linear combo weights (showing up to 5) + + -0.7704 0.4804 0.9379 -0.7133 0.8850 + + + -- cutpoint (score) + --- -1.67643 (0.549641), N = 251 moving right + --- 0.402066 (0.726598), N = 99 moving right + --- 0.894322 (0.696721), N = 68 moving right + --- 1.16121 (0.710775), N = 62 moving right + --- 2.47431 (0.634445), N = 27 moving right + + -- best stat: 0.726598, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.8551e-01 1.4559e-02 + 1.1000e+02 9.7826e-01 2.1912e-02 + 1.3100e+02 9.7464e-01 2.5616e-02 + + +------------ Growing tree 417 -------------- + +- N obs inbag: 276 +- N row inbag: 175 +- max nodes: 231 +- max leaves: 116 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 17 7 3 9 13 + + + -- linear combo weights (showing up to 5) + + 0.5089 4.4760 3.8301 0.2940 0.0780 + + + -- cutpoint (score) + --- 1.095 (0.597766), N = 219 moving right + --- 1.44709 (0.678387), N = 165 moving right + --- 1.95347 (0.651396), N = 76 moving right + --- 2.00083 (0.63758), N = 62 moving right + --- 5.66805 (0.61092), N = 25 moving right + + -- best stat: 0.678387, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 1 14 17 7 8 + + + -- linear combo weights (showing up to 5) + + 0.4792 0.0575 0.3808 4.0378 1.6644 + + + -- cutpoint (score) + --- 0.104333 (0.63334), N = 211 moving right + --- 0.568848 (0.695264), N = 164 moving right + --- 0.877716 (0.7612), N = 129 moving right + --- 1.16439 (0.790858), N = 109 moving right + --- 1.21443 (0.784881), N = 102 moving right + + -- best stat: 0.790858, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 16 1 2 6 4 + + + -- linear combo weights (showing up to 5) + + 0.6170 0.3784 0.3983 2.1223 0.9489 + + + -- cutpoint (score) + --- 0.304665 (0.631789), N = 189 moving right + --- 0.92607 (0.712699), N = 139 moving right + --- 0.998489 (0.721634), N = 136 moving right + --- 1.36711 (0.726867), N = 95 moving right + --- 1.58531 (0.717291), N = 77 moving right + + -- best stat: 0.726867, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 5.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + 3.3400e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 7.7000e+01 9.9638e-01 3.6232e-03 + 1.1000e+02 9.9275e-01 7.2596e-03 + 1.3100e+02 9.8913e-01 1.0909e-02 + 1.7900e+02 9.8551e-01 1.4572e-02 + 1.8600e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 418 -------------- + +- N obs inbag: 276 +- N row inbag: 170 +- max nodes: 249 +- max leaves: 125 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 12 0 15 11 7 + + + -- linear combo weights (showing up to 5) + + -0.1634 -0.0404 0.0207 1.0213 5.0825 + + + -- cutpoint (score) + --- -0.416688 (0.683397), N = 158 moving right + --- -0.304915 (0.700462), N = 134 moving right + --- -0.0612952 (0.718332), N = 101 moving right + --- -0.0508038 (0.712161), N = 95 moving right + --- 0.884085 (0.665869), N = 47 moving right + + -- best stat: 0.718332, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 2 5 10 3 1 + + + -- linear combo weights (showing up to 5) + + -0.3707 0.5992 -0.4972 1.3782 0.2405 + + + -- cutpoint (score) + --- -0.819656 (0.568543), N = 225 moving right + --- -0.77264 (0.583216), N = 219 moving right + --- -0.460151 (0.640422), N = 170 moving right + --- -0.404373 (0.655698), N = 163 moving right + --- 0.804474 (0.638693), N = 36 moving right + + -- best stat: 0.655698, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 4 0 13 8 5 + + + -- linear combo weights (showing up to 5) + + -0.0112 -0.0971 -0.0921 2.0025 0.3215 + + + -- cutpoint (score) + --- -1.3029 (0.520985), N = 267 moving right + --- -1.01219 (0.634854), N = 193 moving right + --- -0.712381 (0.690734), N = 140 moving right + --- 0.355577 (0.664884), N = 62 moving right + --- 2.57079 (0.607015), N = 19 moving right + + -- best stat: 0.690734, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.1000e+01 9.8913e-01 1.0909e-02 + 7.7000e+01 9.8551e-01 1.4572e-02 + 1.4000e+02 9.8188e-01 1.8249e-02 + + +------------ Growing tree 419 -------------- + +- N obs inbag: 276 +- N row inbag: 178 +- max nodes: 195 +- max leaves: 98 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 7 8 16 3 11 + + + -- linear combo weights (showing up to 5) + + 6.5859 1.1750 0.2309 7.3575 0.0214 + + + -- cutpoint (score) + --- -0.904187 (0.51473), N = 259 moving right + --- -0.816362 (0.568741), N = 226 moving right + --- -0.683244 (0.673286), N = 164 moving right + --- -0.330189 (0.758234), N = 90 moving right + --- 0.145883 (0.710111), N = 53 moving right + + -- best stat: 0.758234, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 0 5 17 2 14 + + + -- linear combo weights (showing up to 5) + + -0.4933 1.1237 0.5455 -0.1257 0.3109 + + + -- cutpoint (score) + --- 0.93207 (0.622447), N = 194 moving right + --- 1.71555 (0.668745), N = 105 moving right + --- 2.08891 (0.633506), N = 69 moving right + --- 2.92293 (0.544734), N = 18 moving right + --- 3.13941 (0.513014), N = 6 moving right + + -- best stat: 0.668745, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 1 15 12 11 3 + + + -- linear combo weights (showing up to 5) + + 0.2599 0.0253 0.1689 0.1087 11.1194 + + + -- cutpoint (score) + --- -0.392214 (0.569892), N = 239 moving right + --- -0.34076 (0.582754), N = 226 moving right + --- -0.0278072 (0.717107), N = 110 moving right + --- -0.00215519 (0.733662), N = 99 moving right + --- 0.154334 (0.671656), N = 67 moving right + + -- best stat: 0.733662, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 1.1000e+02 9.8913e-01 1.0896e-02 + 1.4000e+02 9.8551e-01 1.4559e-02 + 1.7900e+02 9.7826e-01 2.1912e-02 + 1.9100e+02 9.7101e-01 2.9319e-02 + + +------------ Growing tree 420 -------------- + +- N obs inbag: 276 +- N row inbag: 172 +- max nodes: 223 +- max leaves: 112 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 3 2 7 16 0 + + + -- linear combo weights (showing up to 5) + + 5.1621 -0.8369 3.0278 0.1928 -0.1060 + + + -- cutpoint (score) + --- -1.0836 (0.545889), N = 224 moving right + --- -0.977558 (0.603072), N = 176 moving right + --- -0.939307 (0.644115), N = 145 moving right + --- -0.862805 (0.659887), N = 106 moving right + --- -0.0172027 (0.650844), N = 39 moving right + + -- best stat: 0.659887, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 0 2 17 12 6 + + + -- linear combo weights (showing up to 5) + + -0.0466 -1.0811 0.5424 0.0973 2.1396 + + + -- cutpoint (score) + --- -0.0497538 (0.571765), N = 239 moving right + --- 0.500428 (0.694851), N = 162 moving right + --- 0.502543 (0.688317), N = 160 moving right + --- 1.00668 (0.692254), N = 109 moving right + --- 1.05038 (0.643185), N = 76 moving right + + -- best stat: 0.694851, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 15 16 13 12 7 + + + -- linear combo weights (showing up to 5) + + -0.0046 0.4982 0.4288 0.1406 3.5775 + + + -- cutpoint (score) + --- -0.424283 (0.647079), N = 181 moving right + --- 0.117862 (0.715924), N = 118 moving right + --- 1.31583 (0.599589), N = 19 moving right + --- 3.55805 (0.58241), N = 15 moving right + --- 3.68096 (0.569645), N = 13 moving right + + -- best stat: 0.715924, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 4.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.4800e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.7464e-01 2.5548e-02 + 1.1000e+02 9.6739e-01 3.2983e-02 + 1.4000e+02 9.6377e-01 3.6728e-02 + + +------------ Growing tree 421 -------------- + +- N obs inbag: 276 +- N row inbag: 171 +- max nodes: 227 +- max leaves: 114 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 13 17 5 15 10 + + + -- linear combo weights (showing up to 5) + + 0.1659 0.4271 1.1631 -0.0436 -0.6740 + + + -- cutpoint (score) + --- 0.767554 (0.608), N = 204 moving right + --- 1.39498 (0.696898), N = 152 moving right + --- 1.70848 (0.694719), N = 118 moving right + --- 2.66277 (0.671259), N = 66 moving right + --- 3.50386 (0.622363), N = 29 moving right + + -- best stat: 0.696898, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 7 5 8 2 10 + + + -- linear combo weights (showing up to 5) + + 4.0637 0.7733 1.3510 -0.7248 -0.5094 + + + -- cutpoint (score) + --- -1.93415 (0.56219), N = 242 moving right + --- -1.10362 (0.721507), N = 161 moving right + --- -0.401619 (0.745088), N = 115 moving right + --- -0.397433 (0.738573), N = 112 moving right + --- 0.0513664 (0.724654), N = 81 moving right + + -- best stat: 0.745088, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 10 5 0 12 4 + + + -- linear combo weights (showing up to 5) + + -0.7163 1.2288 -0.1322 0.1532 0.5265 + + + -- cutpoint (score) + --- -1.10911 (0.53526), N = 255 moving right + --- -0.739664 (0.558398), N = 236 moving right + --- 0.693343 (0.689777), N = 124 moving right + --- 1.08963 (0.681567), N = 98 moving right + --- 2.19256 (0.615968), N = 30 moving right + + -- best stat: 0.689777, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 3.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 4.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 3.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 4.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.8913e-01 1.0870e-02 + 7.1000e+01 9.8551e-01 1.4533e-02 + 7.7000e+01 9.7101e-01 2.9238e-02 + 1.4000e+02 9.6739e-01 3.2970e-02 + 1.7900e+02 9.5652e-01 4.4206e-02 + + +------------ Growing tree 422 -------------- + +- N obs inbag: 276 +- N row inbag: 172 +- max nodes: 225 +- max leaves: 113 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 14 13 8 10 6 + + + -- linear combo weights (showing up to 5) + + -0.0142 -0.1388 1.7910 -0.8944 -0.0927 + + + -- cutpoint (score) + --- -1.13711 (0.623823), N = 211 moving right + --- -0.611268 (0.696542), N = 145 moving right + --- -0.570785 (0.703454), N = 142 moving right + --- -0.433194 (0.723956), N = 122 moving right + --- 0.78369 (0.686055), N = 57 moving right + + -- best stat: 0.723956, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 5 12 0 13 4 + + + -- linear combo weights (showing up to 5) + + 1.0965 0.0159 -0.1534 0.4446 0.3944 + + + -- cutpoint (score) + --- -0.551528 (0.519089), N = 261 moving right + --- 0.256521 (0.693588), N = 140 moving right + --- 0.362414 (0.702983), N = 131 moving right + --- 0.985833 (0.658599), N = 72 moving right + --- 1.59714 (0.582263), N = 20 moving right + + -- best stat: 0.702983, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 6 4 11 5 14 + + + -- linear combo weights (showing up to 5) + + 0.3439 0.3797 0.9791 0.9542 0.3594 + + + -- cutpoint (score) + --- -1.1489 (0.513076), N = 267 moving right + --- -0.931648 (0.543657), N = 247 moving right + --- 0.185661 (0.697248), N = 142 moving right + --- 0.714069 (0.743195), N = 100 moving right + --- 1.13845 (0.700693), N = 67 moving right + + -- best stat: 0.743195, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8551e-01 1.4546e-02 + 7.1000e+01 9.8188e-01 1.8222e-02 + 1.3100e+02 9.7464e-01 2.5602e-02 + 1.4000e+02 9.7101e-01 2.9320e-02 + + +------------ Growing tree 423 -------------- + +- N obs inbag: 276 +- N row inbag: 170 +- max nodes: 227 +- max leaves: 114 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 13 6 7 9 11 + + + -- linear combo weights (showing up to 5) + + 0.3503 0.6102 8.3741 0.4679 0.7314 + + + -- cutpoint (score) + --- -0.960951 (0.595735), N = 230 moving right + --- -0.472517 (0.69446), N = 168 moving right + --- -0.459886 (0.693702), N = 165 moving right + --- 0.127266 (0.739107), N = 99 moving right + --- 0.7977 (0.723046), N = 60 moving right + + -- best stat: 0.739107, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 9 10 17 4 16 + + + -- linear combo weights (showing up to 5) + + 0.6464 -0.8436 -0.0483 0.4709 0.7764 + + + -- cutpoint (score) + --- -1.99861 (0.491685), N = 271 moving right + --- -1.23756 (0.556856), N = 235 moving right + --- -0.0526525 (0.70709), N = 122 moving right + --- 0.0113949 (0.701785), N = 117 moving right + --- 1.54245 (0.672084), N = 44 moving right + + -- best stat: 0.70709, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 8 1 4 0 14 + + + -- linear combo weights (showing up to 5) + + 1.5417 0.3827 0.5096 0.1153 -0.0902 + + + -- cutpoint (score) + --- -0.16834 (0.714541), N = 140 moving right + --- -0.057042 (0.72353), N = 127 moving right + --- -0.0506831 (0.733486), N = 124 moving right + --- 0.675836 (0.72894), N = 61 moving right + --- 4.49179 (0.569339), N = 13 moving right + + -- best stat: 0.733486, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 3.0000e+00 + 1.9100e+02 1.0000e+00 4.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.7000e+01 9.8913e-01 1.0909e-02 + 1.1000e+02 9.8551e-01 1.4572e-02 + 1.7900e+02 9.8188e-01 1.8249e-02 + + +------------ Growing tree 424 -------------- + +- N obs inbag: 276 +- N row inbag: 175 +- max nodes: 213 +- max leaves: 107 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 3 17 14 7 13 + + + -- linear combo weights (showing up to 5) + + 3.8878 0.3088 0.4940 1.6465 0.3208 + + + -- cutpoint (score) + --- 0.149459 (0.566457), N = 244 moving right + --- 0.937111 (0.708373), N = 135 moving right + --- 1.37095 (0.645198), N = 79 moving right + --- 2.74603 (0.587788), N = 18 moving right + --- 5.53478 (0.553372), N = 7 moving right + + -- best stat: 0.708373, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 5 2 6 17 8 + + + -- linear combo weights (showing up to 5) + + 0.1064 -0.1295 0.3093 0.3925 2.0633 + + + -- cutpoint (score) + --- -0.16678 (0.623478), N = 213 moving right + --- 0.136052 (0.668106), N = 171 moving right + --- 0.349197 (0.709021), N = 146 moving right + --- 2.60346 (0.638052), N = 30 moving right + --- 3.86372 (0.602923), N = 17 moving right + + -- best stat: 0.709021, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 2 11 12 8 5 + + + -- linear combo weights (showing up to 5) + + 0.0561 0.4021 0.0534 1.9008 0.1789 + + + -- cutpoint (score) + --- -1.43939 (0.536661), N = 257 moving right + --- -1.17567 (0.63749), N = 204 moving right + --- -1.09602 (0.670913), N = 187 moving right + --- -0.327056 (0.743285), N = 102 moving right + --- 0.190305 (0.707013), N = 75 moving right + + -- best stat: 0.743285, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 3.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 3.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + 3.4800e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9275e-01 7.2464e-03 + 7.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.7826e-01 2.1885e-02 + 1.1000e+02 9.7464e-01 2.5589e-02 + 1.7900e+02 9.7101e-01 2.9306e-02 + + +------------ Growing tree 425 -------------- + +- N obs inbag: 276 +- N row inbag: 194 +- max nodes: 203 +- max leaves: 102 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 12 16 0 17 3 + + + -- linear combo weights (showing up to 5) + + 0.0434 0.5768 -0.0470 0.4484 11.4146 + + + -- cutpoint (score) + --- 0.889818 (0.649014), N = 178 moving right + --- 0.916576 (0.639055), N = 174 moving right + --- 1.01599 (0.633047), N = 162 moving right + --- 2.1269 (0.65346), N = 39 moving right + --- 2.14949 (0.656879), N = 37 moving right + + -- best stat: 0.656879, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 3 12 7 6 15 + + + -- linear combo weights (showing up to 5) + + 10.7056 0.1043 3.7476 0.0424 0.0915 + + + -- cutpoint (score) + --- -0.0776326 (0.534601), N = 213 moving right + --- -0.0420716 (0.584437), N = 171 moving right + --- 0.168389 (0.634925), N = 51 moving right + --- 0.367103 (0.617615), N = 30 moving right + --- 10.9264 (0.57011), N = 11 moving right + + -- best stat: 0.634925, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 12 3 10 1 16 + + + -- linear combo weights (showing up to 5) + + -0.0023 11.0775 -0.4328 0.1500 0.7479 + + + -- cutpoint (score) + --- -1.27438 (0.512212), N = 263 moving right + --- -0.299504 (0.642355), N = 160 moving right + --- -0.222587 (0.644864), N = 142 moving right + --- 0.304212 (0.717326), N = 73 moving right + --- 0.52417 (0.722424), N = 49 moving right + + -- best stat: 0.722424, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 3.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9275e-01 7.2464e-03 + 1.1000e+02 9.8551e-01 1.4546e-02 + 1.3100e+02 9.7826e-01 2.1899e-02 + 1.4000e+02 9.7464e-01 2.5602e-02 + 1.8600e+02 9.7101e-01 2.9320e-02 + + +------------ Growing tree 426 -------------- + +- N obs inbag: 276 +- N row inbag: 177 +- max nodes: 229 +- max leaves: 115 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 13 9 10 5 4 + + + -- linear combo weights (showing up to 5) + + 0.1684 0.1647 -0.8494 1.0151 0.0443 + + + -- cutpoint (score) + --- -0.0895704 (0.705456), N = 169 moving right + --- 0.0555478 (0.728592), N = 151 moving right + --- 0.396985 (0.727988), N = 124 moving right + --- 0.853031 (0.653665), N = 73 moving right + --- 1.16786 (0.658184), N = 51 moving right + + -- best stat: 0.728592, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 1 14 3 12 15 + + + -- linear combo weights (showing up to 5) + + 0.2124 0.1702 6.8674 0.1936 -0.1014 + + + -- cutpoint (score) + --- -0.370369 (0.588505), N = 236 moving right + --- -0.020819 (0.676197), N = 143 moving right + --- -0.020329 (0.678551), N = 142 moving right + --- 0.110359 (0.69419), N = 110 moving right + --- 0.335805 (0.656622), N = 72 moving right + + -- best stat: 0.69419, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 2 12 14 16 7 + + + -- linear combo weights (showing up to 5) + + 0.5504 0.1263 0.5797 0.2685 6.2302 + + + -- cutpoint (score) + --- 0.0441123 (0.585173), N = 224 moving right + --- 0.245446 (0.608892), N = 185 moving right + --- 0.257477 (0.618721), N = 181 moving right + --- 0.853584 (0.700479), N = 80 moving right + --- 1.37066 (0.628051), N = 37 moving right + + -- best stat: 0.700479, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 3.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 3.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.7826e-01 2.1885e-02 + 1.1000e+02 9.7464e-01 2.5589e-02 + 1.3100e+02 9.7101e-01 2.9306e-02 + + +------------ Growing tree 427 -------------- + +- N obs inbag: 276 +- N row inbag: 178 +- max nodes: 199 +- max leaves: 100 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 0 6 17 14 5 + + + -- linear combo weights (showing up to 5) + + 0.1671 -0.3994 0.4960 0.1566 1.5151 + + + -- cutpoint (score) + --- 0.547982 (0.527353), N = 264 moving right + --- 1.36812 (0.631923), N = 188 moving right + --- 1.78223 (0.675732), N = 131 moving right + --- 1.93368 (0.68271), N = 113 moving right + --- 3.3312 (0.62195), N = 31 moving right + + -- best stat: 0.68271, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 1 0 13 6 11 + + + -- linear combo weights (showing up to 5) + + 0.6342 0.1516 0.1556 0.2603 1.2872 + + + -- cutpoint (score) + --- -0.493644 (0.67348), N = 163 moving right + --- -0.297425 (0.713665), N = 132 moving right + --- -0.270017 (0.724629), N = 127 moving right + --- 0.675458 (0.709635), N = 66 moving right + --- 1.45027 (0.675124), N = 40 moving right + + -- best stat: 0.724629, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 1 0 9 3 4 + + + -- linear combo weights (showing up to 5) + + 0.4079 0.1008 0.3234 4.5276 1.1045 + + + -- cutpoint (score) + --- -0.519114 (0.530684), N = 253 moving right + --- 0.55637 (0.675934), N = 144 moving right + --- 0.572236 (0.677443), N = 143 moving right + --- 1.02766 (0.677015), N = 92 moving right + --- 2.181 (0.579063), N = 22 moving right + + -- best stat: 0.677443, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9275e-01 7.2464e-03 + 7.1000e+01 9.8913e-01 1.0896e-02 + 1.4000e+02 9.8188e-01 1.8222e-02 + 1.7900e+02 9.7826e-01 2.1912e-02 + 1.8600e+02 9.7464e-01 2.5616e-02 + + +------------ Growing tree 428 -------------- + +- N obs inbag: 276 +- N row inbag: 178 +- max nodes: 229 +- max leaves: 115 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 11 1 17 13 15 + + + -- linear combo weights (showing up to 5) + + 0.9204 0.3883 0.4600 0.2648 0.1995 + + + -- cutpoint (score) + --- 0.208277 (0.568298), N = 246 moving right + --- 1.39566 (0.729585), N = 120 moving right + --- 1.50464 (0.732523), N = 105 moving right + --- 2.69343 (0.663823), N = 42 moving right + --- 2.76892 (0.638367), N = 35 moving right + + -- best stat: 0.732523, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 8 13 6 14 3 + + + -- linear combo weights (showing up to 5) + + 1.7083 0.0558 0.3336 -0.1215 6.9277 + + + -- cutpoint (score) + --- -1.15826 (0.510987), N = 265 moving right + --- -0.754717 (0.693907), N = 159 moving right + --- -0.749508 (0.694812), N = 158 moving right + --- -0.147034 (0.738359), N = 99 moving right + --- 0.151689 (0.732141), N = 68 moving right + + -- best stat: 0.738359, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 8 7 13 11 6 + + + -- linear combo weights (showing up to 5) + + 1.3068 12.6750 0.0105 0.5341 0.4401 + + + -- cutpoint (score) + --- -0.681315 (0.722924), N = 145 moving right + --- -0.619772 (0.723769), N = 139 moving right + --- 0.0695639 (0.752103), N = 93 moving right + --- 3.02595 (0.65684), N = 26 moving right + --- 13.8246 (0.56214), N = 10 moving right + + -- best stat: 0.752103, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.1000e+01 9.8188e-01 1.8222e-02 + 1.1000e+02 9.7826e-01 2.1912e-02 + 1.3100e+02 9.7101e-01 2.9319e-02 + + +------------ Growing tree 429 -------------- + +- N obs inbag: 276 +- N row inbag: 174 +- max nodes: 195 +- max leaves: 98 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 1 8 3 6 4 + + + -- linear combo weights (showing up to 5) + + 0.4697 2.2523 7.0053 0.6441 0.1235 + + + -- cutpoint (score) + --- -1.62244 (0.541048), N = 248 moving right + --- -1.1394 (0.62789), N = 196 moving right + --- -0.99199 (0.678138), N = 161 moving right + --- -0.43995 (0.780747), N = 100 moving right + --- 0.237417 (0.775461), N = 78 moving right + + -- best stat: 0.780747, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 9 1 3 10 7 + + + -- linear combo weights (showing up to 5) + + 0.5629 0.5647 5.9403 -0.4298 4.7662 + + + -- cutpoint (score) + --- -0.524357 (0.612798), N = 209 moving right + --- -0.312742 (0.676091), N = 173 moving right + --- -0.286508 (0.674651), N = 171 moving right + --- 0.0590603 (0.730139), N = 115 moving right + --- 6.34534 (0.612551), N = 19 moving right + + -- best stat: 0.730139, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 16 8 13 10 15 + + + -- linear combo weights (showing up to 5) + + 0.7651 2.4236 -0.0299 -0.7526 -0.0835 + + + -- cutpoint (score) + --- -2.55039 (0.523482), N = 250 moving right + --- -1.92285 (0.592285), N = 214 moving right + --- -1.8195 (0.618916), N = 197 moving right + --- -1.28002 (0.690598), N = 154 moving right + --- 3.99928 (0.588169), N = 16 moving right + + -- best stat: 0.690598, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 3.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 3.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 7.7000e+01 9.8188e-01 1.8195e-02 + 1.1000e+02 9.7826e-01 2.1885e-02 + 1.4000e+02 9.7101e-01 2.9293e-02 + 1.8600e+02 9.6739e-01 3.3024e-02 + + +------------ Growing tree 430 -------------- + +- N obs inbag: 276 +- N row inbag: 174 +- max nodes: 215 +- max leaves: 108 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 17 13 9 5 16 + + + -- linear combo weights (showing up to 5) + + 0.6687 0.3060 0.1859 0.3934 0.5517 + + + -- cutpoint (score) + --- 0.891974 (0.574718), N = 232 moving right + --- 1.05569 (0.578775), N = 222 moving right + --- 2.21545 (0.677464), N = 118 moving right + --- 3.07975 (0.679943), N = 56 moving right + --- 3.44465 (0.618295), N = 32 moving right + + -- best stat: 0.679943, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 17 2 11 7 8 + + + -- linear combo weights (showing up to 5) + + 0.4529 -0.4081 0.4112 6.8160 1.1463 + + + -- cutpoint (score) + --- -0.34976 (0.597009), N = 229 moving right + --- 1.76028 (0.71721), N = 69 moving right + --- 1.83886 (0.698771), N = 61 moving right + --- 1.88101 (0.694919), N = 56 moving right + --- 3.55875 (0.639582), N = 29 moving right + + -- best stat: 0.71721, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 5 10 14 16 4 + + + -- linear combo weights (showing up to 5) + + 0.2131 -0.7181 0.4774 0.6068 0.5693 + + + -- cutpoint (score) + --- 0.0357073 (0.684511), N = 135 moving right + --- 0.226696 (0.704548), N = 122 moving right + --- 0.94469 (0.708195), N = 68 moving right + --- 1.10044 (0.715734), N = 62 moving right + --- 1.80259 (0.632391), N = 30 moving right + + -- best stat: 0.715734, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 5.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + 3.3400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.1000e+01 9.7101e-01 2.9211e-02 + 1.3100e+02 9.6739e-01 3.2942e-02 + 1.7900e+02 9.6377e-01 3.6688e-02 + + +------------ Growing tree 431 -------------- + +- N obs inbag: 276 +- N row inbag: 170 +- max nodes: 209 +- max leaves: 105 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 11 4 12 2 6 + + + -- linear combo weights (showing up to 5) + + 1.0041 0.4208 -0.0035 -0.5687 1.3668 + + + -- cutpoint (score) + --- -1.31579 (0.567406), N = 242 moving right + --- -0.973405 (0.647001), N = 198 moving right + --- 0.400711 (0.68753), N = 64 moving right + --- 0.844575 (0.673411), N = 44 moving right + --- 1.51256 (0.567467), N = 23 moving right + + -- best stat: 0.68753, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 11 5 17 9 16 + + + -- linear combo weights (showing up to 5) + + 0.8030 0.4250 0.2435 0.2951 0.6305 + + + -- cutpoint (score) + --- -0.719555 (0.548493), N = 250 moving right + --- -0.0218476 (0.679039), N = 179 moving right + --- 0.232103 (0.711218), N = 156 moving right + --- 1.12102 (0.70553), N = 101 moving right + --- 1.99007 (0.719507), N = 56 moving right + + -- best stat: 0.719507, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 17 15 11 13 4 + + + -- linear combo weights (showing up to 5) + + 0.3100 -0.0398 0.8889 0.3818 0.2487 + + + -- cutpoint (score) + --- -0.0722231 (0.604258), N = 221 moving right + --- 0.647433 (0.699395), N = 153 moving right + --- 0.69875 (0.716358), N = 143 moving right + --- 1.66732 (0.702259), N = 68 moving right + --- 1.77014 (0.692691), N = 64 moving right + + -- best stat: 0.716358, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9275e-01 7.2464e-03 + 7.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.8551e-01 1.4559e-02 + 1.1000e+02 9.7826e-01 2.1912e-02 + 1.3100e+02 9.7101e-01 2.9319e-02 + + +------------ Growing tree 432 -------------- + +- N obs inbag: 276 +- N row inbag: 178 +- max nodes: 221 +- max leaves: 111 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 5 1 16 14 7 + + + -- linear combo weights (showing up to 5) + + 0.5115 0.5459 0.3262 0.4322 5.2568 + + + -- cutpoint (score) + --- -0.717199 (0.574401), N = 237 moving right + --- -0.353631 (0.619768), N = 202 moving right + --- -0.251689 (0.618448), N = 188 moving right + --- -0.17211 (0.632792), N = 177 moving right + --- 0.358897 (0.707436), N = 109 moving right + + -- best stat: 0.707436, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 5 3 16 17 1 + + + -- linear combo weights (showing up to 5) + + 0.4721 6.2552 0.3627 0.3530 0.3432 + + + -- cutpoint (score) + --- 0.404559 (0.579805), N = 238 moving right + --- 0.532609 (0.612861), N = 223 moving right + --- 0.873528 (0.657111), N = 184 moving right + --- 0.879053 (0.642198), N = 177 moving right + --- 1.04506 (0.681816), N = 143 moving right + + -- best stat: 0.681816, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 3 5 10 12 17 + + + -- linear combo weights (showing up to 5) + + 6.0450 0.3856 -0.6096 0.0371 0.2519 + + + -- cutpoint (score) + --- -0.128112 (0.544149), N = 245 moving right + --- 0.0419274 (0.55772), N = 236 moving right + --- 1.06251 (0.675376), N = 118 moving right + --- 1.25723 (0.684011), N = 97 moving right + --- 1.53825 (0.688582), N = 65 moving right + + -- best stat: 0.688582, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 3.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.1000e+01 9.8913e-01 1.0909e-02 + 1.3100e+02 9.8188e-01 1.8235e-02 + 1.4000e+02 9.7101e-01 2.9305e-02 + + +------------ Growing tree 433 -------------- + +- N obs inbag: 276 +- N row inbag: 174 +- max nodes: 201 +- max leaves: 101 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 7 12 0 6 16 + + + -- linear combo weights (showing up to 5) + + 7.4319 0.0570 0.0145 1.2826 0.8385 + + + -- cutpoint (score) + --- -0.813586 (0.540701), N = 253 moving right + --- -0.646887 (0.602407), N = 212 moving right + --- -0.452969 (0.667435), N = 165 moving right + --- 0.304257 (0.720109), N = 86 moving right + --- 2.91785 (0.620261), N = 25 moving right + + -- best stat: 0.720109, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 16 13 17 10 4 + + + -- linear combo weights (showing up to 5) + + 1.2707 0.4465 0.2215 -0.7959 0.3961 + + + -- cutpoint (score) + --- -0.50604 (0.617427), N = 221 moving right + --- -0.321014 (0.66496), N = 190 moving right + --- -0.00114736 (0.691763), N = 165 moving right + --- 0.2804 (0.727471), N = 136 moving right + --- 5.19258 (0.531689), N = 5 moving right + + -- best stat: 0.727471, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 6 0 15 1 14 + + + -- linear combo weights (showing up to 5) + + 1.1276 0.2423 -0.3598 0.4237 0.4312 + + + -- cutpoint (score) + --- -0.296762 (0.618358), N = 194 moving right + --- -0.0792326 (0.617871), N = 172 moving right + --- -0.0545046 (0.620917), N = 170 moving right + --- 0.424848 (0.717232), N = 109 moving right + --- 1.78306 (0.555847), N = 16 moving right + + -- best stat: 0.717232, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 3.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.8551e-01 1.4532e-02 + 7.7000e+01 9.8188e-01 1.8209e-02 + 1.1000e+02 9.7464e-01 2.5589e-02 + 1.4000e+02 9.7101e-01 2.9306e-02 + + +------------ Growing tree 434 -------------- + +- N obs inbag: 276 +- N row inbag: 168 +- max nodes: 213 +- max leaves: 107 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 3 13 9 15 17 + + + -- linear combo weights (showing up to 5) + + 4.6212 0.2947 0.3496 -0.0906 0.4071 + + + -- cutpoint (score) + --- 0.811144 (0.610405), N = 202 moving right + --- 1.03349 (0.660249), N = 173 moving right + --- 1.55143 (0.689249), N = 68 moving right + --- 2.77798 (0.570734), N = 17 moving right + --- 5.99813 (0.545694), N = 7 moving right + + -- best stat: 0.689249, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 14 8 1 7 13 + + + -- linear combo weights (showing up to 5) + + 0.1942 1.5440 0.3745 3.6957 -0.0350 + + + -- cutpoint (score) + --- -0.879018 (0.641492), N = 190 moving right + --- -0.425023 (0.767832), N = 111 moving right + --- -0.114927 (0.770606), N = 85 moving right + --- 0.290134 (0.714194), N = 65 moving right + --- 0.559702 (0.688063), N = 56 moving right + + -- best stat: 0.770606, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 13 2 0 4 3 + + + -- linear combo weights (showing up to 5) + + 0.3766 -0.9224 -0.3757 0.7100 5.1569 + + + -- cutpoint (score) + --- -1.44782 (0.551195), N = 254 moving right + --- -0.964399 (0.662122), N = 169 moving right + --- -0.282809 (0.668192), N = 81 moving right + --- -0.150667 (0.662288), N = 68 moving right + --- -0.128619 (0.660818), N = 66 moving right + + -- best stat: 0.668192, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + 3.8800e+02 1.0000e+00 1.0000e+00 + 4.0000e+02 1.0000e+00 1.0000e+00 + 4.6000e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9275e-01 7.2464e-03 + 7.7000e+01 9.8551e-01 1.4546e-02 + 1.3100e+02 9.8188e-01 1.8222e-02 + 1.7900e+02 9.7826e-01 2.1912e-02 + 1.8600e+02 9.7464e-01 2.5616e-02 + + +------------ Growing tree 435 -------------- + +- N obs inbag: 276 +- N row inbag: 186 +- max nodes: 215 +- max leaves: 108 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 2 17 3 4 8 + + + -- linear combo weights (showing up to 5) + + -0.5639 0.2403 3.0626 0.0597 1.7586 + + + -- cutpoint (score) + --- -1.20453 (0.530207), N = 263 moving right + --- -0.866301 (0.613541), N = 217 moving right + --- -0.473086 (0.712607), N = 159 moving right + --- -0.358424 (0.731066), N = 149 moving right + --- 0.795008 (0.695202), N = 68 moving right + + -- best stat: 0.731066, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 7 15 8 12 11 + + + -- linear combo weights (showing up to 5) + + 4.0941 -0.0666 1.6157 0.1241 0.3893 + + + -- cutpoint (score) + --- -1.19642 (0.610898), N = 220 moving right + --- -0.982354 (0.680728), N = 184 moving right + --- -0.62771 (0.736579), N = 139 moving right + --- 1.44123 (0.660039), N = 42 moving right + --- 2.13598 (0.642757), N = 28 moving right + + -- best stat: 0.736579, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 12 3 6 4 9 + + + -- linear combo weights (showing up to 5) + + 0.2551 4.8298 0.1535 0.6756 0.6080 + + + -- cutpoint (score) + --- 0.157465 (0.632412), N = 175 moving right + --- 0.51304 (0.722725), N = 97 moving right + --- 0.678724 (0.728733), N = 81 moving right + --- 1.86197 (0.645668), N = 38 moving right + --- 2.24737 (0.611579), N = 27 moving right + + -- best stat: 0.728733, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 3.0000e+00 + 2.1600e+02 1.0000e+00 3.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.7000e+01 9.9275e-01 7.2596e-03 + 1.1000e+02 9.8551e-01 1.4559e-02 + 1.7900e+02 9.7826e-01 2.1912e-02 + 1.8600e+02 9.6739e-01 3.3023e-02 + + +------------ Growing tree 436 -------------- + +- N obs inbag: 276 +- N row inbag: 180 +- max nodes: 231 +- max leaves: 116 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 14 8 5 3 10 + + + -- linear combo weights (showing up to 5) + + 0.0776 1.5069 0.1685 3.7045 -0.4455 + + + -- cutpoint (score) + --- -1.57445 (0.510281), N = 271 moving right + --- -1.54299 (0.517046), N = 268 moving right + --- -1.36423 (0.514253), N = 260 moving right + --- -1.05489 (0.582437), N = 226 moving right + --- 0.995751 (0.688495), N = 51 moving right + + -- best stat: 0.688495, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 13 12 9 3 6 + + + -- linear combo weights (showing up to 5) + + 0.3950 0.0282 0.4038 6.3073 1.0824 + + + -- cutpoint (score) + --- -0.526338 (0.575539), N = 236 moving right + --- -0.486926 (0.58582), N = 231 moving right + --- -0.137567 (0.650488), N = 157 moving right + --- 0.857564 (0.629319), N = 45 moving right + --- 1.33841 (0.586485), N = 27 moving right + + -- best stat: 0.650488, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 0 17 11 15 3 + + + -- linear combo weights (showing up to 5) + + 0.2045 0.4274 0.4032 0.0489 5.2914 + + + -- cutpoint (score) + --- 0.621067 (0.564745), N = 242 moving right + --- 0.674054 (0.573277), N = 237 moving right + --- 1.29976 (0.699916), N = 145 moving right + --- 1.35277 (0.684106), N = 134 moving right + --- 1.66189 (0.722378), N = 99 moving right + + -- best stat: 0.722378, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.8551e-01 1.4559e-02 + 1.1000e+02 9.8188e-01 1.8235e-02 + 1.3100e+02 9.7464e-01 2.5615e-02 + + +------------ Growing tree 437 -------------- + +- N obs inbag: 276 +- N row inbag: 172 +- max nodes: 257 +- max leaves: 129 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 3 2 13 5 4 + + + -- linear combo weights (showing up to 5) + + 5.8830 -0.1807 0.4466 0.3933 0.5008 + + + -- cutpoint (score) + --- 0.111629 (0.683477), N = 163 moving right + --- 0.306162 (0.689249), N = 134 moving right + --- 0.428949 (0.685065), N = 112 moving right + --- 0.660837 (0.658579), N = 73 moving right + --- 5.77264 (0.56812), N = 16 moving right + + -- best stat: 0.689249, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 10 17 5 16 8 + + + -- linear combo weights (showing up to 5) + + -0.4902 0.3443 -0.0665 0.3043 1.4665 + + + -- cutpoint (score) + --- -0.664469 (0.514868), N = 258 moving right + --- 1.11844 (0.744873), N = 93 moving right + --- 1.1195 (0.738298), N = 92 moving right + --- 2.54879 (0.635437), N = 39 moving right + --- 3.20655 (0.602675), N = 30 moving right + + -- best stat: 0.744873, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 13 10 8 12 0 + + + -- linear combo weights (showing up to 5) + + 0.0877 -0.5624 1.5492 -0.0233 -0.0846 + + + -- cutpoint (score) + --- -1.15572 (0.594157), N = 214 moving right + --- -0.639084 (0.712914), N = 146 moving right + --- -0.550689 (0.723785), N = 136 moving right + --- -0.539756 (0.721189), N = 135 moving right + --- 0.697111 (0.672718), N = 54 moving right + + -- best stat: 0.723785, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 3.0000e+00 + 1.9800e+02 1.0000e+00 4.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.7000e+01 9.8913e-01 1.0896e-02 + 1.1000e+02 9.8551e-01 1.4559e-02 + 1.3100e+02 9.8188e-01 1.8235e-02 + 1.4000e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 438 -------------- + +- N obs inbag: 276 +- N row inbag: 178 +- max nodes: 215 +- max leaves: 108 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 14 15 4 6 13 + + + -- linear combo weights (showing up to 5) + + 0.4290 -0.0502 1.1781 0.8909 0.2913 + + + -- cutpoint (score) + --- -0.369974 (0.570647), N = 230 moving right + --- -0.335123 (0.573312), N = 227 moving right + --- 0.159457 (0.625504), N = 172 moving right + --- 0.252157 (0.62762), N = 162 moving right + --- 0.922679 (0.676372), N = 105 moving right + + -- best stat: 0.676372, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 5 15 17 12 8 + + + -- linear combo weights (showing up to 5) + + 0.4736 -0.1022 0.4308 -0.0335 1.9372 + + + -- cutpoint (score) + --- 0.100281 (0.622838), N = 209 moving right + --- 0.117729 (0.63405), N = 203 moving right + --- 0.270357 (0.657673), N = 187 moving right + --- 0.658884 (0.680829), N = 151 moving right + --- 1.05405 (0.694177), N = 111 moving right + + -- best stat: 0.694177, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 1 3 16 12 10 + + + -- linear combo weights (showing up to 5) + + 0.3056 6.2531 0.2203 0.1220 -0.6169 + + + -- cutpoint (score) + --- -1.35289 (0.501526), N = 267 moving right + --- -0.950076 (0.560859), N = 235 moving right + --- -0.081147 (0.693383), N = 119 moving right + --- 0.645931 (0.670411), N = 47 moving right + --- 7.75669 (0.540227), N = 9 moving right + + -- best stat: 0.693383, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 3.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.7000e+01 9.9275e-01 7.2596e-03 + 1.1000e+02 9.8913e-01 1.0909e-02 + 1.3100e+02 9.8551e-01 1.4572e-02 + 1.4000e+02 9.8188e-01 1.8249e-02 + + +------------ Growing tree 439 -------------- + +- N obs inbag: 276 +- N row inbag: 167 +- max nodes: 205 +- max leaves: 103 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 15 12 6 17 1 + + + -- linear combo weights (showing up to 5) + + -0.1654 0.3384 -0.1566 0.6861 0.5181 + + + -- cutpoint (score) + --- 1.35485 (0.622295), N = 197 moving right + --- 1.47896 (0.643688), N = 189 moving right + --- 1.92205 (0.667719), N = 148 moving right + --- 2.82765 (0.687872), N = 58 moving right + --- 3.03533 (0.65913), N = 49 moving right + + -- best stat: 0.687872, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 3 15 0 10 4 + + + -- linear combo weights (showing up to 5) + + 5.0171 -0.1324 -0.3820 -0.4882 0.7943 + + + -- cutpoint (score) + --- -0.855083 (0.515893), N = 262 moving right + --- -0.157389 (0.661001), N = 169 moving right + --- 0.201845 (0.659671), N = 133 moving right + --- 0.445521 (0.648625), N = 96 moving right + --- 6.0256 (0.572295), N = 13 moving right + + -- best stat: 0.661001, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 12 2 3 4 13 + + + -- linear combo weights (showing up to 5) + + 0.2848 -0.7895 6.2043 0.7734 0.4181 + + + -- cutpoint (score) + --- -1.17532 (0.564179), N = 230 moving right + --- -1.12834 (0.579125), N = 220 moving right + --- -0.395236 (0.691005), N = 149 moving right + --- -0.131275 (0.729306), N = 108 moving right + --- 0.389973 (0.686069), N = 60 moving right + + -- best stat: 0.729306, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 4.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 3.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 7.1000e+01 9.9638e-01 3.6232e-03 + 7.7000e+01 9.8913e-01 1.0896e-02 + 1.3100e+02 9.7464e-01 2.5548e-02 + 1.4000e+02 9.6739e-01 3.2983e-02 + 1.7900e+02 9.5652e-01 4.4219e-02 + + +------------ Growing tree 440 -------------- + +- N obs inbag: 276 +- N row inbag: 171 +- max nodes: 215 +- max leaves: 108 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 1 3 0 15 12 + + + -- linear combo weights (showing up to 5) + + 0.3678 8.6471 -0.1191 -0.1704 0.1674 + + + -- cutpoint (score) + --- -0.432261 (0.583057), N = 218 moving right + --- -0.155545 (0.627587), N = 172 moving right + --- 0.0392156 (0.634528), N = 112 moving right + --- 0.330555 (0.635358), N = 64 moving right + --- 8.51605 (0.607199), N = 16 moving right + + -- best stat: 0.635358, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 11 4 8 5 15 + + + -- linear combo weights (showing up to 5) + + 1.0382 -0.2090 1.3146 0.9448 -0.1681 + + + -- cutpoint (score) + --- -1.94647 (0.515236), N = 265 moving right + --- -1.86407 (0.52364), N = 260 moving right + --- -1.80796 (0.539793), N = 253 moving right + --- -1.33041 (0.637169), N = 206 moving right + --- 1.32969 (0.696259), N = 50 moving right + + -- best stat: 0.696259, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 12 6 2 4 14 + + + -- linear combo weights (showing up to 5) + + 0.0883 0.1680 -0.9676 0.9545 0.3555 + + + -- cutpoint (score) + --- -1.10323 (0.577884), N = 209 moving right + --- -1.05802 (0.57354), N = 204 moving right + --- -0.461789 (0.638741), N = 160 moving right + --- -0.23421 (0.659674), N = 124 moving right + --- -0.185005 (0.644285), N = 108 moving right + + -- best stat: 0.659674, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.7000e+01 9.8913e-01 1.0896e-02 + 1.1000e+02 9.8551e-01 1.4559e-02 + 1.3100e+02 9.7826e-01 2.1912e-02 + 1.4000e+02 9.7464e-01 2.5616e-02 + + +------------ Growing tree 441 -------------- + +- N obs inbag: 276 +- N row inbag: 176 +- max nodes: 203 +- max leaves: 102 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 4 9 10 8 5 + + + -- linear combo weights (showing up to 5) + + 0.4854 -0.1012 -0.5858 1.4680 0.4488 + + + -- cutpoint (score) + --- -0.806396 (0.663847), N = 186 moving right + --- -0.286189 (0.73512), N = 152 moving right + --- -0.276931 (0.739605), N = 150 moving right + --- 0.368663 (0.766368), N = 102 moving right + --- 1.13411 (0.687293), N = 52 moving right + + -- best stat: 0.766368, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 17 15 6 3 1 + + + -- linear combo weights (showing up to 5) + + 0.6211 0.0005 0.4688 3.7321 0.2515 + + + -- cutpoint (score) + --- 1.01526 (0.544937), N = 249 moving right + --- 1.52657 (0.634895), N = 189 moving right + --- 1.91738 (0.656768), N = 122 moving right + --- 2.28261 (0.704681), N = 84 moving right + --- 2.77524 (0.610088), N = 29 moving right + + -- best stat: 0.704681, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 10 2 7 12 3 + + + -- linear combo weights (showing up to 5) + + -0.6729 -0.9992 2.5320 0.2359 2.6186 + + + -- cutpoint (score) + --- -0.754867 (0.702555), N = 93 moving right + --- -0.737581 (0.705233), N = 92 moving right + --- -0.367183 (0.655982), N = 70 moving right + --- 0.177121 (0.619675), N = 34 moving right + --- 0.632283 (0.608175), N = 26 moving right + + -- best stat: 0.705233, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 7.1000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 7.1000e+01 9.9275e-01 7.2464e-03 + 1.1000e+02 9.8913e-01 1.0896e-02 + 1.3100e+02 9.8551e-01 1.4559e-02 + 1.7900e+02 9.8188e-01 1.8235e-02 + 1.8600e+02 9.7826e-01 2.1926e-02 + + +------------ Growing tree 442 -------------- + +- N obs inbag: 276 +- N row inbag: 178 +- max nodes: 227 +- max leaves: 114 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 12 9 5 11 15 + + + -- linear combo weights (showing up to 5) + + -0.0076 0.0422 0.9856 1.1246 -0.2128 + + + -- cutpoint (score) + --- -0.386883 (0.667816), N = 167 moving right + --- 0.36296 (0.725689), N = 112 moving right + --- 0.600092 (0.7322), N = 100 moving right + --- 1.35644 (0.65027), N = 47 moving right + --- 3.65539 (0.51566), N = 7 moving right + + -- best stat: 0.7322, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 15 4 2 1 13 + + + -- linear combo weights (showing up to 5) + + -0.1263 0.7591 0.1238 0.7004 0.5027 + + + -- cutpoint (score) + --- -0.468271 (0.574689), N = 234 moving right + --- 0.482765 (0.694815), N = 136 moving right + --- 0.589834 (0.719806), N = 120 moving right + --- 0.662746 (0.705708), N = 116 moving right + --- 1.86921 (0.599619), N = 28 moving right + + -- best stat: 0.719806, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 8 5 13 7 12 + + + -- linear combo weights (showing up to 5) + + 1.5780 0.2941 0.1358 4.4470 0.0678 + + + -- cutpoint (score) + --- -1.17258 (0.517607), N = 265 moving right + --- -0.86759 (0.64177), N = 206 moving right + --- -0.792561 (0.678932), N = 187 moving right + --- -0.740591 (0.689521), N = 176 moving right + --- 4.4205 (0.615644), N = 23 moving right + + -- best stat: 0.689521, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 3.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 3.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.8913e-01 1.0870e-02 + 7.1000e+01 9.8551e-01 1.4533e-02 + 7.7000e+01 9.7464e-01 2.5562e-02 + 1.1000e+02 9.6739e-01 3.2997e-02 + 1.3100e+02 9.6014e-01 4.0488e-02 + + +------------ Growing tree 443 -------------- + +- N obs inbag: 276 +- N row inbag: 174 +- max nodes: 199 +- max leaves: 100 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 14 16 8 2 12 + + + -- linear combo weights (showing up to 5) + + 0.0267 0.3934 1.7645 -0.3044 0.2428 + + + -- cutpoint (score) + --- -1.78295 (0.533843), N = 250 moving right + --- -0.105499 (0.706537), N = 73 moving right + --- 0.227618 (0.70035), N = 56 moving right + --- 0.287193 (0.694512), N = 53 moving right + --- 0.955743 (0.659488), N = 38 moving right + + -- best stat: 0.706537, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 14 15 9 10 3 + + + -- linear combo weights (showing up to 5) + + 0.3505 -0.3240 0.1273 -0.2648 6.0043 + + + -- cutpoint (score) + --- -0.334433 (0.623721), N = 192 moving right + --- -0.2105 (0.65422), N = 159 moving right + --- 0.0826725 (0.708308), N = 126 moving right + --- 0.213266 (0.747551), N = 97 moving right + --- 0.292825 (0.725186), N = 86 moving right + + -- best stat: 0.747551, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 0 9 7 10 11 + + + -- linear combo weights (showing up to 5) + + -0.3548 0.1351 6.3090 -0.5109 0.5436 + + + -- cutpoint (score) + --- -1.16603 (0.556952), N = 237 moving right + --- -1.1003 (0.567162), N = 234 moving right + --- -0.560275 (0.665479), N = 173 moving right + --- 0.361712 (0.735942), N = 70 moving right + --- 1.36174 (0.61913), N = 28 moving right + + -- best stat: 0.735942, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 4.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 3.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + 3.3400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 1.1000e+02 9.7464e-01 2.5548e-02 + 1.4000e+02 9.7101e-01 2.9265e-02 + 1.7900e+02 9.6377e-01 3.6728e-02 + + +------------ Growing tree 444 -------------- + +- N obs inbag: 276 +- N row inbag: 168 +- max nodes: 255 +- max leaves: 128 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 11 9 10 4 12 + + + -- linear combo weights (showing up to 5) + + 0.7932 0.2636 -0.7329 0.3439 -0.0453 + + + -- cutpoint (score) + --- -0.817916 (0.591956), N = 228 moving right + --- 1.89072e-05 (0.69267), N = 143 moving right + --- 0.713505 (0.720245), N = 86 moving right + --- 1.32949 (0.678173), N = 54 moving right + --- 2.03341 (0.605132), N = 26 moving right + + -- best stat: 0.720245, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 8 17 0 4 14 + + + -- linear combo weights (showing up to 5) + + 1.7752 0.2813 -0.5839 -0.0536 -0.1602 + + + -- cutpoint (score) + --- -0.580769 (0.621326), N = 216 moving right + --- -0.326459 (0.688213), N = 185 moving right + --- -0.221002 (0.714663), N = 171 moving right + --- -0.0625368 (0.747051), N = 152 moving right + --- 0.606318 (0.691152), N = 80 moving right + + -- best stat: 0.747051, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 3 5 6 15 16 + + + -- linear combo weights (showing up to 5) + + 5.4435 0.5162 0.6378 -0.2757 0.1430 + + + -- cutpoint (score) + --- -0.102028 (0.587854), N = 205 moving right + --- -0.0524557 (0.615448), N = 185 moving right + --- 0.142872 (0.637757), N = 134 moving right + --- 0.191424 (0.642668), N = 126 moving right + --- 6.0958 (0.569273), N = 13 moving right + + -- best stat: 0.642668, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 3.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.8188e-01 1.8222e-02 + 1.4000e+02 9.7101e-01 2.9292e-02 + 1.7900e+02 9.6377e-01 3.6755e-02 + + +------------ Growing tree 445 -------------- + +- N obs inbag: 276 +- N row inbag: 168 +- max nodes: 235 +- max leaves: 118 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 8 11 16 0 12 + + + -- linear combo weights (showing up to 5) + + 1.5607 0.5504 0.6350 -0.6081 -0.1353 + + + -- cutpoint (score) + --- -1.96259 (0.588528), N = 228 moving right + --- -1.94572 (0.594476), N = 225 moving right + --- -1.54866 (0.665034), N = 185 moving right + --- 0.749104 (0.683425), N = 48 moving right + --- 3.33006 (0.567027), N = 16 moving right + + -- best stat: 0.683425, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 7 6 15 13 17 + + + -- linear combo weights (showing up to 5) + + 3.0458 1.3145 0.0144 0.2452 0.7430 + + + -- cutpoint (score) + --- 1.57088 (0.597272), N = 220 moving right + --- 2.05817 (0.638783), N = 189 moving right + --- 2.50513 (0.715583), N = 122 moving right + --- 3.0274 (0.675711), N = 70 moving right + --- 6.12388 (0.519295), N = 7 moving right + + -- best stat: 0.715583, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 11 17 10 0 15 + + + -- linear combo weights (showing up to 5) + + 0.6579 0.7675 -0.7603 -0.8741 0.1091 + + + -- cutpoint (score) + --- 0.609233 (0.606835), N = 224 moving right + --- 1.3074 (0.664488), N = 170 moving right + --- 1.61648 (0.705095), N = 146 moving right + --- 1.61973 (0.707617), N = 143 moving right + --- 2.33731 (0.765501), N = 88 moving right + + -- best stat: 0.765501, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 4.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 3.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.8188e-01 1.8169e-02 + 7.7000e+01 9.7826e-01 2.1859e-02 + 1.4000e+02 9.7101e-01 2.9266e-02 + 1.7900e+02 9.6377e-01 3.6729e-02 + + +------------ Growing tree 446 -------------- + +- N obs inbag: 276 +- N row inbag: 172 +- max nodes: 199 +- max leaves: 100 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 15 6 1 4 14 + + + -- linear combo weights (showing up to 5) + + -0.0579 1.0090 0.1843 0.9124 0.6641 + + + -- cutpoint (score) + --- 0.0394755 (0.620188), N = 177 moving right + --- 0.383727 (0.633149), N = 154 moving right + --- 0.39928 (0.639595), N = 150 moving right + --- 0.838876 (0.657561), N = 81 moving right + --- 0.889687 (0.645264), N = 78 moving right + + -- best stat: 0.657561, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 7 4 10 13 11 + + + -- linear combo weights (showing up to 5) + + 2.3071 0.6843 -0.3079 0.0407 1.0305 + + + -- cutpoint (score) + --- -0.904859 (0.548779), N = 238 moving right + --- -0.724382 (0.594907), N = 216 moving right + --- -0.593976 (0.617217), N = 203 moving right + --- -0.295236 (0.671734), N = 178 moving right + --- 2.26772 (0.613491), N = 25 moving right + + -- best stat: 0.671734, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 12 8 3 5 17 + + + -- linear combo weights (showing up to 5) + + 0.0570 1.7844 6.9298 0.6963 0.3166 + + + -- cutpoint (score) + --- -0.186392 (0.617125), N = 220 moving right + --- 0.0350671 (0.689906), N = 184 moving right + --- 0.296166 (0.695712), N = 155 moving right + --- 2.42163 (0.655253), N = 38 moving right + --- 4.7393 (0.612897), N = 17 moving right + + -- best stat: 0.695712, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 3.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.1000e+01 9.8913e-01 1.0909e-02 + 7.7000e+01 9.8551e-01 1.4572e-02 + 1.4000e+02 9.8188e-01 1.8249e-02 + + +------------ Growing tree 447 -------------- + +- N obs inbag: 276 +- N row inbag: 173 +- max nodes: 227 +- max leaves: 114 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 14 13 6 10 7 + + + -- linear combo weights (showing up to 5) + + 0.4896 0.3964 1.0222 -0.3627 13.1986 + + + -- cutpoint (score) + --- -0.734224 (0.584003), N = 236 moving right + --- -0.485817 (0.628483), N = 194 moving right + --- -0.266279 (0.662092), N = 171 moving right + --- 0.257917 (0.710554), N = 91 moving right + --- 12.8556 (0.58073), N = 13 moving right + + -- best stat: 0.710554, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 1 7 10 2 5 + + + -- linear combo weights (showing up to 5) + + 0.3637 12.9921 -0.4330 -1.0250 0.4711 + + + -- cutpoint (score) + --- -1.0995 (0.643049), N = 171 moving right + --- -0.98678 (0.656197), N = 154 moving right + --- -0.726922 (0.697596), N = 122 moving right + --- -0.522566 (0.690266), N = 98 moving right + --- -0.311126 (0.684103), N = 73 moving right + + -- best stat: 0.697596, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 8 16 0 11 14 + + + -- linear combo weights (showing up to 5) + + 1.2698 0.6144 -0.3519 0.7865 -0.0446 + + + -- cutpoint (score) + --- -2.02709 (0.523388), N = 258 moving right + --- -0.637235 (0.743914), N = 130 moving right + --- -0.439642 (0.757369), N = 124 moving right + --- -0.39624 (0.75312), N = 115 moving right + --- 0.297022 (0.726554), N = 81 moving right + + -- best stat: 0.757369, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 3.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 3.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8551e-01 1.4532e-02 + 7.1000e+01 9.8188e-01 1.8209e-02 + 7.7000e+01 9.7464e-01 2.5589e-02 + 1.1000e+02 9.7101e-01 2.9306e-02 + + +------------ Growing tree 448 -------------- + +- N obs inbag: 276 +- N row inbag: 179 +- max nodes: 201 +- max leaves: 101 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 15 2 17 13 1 + + + -- linear combo weights (showing up to 5) + + 0.0343 -0.6696 0.5262 0.2556 0.4726 + + + -- cutpoint (score) + --- -0.168695 (0.531372), N = 254 moving right + --- -0.0444335 (0.555442), N = 242 moving right + --- 0.990193 (0.707209), N = 117 moving right + --- 1.02177 (0.69086), N = 111 moving right + --- 2.14763 (0.587186), N = 19 moving right + + -- best stat: 0.707209, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 6 17 8 4 15 + + + -- linear combo weights (showing up to 5) + + 0.1771 0.2707 2.0164 0.3580 -0.0243 + + + -- cutpoint (score) + --- -0.245583 (0.652698), N = 191 moving right + --- -0.12324 (0.666512), N = 179 moving right + --- -0.0621456 (0.672465), N = 170 moving right + --- 1.70798 (0.667977), N = 45 moving right + --- 6.17258 (0.565791), N = 11 moving right + + -- best stat: 0.672465, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 6 16 10 15 17 + + + -- linear combo weights (showing up to 5) + + 0.3272 0.4531 -0.6387 -0.0246 0.4532 + + + -- cutpoint (score) + --- -0.104105 (0.530256), N = 262 moving right + --- 0.466397 (0.58), N = 217 moving right + --- 0.66668 (0.613233), N = 190 moving right + --- 0.711299 (0.623326), N = 176 moving right + --- 1.59769 (0.694791), N = 89 moving right + + -- best stat: 0.694791, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 3.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 2.0000e+00 + 3.3400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 1.3100e+02 9.9275e-01 7.2596e-03 + 1.4000e+02 9.8913e-01 1.0909e-02 + 1.8600e+02 9.8188e-01 1.8235e-02 + 1.9100e+02 9.7101e-01 2.9305e-02 + + +------------ Growing tree 449 -------------- + +- N obs inbag: 276 +- N row inbag: 174 +- max nodes: 217 +- max leaves: 109 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 14 7 5 1 15 + + + -- linear combo weights (showing up to 5) + + 0.4737 4.9966 0.6226 0.2217 -0.2687 + + + -- cutpoint (score) + --- -0.803134 (0.510796), N = 266 moving right + --- -0.0182201 (0.612718), N = 172 moving right + --- -0.0132237 (0.615497), N = 170 moving right + --- 0.231697 (0.650233), N = 114 moving right + --- 0.377508 (0.683869), N = 92 moving right + + -- best stat: 0.683869, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 1 10 6 14 11 + + + -- linear combo weights (showing up to 5) + + 0.2207 -0.5284 -0.3216 0.2434 0.8383 + + + -- cutpoint (score) + --- -1.63719 (0.509309), N = 265 moving right + --- -1.2777 (0.527969), N = 252 moving right + --- -0.711899 (0.655383), N = 177 moving right + --- 0.326689 (0.699535), N = 74 moving right + --- 1.14213 (0.626013), N = 34 moving right + + -- best stat: 0.699535, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 5 3 15 6 11 + + + -- linear combo weights (showing up to 5) + + 1.0490 3.4566 -0.1826 0.1208 0.6491 + + + -- cutpoint (score) + --- -0.497285 (0.569988), N = 232 moving right + --- -0.365909 (0.644027), N = 194 moving right + --- -0.138941 (0.704275), N = 140 moving right + --- 0.224298 (0.715609), N = 112 moving right + --- 1.1682 (0.675918), N = 55 moving right + + -- best stat: 0.715609, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 4.0000e+00 + 1.1000e+02 1.0000e+00 3.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.3400e+02 1.0000e+00 1.0000e+00 + 3.4800e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.8188e-01 1.8169e-02 + 1.1000e+02 9.7101e-01 2.9239e-02 + 1.4000e+02 9.6739e-01 3.2970e-02 + 1.7900e+02 9.6377e-01 3.6715e-02 + + +------------ Growing tree 450 -------------- + +- N obs inbag: 276 +- N row inbag: 176 +- max nodes: 241 +- max leaves: 121 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 0 17 7 2 6 + + + -- linear combo weights (showing up to 5) + + 0.0870 0.4686 11.3270 -1.1611 0.7762 + + + -- cutpoint (score) + --- 1.02073 (0.667848), N = 54 moving right + --- 1.02413 (0.675428), N = 51 moving right + --- 1.10774 (0.669738), N = 47 moving right + --- 1.49269 (0.632467), N = 30 moving right + --- 1.87424 (0.62343), N = 25 moving right + + -- best stat: 0.675428, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 7 13 0 9 12 + + + -- linear combo weights (showing up to 5) + + 11.6923 0.0901 0.0136 0.2884 0.1170 + + + -- cutpoint (score) + --- -0.255103 (0.557826), N = 228 moving right + --- -0.233282 (0.567809), N = 222 moving right + --- -0.226026 (0.581512), N = 213 moving right + --- -0.0399666 (0.634889), N = 117 moving right + --- 0.224938 (0.648888), N = 64 moving right + + -- best stat: 0.648888, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 16 11 3 1 6 + + + -- linear combo weights (showing up to 5) + + 0.3639 0.9726 2.4659 0.2503 0.3601 + + + -- cutpoint (score) + --- -0.545287 (0.676157), N = 168 moving right + --- -0.482867 (0.690549), N = 160 moving right + --- -0.432313 (0.708978), N = 148 moving right + --- -0.302898 (0.718586), N = 135 moving right + --- 0.835799 (0.699882), N = 61 moving right + + -- best stat: 0.718586, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.9275e-01 7.2596e-03 + 1.1000e+02 9.8551e-01 1.4559e-02 + 1.4000e+02 9.8188e-01 1.8235e-02 + 1.7900e+02 9.7464e-01 2.5615e-02 + + +------------ Growing tree 451 -------------- + +- N obs inbag: 276 +- N row inbag: 179 +- max nodes: 215 +- max leaves: 108 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 15 13 16 9 6 + + + -- linear combo weights (showing up to 5) + + -0.0011 0.4747 0.9068 0.1234 0.3197 + + + -- cutpoint (score) + --- -0.468423 (0.670078), N = 169 moving right + --- -0.156886 (0.689545), N = 141 moving right + --- 0.414453 (0.703489), N = 93 moving right + --- 0.698871 (0.663575), N = 68 moving right + --- 0.79068 (0.6449), N = 58 moving right + + -- best stat: 0.703489, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 13 12 16 6 1 + + + -- linear combo weights (showing up to 5) + + 0.5722 0.0712 0.8622 0.0728 0.5220 + + + -- cutpoint (score) + --- -0.692552 (0.642211), N = 185 moving right + --- -0.653354 (0.650611), N = 181 moving right + --- 0.580842 (0.691484), N = 80 moving right + --- 0.737094 (0.690087), N = 71 moving right + --- 2.19828 (0.564488), N = 10 moving right + + -- best stat: 0.691484, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 6 9 11 13 12 + + + -- linear combo weights (showing up to 5) + + 0.7423 0.1900 1.0229 0.2235 -0.0474 + + + -- cutpoint (score) + --- -1.06051 (0.55119), N = 254 moving right + --- -0.74529 (0.61226), N = 206 moving right + --- 1.03288 (0.649027), N = 46 moving right + --- 1.77856 (0.565926), N = 25 moving right + --- 1.96433 (0.559381), N = 23 moving right + + -- best stat: 0.649027, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 3.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 3.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 3.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 1.1000e+02 9.8913e-01 1.0909e-02 + 1.3100e+02 9.7826e-01 2.1898e-02 + 1.4000e+02 9.7101e-01 2.9306e-02 + + +------------ Growing tree 452 -------------- + +- N obs inbag: 276 +- N row inbag: 176 +- max nodes: 233 +- max leaves: 117 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 8 3 15 6 12 + + + -- linear combo weights (showing up to 5) + + 1.1950 6.0489 -0.2265 0.1691 0.1597 + + + -- cutpoint (score) + --- -1.05944 (0.527575), N = 263 moving right + --- -0.916283 (0.546538), N = 249 moving right + --- -0.706404 (0.625789), N = 205 moving right + --- -0.615242 (0.65273), N = 184 moving right + --- -0.302815 (0.72873), N = 140 moving right + + -- best stat: 0.72873, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 17 11 3 8 14 + + + -- linear combo weights (showing up to 5) + + 0.1825 0.4889 6.1287 1.2300 -0.3816 + + + -- cutpoint (score) + --- -0.634513 (0.550349), N = 250 moving right + --- -0.377852 (0.613534), N = 218 moving right + --- -0.309133 (0.648358), N = 203 moving right + --- 0.128201 (0.731495), N = 144 moving right + --- 0.880537 (0.711224), N = 93 moving right + + -- best stat: 0.731495, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 7 13 1 8 6 + + + -- linear combo weights (showing up to 5) + + 3.9363 0.2335 0.6553 1.2519 0.4545 + + + -- cutpoint (score) + --- -0.671336 (0.672365), N = 187 moving right + --- -0.665196 (0.677446), N = 184 moving right + --- -0.327083 (0.752326), N = 133 moving right + --- 0.248289 (0.778706), N = 98 moving right + --- 1.16899 (0.675279), N = 50 moving right + + -- best stat: 0.778706, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 3.0000e+00 + 3.0400e+02 1.0000e+00 4.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.7000e+01 9.8913e-01 1.0909e-02 + 1.3100e+02 9.8551e-01 1.4572e-02 + 1.7900e+02 9.8188e-01 1.8249e-02 + + +------------ Growing tree 453 -------------- + +- N obs inbag: 276 +- N row inbag: 170 +- max nodes: 205 +- max leaves: 103 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 8 17 0 1 7 + + + -- linear combo weights (showing up to 5) + + 1.8549 0.3456 -0.5408 0.3040 3.0266 + + + -- cutpoint (score) + --- -0.512061 (0.611676), N = 225 moving right + --- -0.511955 (0.615496), N = 224 moving right + --- -0.256378 (0.660208), N = 196 moving right + --- -0.0323121 (0.68154), N = 175 moving right + --- 0.0431921 (0.696106), N = 164 moving right + + -- best stat: 0.696106, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 3 2 10 14 7 + + + -- linear combo weights (showing up to 5) + + 2.1868 -0.6266 -0.5060 0.1892 5.0831 + + + -- cutpoint (score) + --- -0.839945 (0.600999), N = 197 moving right + --- -0.490488 (0.692655), N = 122 moving right + --- -0.270765 (0.700847), N = 93 moving right + --- -0.213144 (0.675051), N = 86 moving right + --- -0.156805 (0.669068), N = 77 moving right + + -- best stat: 0.700847, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 7 16 11 14 1 + + + -- linear combo weights (showing up to 5) + + 4.8956 0.1711 0.6723 0.2091 0.3081 + + + -- cutpoint (score) + --- -0.837035 (0.568644), N = 239 moving right + --- -0.438889 (0.667342), N = 167 moving right + --- -0.254449 (0.702895), N = 123 moving right + --- 0.040796 (0.713895), N = 99 moving right + --- 2.06159 (0.597409), N = 21 moving right + + -- best stat: 0.713895, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.9275e-01 7.2596e-03 + 7.7000e+01 9.8913e-01 1.0909e-02 + 1.4000e+02 9.8188e-01 1.8235e-02 + 1.7900e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 454 -------------- + +- N obs inbag: 276 +- N row inbag: 178 +- max nodes: 241 +- max leaves: 121 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 5 17 16 10 11 + + + -- linear combo weights (showing up to 5) + + 0.3164 0.3373 0.5055 -0.6724 0.5386 + + + -- cutpoint (score) + --- -0.22442 (0.564474), N = 240 moving right + --- 1.98769 (0.705113), N = 62 moving right + --- 2.05743 (0.697425), N = 60 moving right + --- 2.49187 (0.650752), N = 35 moving right + --- 3.57866 (0.53985), N = 12 moving right + + -- best stat: 0.705113, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 8 0 7 4 10 + + + -- linear combo weights (showing up to 5) + + 1.2201 0.2146 4.2271 0.3960 -0.6565 + + + -- cutpoint (score) + --- -0.574476 (0.657801), N = 184 moving right + --- -0.341789 (0.689812), N = 168 moving right + --- -0.173676 (0.708102), N = 154 moving right + --- -0.0217824 (0.721955), N = 138 moving right + --- 0.156233 (0.73782), N = 113 moving right + + -- best stat: 0.73782, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 14 10 7 8 13 + + + -- linear combo weights (showing up to 5) + + 0.1760 -0.6915 4.6295 1.1422 0.1488 + + + -- cutpoint (score) + --- -1.57203 (0.529041), N = 258 moving right + --- -1.09637 (0.587387), N = 220 moving right + --- -0.635789 (0.666241), N = 171 moving right + --- -0.427397 (0.700808), N = 139 moving right + --- 0.227786 (0.747726), N = 87 moving right + + -- best stat: 0.747726, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 3.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + 3.3400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9275e-01 7.2464e-03 + 7.1000e+01 9.8551e-01 1.4546e-02 + 7.7000e+01 9.8188e-01 1.8222e-02 + 1.1000e+02 9.7464e-01 2.5602e-02 + 1.7900e+02 9.7101e-01 2.9320e-02 + + +------------ Growing tree 455 -------------- + +- N obs inbag: 276 +- N row inbag: 179 +- max nodes: 183 +- max leaves: 92 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 1 13 7 10 11 + + + -- linear combo weights (showing up to 5) + + 0.7277 0.2425 5.6060 -0.6314 0.7444 + + + -- cutpoint (score) + --- -0.984691 (0.634634), N = 194 moving right + --- -0.430854 (0.703806), N = 141 moving right + --- 0.031901 (0.737536), N = 113 moving right + --- 0.499691 (0.746337), N = 76 moving right + --- 1.80616 (0.662964), N = 27 moving right + + -- best stat: 0.746337, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 5 15 10 4 13 + + + -- linear combo weights (showing up to 5) + + 0.9860 0.0322 -0.7918 0.0699 0.2757 + + + -- cutpoint (score) + --- -0.815223 (0.537155), N = 242 moving right + --- -0.0785261 (0.655352), N = 160 moving right + --- 0.597019 (0.649786), N = 85 moving right + --- 1.67485 (0.610395), N = 29 moving right + --- 2.89156 (0.538606), N = 5 moving right + + -- best stat: 0.655352, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 9 13 17 10 4 + + + -- linear combo weights (showing up to 5) + + 0.3499 0.1367 0.6396 -0.7856 -0.3054 + + + -- cutpoint (score) + --- 1.46692 (0.659634), N = 172 moving right + --- 1.53037 (0.650928), N = 158 moving right + --- 1.72192 (0.665105), N = 133 moving right + --- 2.27121 (0.643673), N = 72 moving right + --- 2.50336 (0.652331), N = 50 moving right + + -- best stat: 0.665105, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + 3.3400e+02 1.0000e+00 1.0000e+00 + 4.0000e+02 1.0000e+00 1.0000e+00 + 5.1500e+02 1.0000e+00 1.0000e+00 + 5.3300e+02 0 4.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 1.4000e+02 9.8913e-01 1.0896e-02 + 1.7900e+02 9.8188e-01 1.8222e-02 + 1.9800e+02 9.7464e-01 2.5602e-02 + 2.6400e+02 9.7101e-01 2.9319e-02 + + +------------ Growing tree 456 -------------- + +- N obs inbag: 276 +- N row inbag: 168 +- max nodes: 235 +- max leaves: 118 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 3 10 5 7 0 + + + -- linear combo weights (showing up to 5) + + 2.7159 -0.2456 0.6063 8.5630 0.0849 + + + -- cutpoint (score) + --- 0.0587319 (0.620011), N = 169 moving right + --- 0.392083 (0.653432), N = 87 moving right + --- 0.440614 (0.643597), N = 80 moving right + --- 0.665074 (0.641047), N = 53 moving right + --- 0.786404 (0.631029), N = 40 moving right + + -- best stat: 0.653432, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 13 8 0 9 10 + + + -- linear combo weights (showing up to 5) + + -0.1506 1.6175 -0.0740 -0.0888 -0.4266 + + + -- cutpoint (score) + --- -1.17194 (0.554456), N = 240 moving right + --- -1.15731 (0.567779), N = 234 moving right + --- -0.78056 (0.687628), N = 179 moving right + --- 0.346564 (0.672958), N = 53 moving right + --- 0.978479 (0.638905), N = 40 moving right + + -- best stat: 0.687628, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 14 11 15 3 10 + + + -- linear combo weights (showing up to 5) + + 0.2849 0.3828 0.1254 4.6896 -0.3119 + + + -- cutpoint (score) + --- -0.583684 (0.548641), N = 243 moving right + --- -0.385432 (0.595548), N = 210 moving right + --- -0.0322586 (0.69383), N = 123 moving right + --- 0.719459 (0.653024), N = 44 moving right + --- 0.765586 (0.644128), N = 43 moving right + + -- best stat: 0.69383, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 3.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 3.0000e+00 + 3.3400e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9275e-01 7.2464e-03 + 7.1000e+01 9.8913e-01 1.0896e-02 + 1.1000e+02 9.7826e-01 2.1885e-02 + 1.3100e+02 9.7101e-01 2.9292e-02 + 1.7900e+02 9.6739e-01 3.3024e-02 + + +------------ Growing tree 457 -------------- + +- N obs inbag: 276 +- N row inbag: 177 +- max nodes: 211 +- max leaves: 106 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 14 2 6 9 15 + + + -- linear combo weights (showing up to 5) + + 0.2033 -0.2568 2.7510 0.4566 -0.2322 + + + -- cutpoint (score) + --- -0.614491 (0.584839), N = 229 moving right + --- -0.521034 (0.598168), N = 208 moving right + --- -0.474328 (0.634549), N = 189 moving right + --- -0.25319 (0.670491), N = 133 moving right + --- -0.185809 (0.698757), N = 114 moving right + + -- best stat: 0.698757, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 5 7 6 11 0 + + + -- linear combo weights (showing up to 5) + + 0.0824 4.3506 2.9076 1.1610 0.0026 + + + -- cutpoint (score) + --- -0.0101027 (0.734386), N = 117 moving right + --- 0.0319584 (0.727899), N = 112 moving right + --- 1.09822 (0.71386), N = 70 moving right + --- 1.45594 (0.709729), N = 60 moving right + --- 2.07149 (0.677271), N = 49 moving right + + -- best stat: 0.734386, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 6 11 10 14 2 + + + -- linear combo weights (showing up to 5) + + 2.6207 1.2945 -0.3857 0.0348 0.1342 + + + -- cutpoint (score) + --- -0.53714 (0.659769), N = 176 moving right + --- -0.254381 (0.688535), N = 150 moving right + --- 0.230671 (0.706913), N = 101 moving right + --- 0.497832 (0.709249), N = 86 moving right + --- 1.73057 (0.686741), N = 56 moving right + + -- best stat: 0.709249, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 3.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 7.7000e+01 9.9638e-01 3.6232e-03 + 1.1000e+02 9.8913e-01 1.0896e-02 + 1.3100e+02 9.8188e-01 1.8222e-02 + 1.4000e+02 9.7826e-01 2.1912e-02 + 1.9800e+02 9.7464e-01 2.5616e-02 + + +------------ Growing tree 458 -------------- + +- N obs inbag: 276 +- N row inbag: 184 +- max nodes: 219 +- max leaves: 110 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 15 12 0 7 2 + + + -- linear combo weights (showing up to 5) + + -0.1181 0.1282 -0.2141 7.0093 -0.5907 + + + -- cutpoint (score) + --- -0.9331 (0.519297), N = 258 moving right + --- -0.854081 (0.546323), N = 222 moving right + --- -0.751157 (0.593387), N = 174 moving right + --- -0.655095 (0.612189), N = 130 moving right + --- -0.0719866 (0.592475), N = 34 moving right + + -- best stat: 0.612189, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 11 12 10 9 8 + + + -- linear combo weights (showing up to 5) + + 0.4565 -0.0362 -0.4720 -0.3187 1.8069 + + + -- cutpoint (score) + --- -1.60059 (0.544937), N = 245 moving right + --- -0.895141 (0.700353), N = 155 moving right + --- -0.845836 (0.718548), N = 143 moving right + --- -0.479105 (0.728823), N = 118 moving right + --- -0.401876 (0.723144), N = 107 moving right + + -- best stat: 0.728823, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 7 15 17 3 0 + + + -- linear combo weights (showing up to 5) + + 4.6436 -0.0532 0.4671 3.9445 -0.0984 + + + -- cutpoint (score) + --- 0.472722 (0.517416), N = 267 moving right + --- 1.30754 (0.592076), N = 180 moving right + --- 1.36927 (0.640166), N = 138 moving right + --- 1.37486 (0.644838), N = 136 moving right + --- 1.77226 (0.656917), N = 69 moving right + + -- best stat: 0.656917, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.1000e+01 9.8551e-01 1.4559e-02 + 7.7000e+01 9.8188e-01 1.8235e-02 + 1.1000e+02 9.7464e-01 2.5616e-02 + + +------------ Growing tree 459 -------------- + +- N obs inbag: 276 +- N row inbag: 175 +- max nodes: 173 +- max leaves: 87 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 0 12 7 2 1 + + + -- linear combo weights (showing up to 5) + + 0.1632 0.2111 12.0703 -1.1873 0.4129 + + + -- cutpoint (score) + --- -1.38954 (0.579313), N = 195 moving right + --- -1.22024 (0.640204), N = 160 moving right + --- -1.05937 (0.635365), N = 126 moving right + --- -0.857765 (0.661623), N = 101 moving right + --- 10.8154 (0.577225), N = 10 moving right + + -- best stat: 0.661623, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 4 0 5 8 16 + + + -- linear combo weights (showing up to 5) + + 0.2974 -0.3667 0.4707 2.0504 0.5729 + + + -- cutpoint (score) + --- -1.21964 (0.682305), N = 178 moving right + --- -0.414079 (0.78429), N = 110 moving right + --- 0.168469 (0.753316), N = 82 moving right + --- 2.46808 (0.629569), N = 26 moving right + --- 5.24545 (0.543083), N = 7 moving right + + -- best stat: 0.78429, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 7 2 3 17 12 + + + -- linear combo weights (showing up to 5) + + 10.0201 -1.4666 1.3150 0.6885 0.2220 + + + -- cutpoint (score) + --- 0.489535 (0.671915), N = 188 moving right + --- 0.54768 (0.709545), N = 154 moving right + --- 0.565312 (0.743466), N = 137 moving right + --- 0.569406 (0.751769), N = 133 moving right + --- 1.26567 (0.699253), N = 75 moving right + + -- best stat: 0.751769, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + 3.2600e+02 1.0000e+00 3.0000e+00 + 3.3400e+02 1.0000e+00 2.0000e+00 + 3.4800e+02 1.0000e+00 1.0000e+00 + 3.8800e+02 1.0000e+00 2.0000e+00 + 4.0000e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 1.7900e+02 9.8913e-01 1.0896e-02 + 1.9800e+02 9.8551e-01 1.4559e-02 + 3.0400e+02 9.7826e-01 2.1912e-02 + 3.2100e+02 9.7101e-01 2.9319e-02 + + +------------ Growing tree 460 -------------- + +- N obs inbag: 276 +- N row inbag: 177 +- max nodes: 241 +- max leaves: 121 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 0 17 1 9 8 + + + -- linear combo weights (showing up to 5) + + 0.0497 0.2395 0.4539 -0.2294 1.8229 + + + -- cutpoint (score) + --- -0.420482 (0.559321), N = 236 moving right + --- -0.312835 (0.597064), N = 220 moving right + --- -0.145001 (0.634961), N = 203 moving right + --- 0.305814 (0.721467), N = 137 moving right + --- 0.714959 (0.763679), N = 100 moving right + + -- best stat: 0.763679, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 2 16 10 17 14 + + + -- linear combo weights (showing up to 5) + + -0.6598 0.3282 -0.7790 0.4260 0.2903 + + + -- cutpoint (score) + --- -0.0211941 (0.593654), N = 222 moving right + --- 0.907522 (0.683184), N = 127 moving right + --- 0.967657 (0.693261), N = 120 moving right + --- 2.86803 (0.577605), N = 15 moving right + --- 3.09685 (0.565159), N = 12 moving right + + -- best stat: 0.693261, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 6 1 17 3 10 + + + -- linear combo weights (showing up to 5) + + -0.6012 0.3379 0.3794 6.3481 -0.5350 + + + -- cutpoint (score) + --- 0.427288 (0.569975), N = 230 moving right + --- 1.59516 (0.685978), N = 84 moving right + --- 1.9042 (0.68723), N = 51 moving right + --- 2.46453 (0.636945), N = 24 moving right + --- 2.53837 (0.629373), N = 23 moving right + + -- best stat: 0.68723, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 3.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.1000e+01 9.8551e-01 1.4559e-02 + 7.7000e+01 9.7826e-01 2.1912e-02 + 1.4000e+02 9.7101e-01 2.9319e-02 + + +------------ Growing tree 461 -------------- + +- N obs inbag: 276 +- N row inbag: 178 +- max nodes: 215 +- max leaves: 108 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 16 6 0 4 10 + + + -- linear combo weights (showing up to 5) + + 0.5607 -0.7635 -0.2885 0.4714 -0.6129 + + + -- cutpoint (score) + --- -0.418752 (0.634485), N = 164 moving right + --- -0.408276 (0.637676), N = 163 moving right + --- -0.290434 (0.640325), N = 152 moving right + --- 0.222382 (0.654507), N = 84 moving right + --- 0.308979 (0.653798), N = 80 moving right + + -- best stat: 0.654507, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 9 7 4 0 8 + + + -- linear combo weights (showing up to 5) + + -0.3058 11.5796 0.0126 -0.2862 2.2816 + + + -- cutpoint (score) + --- -1.37437 (0.589142), N = 222 moving right + --- -1.07344 (0.680974), N = 150 moving right + --- -0.984687 (0.706691), N = 139 moving right + --- -0.837914 (0.734264), N = 122 moving right + --- -0.54405 (0.744692), N = 98 moving right + + -- best stat: 0.744692, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 8 6 7 0 1 + + + -- linear combo weights (showing up to 5) + + 1.9769 -0.1786 11.7969 -0.2290 0.4059 + + + -- cutpoint (score) + --- -1.46172 (0.583365), N = 235 moving right + --- -0.816657 (0.717036), N = 135 moving right + --- -0.400728 (0.764965), N = 96 moving right + --- -0.239786 (0.767801), N = 92 moving right + --- 8.97695 (0.578672), N = 12 moving right + + -- best stat: 0.767801, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.7000e+01 9.8913e-01 1.0909e-02 + 1.1000e+02 9.8188e-01 1.8235e-02 + 1.3100e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 462 -------------- + +- N obs inbag: 276 +- N row inbag: 177 +- max nodes: 203 +- max leaves: 102 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 7 13 17 12 16 + + + -- linear combo weights (showing up to 5) + + 16.5460 0.1802 0.6492 0.0805 0.4011 + + + -- cutpoint (score) + --- 0.797122 (0.543297), N = 247 moving right + --- 1.76629 (0.700439), N = 140 moving right + --- 2.02308 (0.715224), N = 107 moving right + --- 2.7028 (0.700419), N = 56 moving right + --- 2.71739 (0.692406), N = 54 moving right + + -- best stat: 0.715224, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 13 6 16 3 9 + + + -- linear combo weights (showing up to 5) + + 0.1968 1.9891 0.4470 8.1939 0.3159 + + + -- cutpoint (score) + --- -0.602541 (0.568596), N = 240 moving right + --- -0.433541 (0.633328), N = 208 moving right + --- -0.37436 (0.659542), N = 194 moving right + --- 0.0293667 (0.749146), N = 125 moving right + --- 2.18975 (0.629708), N = 25 moving right + + -- best stat: 0.749146, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 11 6 15 12 14 + + + -- linear combo weights (showing up to 5) + + 1.1131 1.9486 -0.3600 0.1399 0.0817 + + + -- cutpoint (score) + --- -1.45043 (0.518445), N = 267 moving right + --- -0.763059 (0.656268), N = 190 moving right + --- -0.183634 (0.751037), N = 115 moving right + --- 0.111149 (0.731331), N = 90 moving right + --- 2.97687 (0.542626), N = 14 moving right + + -- best stat: 0.751037, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 3.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 3.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.1000e+01 9.8188e-01 1.8208e-02 + 1.1000e+02 9.7464e-01 2.5589e-02 + 1.3100e+02 9.7101e-01 2.9306e-02 + + +------------ Growing tree 463 -------------- + +- N obs inbag: 276 +- N row inbag: 167 +- max nodes: 213 +- max leaves: 107 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 15 12 8 7 13 + + + -- linear combo weights (showing up to 5) + + -0.1347 0.1699 1.7752 2.2624 -0.0201 + + + -- cutpoint (score) + --- -0.897449 (0.677547), N = 171 moving right + --- -0.888249 (0.673318), N = 166 moving right + --- -0.825817 (0.687069), N = 158 moving right + --- -0.155813 (0.733852), N = 98 moving right + --- 1.30531 (0.673166), N = 39 moving right + + -- best stat: 0.733852, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 15 6 10 9 8 + + + -- linear combo weights (showing up to 5) + + -0.1111 1.6616 -0.6861 -0.3818 2.0284 + + + -- cutpoint (score) + --- -1.66038 (0.540364), N = 239 moving right + --- -1.28211 (0.601505), N = 206 moving right + --- -1.08415 (0.670911), N = 171 moving right + --- -0.557206 (0.730642), N = 128 moving right + --- 0.273595 (0.739774), N = 84 moving right + + -- best stat: 0.739774, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 0 6 4 10 15 + + + -- linear combo weights (showing up to 5) + + -0.0601 1.9285 0.6728 -0.9889 -0.1252 + + + -- cutpoint (score) + --- -0.686035 (0.573743), N = 226 moving right + --- 0.103062 (0.669653), N = 163 moving right + --- 1.283 (0.695202), N = 64 moving right + --- 1.41519 (0.703444), N = 61 moving right + --- 1.43203 (0.706372), N = 60 moving right + + -- best stat: 0.706372, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 3.0000e+00 + 1.8600e+02 1.0000e+00 4.0000e+00 + 2.6400e+02 1.0000e+00 7.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.1000e+01 9.8551e-01 1.4559e-02 + 7.7000e+01 9.8188e-01 1.8235e-02 + 1.1000e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 464 -------------- + +- N obs inbag: 276 +- N row inbag: 172 +- max nodes: 227 +- max leaves: 114 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 1 4 6 8 11 + + + -- linear combo weights (showing up to 5) + + 0.2547 0.4520 0.6031 1.4417 0.5050 + + + -- cutpoint (score) + --- -1.3262 (0.543536), N = 256 moving right + --- -0.99582 (0.629516), N = 201 moving right + --- -0.0650013 (0.748095), N = 114 moving right + --- 0.129597 (0.766824), N = 98 moving right + --- 0.756161 (0.696789), N = 56 moving right + + -- best stat: 0.766824, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 2 13 17 11 7 + + + -- linear combo weights (showing up to 5) + + 0.6334 0.2763 0.4538 0.7729 3.6173 + + + -- cutpoint (score) + --- 0.678019 (0.540668), N = 255 moving right + --- 1.55392 (0.653446), N = 159 moving right + --- 1.58726 (0.676798), N = 148 moving right + --- 2.64487 (0.725107), N = 59 moving right + --- 4.39662 (0.586558), N = 19 moving right + + -- best stat: 0.725107, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 14 15 6 17 9 + + + -- linear combo weights (showing up to 5) + + 0.3167 -0.0999 1.8685 0.6492 0.3835 + + + -- cutpoint (score) + --- 0.640424 (0.523223), N = 265 moving right + --- 1.41223 (0.602911), N = 210 moving right + --- 1.82894 (0.681699), N = 157 moving right + --- 1.94117 (0.694499), N = 144 moving right + --- 2.19455 (0.716246), N = 115 moving right + + -- best stat: 0.716246, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 3.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 3.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 7.1000e+01 9.8551e-01 1.4546e-02 + 7.7000e+01 9.7464e-01 2.5575e-02 + 1.1000e+02 9.7101e-01 2.9293e-02 + 1.8600e+02 9.6014e-01 4.0487e-02 + + +------------ Growing tree 465 -------------- + +- N obs inbag: 276 +- N row inbag: 175 +- max nodes: 253 +- max leaves: 127 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 0 12 10 3 16 + + + -- linear combo weights (showing up to 5) + + 0.1427 0.0275 -0.6357 3.7194 0.6744 + + + -- cutpoint (score) + --- -0.575726 (0.625956), N = 202 moving right + --- -0.555506 (0.634318), N = 197 moving right + --- -0.481739 (0.636144), N = 194 moving right + --- -0.280829 (0.659403), N = 169 moving right + --- 3.85597 (0.589024), N = 22 moving right + + -- best stat: 0.659403, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 4 17 10 14 13 + + + -- linear combo weights (showing up to 5) + + 0.4375 0.2081 -0.7511 0.2407 0.3850 + + + -- cutpoint (score) + --- -0.11395 (0.599363), N = 233 moving right + --- 1.09662 (0.715036), N = 127 moving right + --- 1.28199 (0.695714), N = 107 moving right + --- 1.94208 (0.659931), N = 62 moving right + --- 2.86831 (0.574918), N = 18 moving right + + -- best stat: 0.715036, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 17 1 0 12 4 + + + -- linear combo weights (showing up to 5) + + 0.3679 0.3815 -0.1132 0.1339 0.6449 + + + -- cutpoint (score) + --- 0.248021 (0.524106), N = 263 moving right + --- 0.661046 (0.593695), N = 231 moving right + --- 0.912237 (0.64396), N = 203 moving right + --- 1.64338 (0.68722), N = 111 moving right + --- 1.7908 (0.695337), N = 95 moving right + + -- best stat: 0.695337, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 3.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.8913e-01 1.0870e-02 + 7.7000e+01 9.8188e-01 1.8196e-02 + 1.1000e+02 9.7464e-01 2.5576e-02 + 1.4000e+02 9.7101e-01 2.9293e-02 + 1.7900e+02 9.6377e-01 3.6756e-02 + + +------------ Growing tree 466 -------------- + +- N obs inbag: 276 +- N row inbag: 173 +- max nodes: 217 +- max leaves: 109 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 0 6 12 17 13 + + + -- linear combo weights (showing up to 5) + + -0.0569 1.0614 -0.0438 0.7813 0.6338 + + + -- cutpoint (score) + --- 2.15572 (0.717676), N = 157 moving right + --- 2.25329 (0.706257), N = 143 moving right + --- 3.1484 (0.654693), N = 59 moving right + --- 3.46456 (0.633956), N = 44 moving right + --- 4.52895 (0.529737), N = 10 moving right + + -- best stat: 0.717676, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 17 7 16 1 9 + + + -- linear combo weights (showing up to 5) + + 0.5975 6.9908 0.4011 0.3080 0.3586 + + + -- cutpoint (score) + --- 0.817825 (0.562289), N = 246 moving right + --- 1.51079 (0.702074), N = 155 moving right + --- 1.79164 (0.72063), N = 130 moving right + --- 2.77796 (0.668689), N = 51 moving right + --- 4.07748 (0.613358), N = 22 moving right + + -- best stat: 0.72063, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 14 4 13 12 8 + + + -- linear combo weights (showing up to 5) + + 0.0930 0.5309 0.2101 -0.1115 1.3699 + + + -- cutpoint (score) + --- -1.02088 (0.537112), N = 259 moving right + --- -0.756694 (0.64593), N = 201 moving right + --- -0.499709 (0.711074), N = 163 moving right + --- 0.188795 (0.725566), N = 87 moving right + --- 0.58429 (0.699615), N = 62 moving right + + -- best stat: 0.725566, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 4.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 5.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.1000e+01 9.7464e-01 2.5548e-02 + 7.7000e+01 9.7101e-01 2.9265e-02 + 1.1000e+02 9.6739e-01 3.2997e-02 + + +------------ Growing tree 467 -------------- + +- N obs inbag: 276 +- N row inbag: 175 +- max nodes: 241 +- max leaves: 121 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 17 1 8 5 0 + + + -- linear combo weights (showing up to 5) + + 0.3685 0.4539 1.4355 0.5630 -0.0920 + + + -- cutpoint (score) + --- 0.0221543 (0.609924), N = 221 moving right + --- 0.537524 (0.703174), N = 172 moving right + --- 0.544448 (0.705412), N = 171 moving right + --- 2.9561 (0.66291), N = 36 moving right + --- 4.01212 (0.622384), N = 25 moving right + + -- best stat: 0.705412, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 10 4 12 13 2 + + + -- linear combo weights (showing up to 5) + + -0.9712 0.8730 -0.1673 0.4511 -1.3511 + + + -- cutpoint (score) + --- -2.40648 (0.535384), N = 255 moving right + --- -2.0041 (0.581031), N = 233 moving right + --- -0.15034 (0.743094), N = 91 moving right + --- 0.419521 (0.695774), N = 53 moving right + --- 0.57852 (0.672164), N = 48 moving right + + -- best stat: 0.743094, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 3 5 2 16 13 + + + -- linear combo weights (showing up to 5) + + 5.8655 1.0678 -1.0674 0.5758 0.5027 + + + -- cutpoint (score) + --- -1.77894 (0.561716), N = 244 moving right + --- -1.74437 (0.571213), N = 239 moving right + --- -1.36448 (0.651821), N = 198 moving right + --- -0.023488 (0.721823), N = 95 moving right + --- 0.266829 (0.705089), N = 75 moving right + + -- best stat: 0.721823, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.1000e+01 9.8188e-01 1.8222e-02 + 7.7000e+01 9.7826e-01 2.1912e-02 + 1.3100e+02 9.7101e-01 2.9319e-02 + + +------------ Growing tree 468 -------------- + +- N obs inbag: 276 +- N row inbag: 173 +- max nodes: 239 +- max leaves: 120 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 17 10 7 16 11 + + + -- linear combo weights (showing up to 5) + + 0.1695 -0.3123 5.1973 0.2026 1.2547 + + + -- cutpoint (score) + --- -1.03223 (0.519166), N = 264 moving right + --- -0.562856 (0.610005), N = 213 moving right + --- -0.422942 (0.622585), N = 201 moving right + --- 0.206764 (0.722139), N = 127 moving right + --- 1.27224 (0.714114), N = 63 moving right + + -- best stat: 0.722139, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 0 14 9 6 13 + + + -- linear combo weights (showing up to 5) + + -0.4420 0.3210 0.1619 1.0592 0.3303 + + + -- cutpoint (score) + --- -0.778136 (0.570353), N = 234 moving right + --- -0.451978 (0.626627), N = 176 moving right + --- -0.0643766 (0.647685), N = 120 moving right + --- 0.63139 (0.57331), N = 41 moving right + --- 1.40348 (0.5307), N = 9 moving right + + -- best stat: 0.647685, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 1 14 12 0 7 + + + -- linear combo weights (showing up to 5) + + 0.5239 0.5637 0.0238 -0.4856 7.3184 + + + -- cutpoint (score) + --- -0.899105 (0.570353), N = 228 moving right + --- -0.555088 (0.624951), N = 177 moving right + --- -0.256935 (0.624458), N = 148 moving right + --- -0.163648 (0.646285), N = 139 moving right + --- -0.0302861 (0.647311), N = 119 moving right + + -- best stat: 0.647311, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 3.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.7000e+01 9.9275e-01 7.2596e-03 + 1.1000e+02 9.8913e-01 1.0909e-02 + 1.3100e+02 9.8188e-01 1.8235e-02 + 1.7900e+02 9.7464e-01 2.5615e-02 + + +------------ Growing tree 469 -------------- + +- N obs inbag: 276 +- N row inbag: 168 +- max nodes: 217 +- max leaves: 109 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 7 8 14 11 16 + + + -- linear combo weights (showing up to 5) + + 4.3551 1.8068 0.1795 0.1544 0.4264 + + + -- cutpoint (score) + --- -1.58605 (0.531717), N = 257 moving right + --- -0.849708 (0.711839), N = 146 moving right + --- 0.0829573 (0.727414), N = 91 moving right + --- 0.408783 (0.715659), N = 71 moving right + --- 3.95046 (0.63157), N = 23 moving right + + -- best stat: 0.727414, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 4 9 12 7 3 + + + -- linear combo weights (showing up to 5) + + 0.7131 0.5467 -0.0659 3.0508 6.5424 + + + -- cutpoint (score) + --- -0.23178 (0.57225), N = 232 moving right + --- -0.0495306 (0.636461), N = 187 moving right + --- 0.568189 (0.69471), N = 97 moving right + --- 0.682301 (0.69872), N = 72 moving right + --- 1.40509 (0.632767), N = 31 moving right + + -- best stat: 0.69872, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 2 12 4 0 8 + + + -- linear combo weights (showing up to 5) + + -0.4718 -0.0543 0.4735 -0.4398 2.2353 + + + -- cutpoint (score) + --- -1.55348 (0.625378), N = 189 moving right + --- -0.66182 (0.683417), N = 100 moving right + --- 0.291129 (0.714106), N = 57 moving right + --- 1.39301 (0.654303), N = 37 moving right + --- 3.48598 (0.587531), N = 14 moving right + + -- best stat: 0.714106, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 3.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.8913e-01 1.0870e-02 + 7.1000e+01 9.8551e-01 1.4533e-02 + 7.7000e+01 9.8188e-01 1.8209e-02 + 1.1000e+02 9.7826e-01 2.1899e-02 + 1.7900e+02 9.7464e-01 2.5603e-02 + + +------------ Growing tree 470 -------------- + +- N obs inbag: 276 +- N row inbag: 179 +- max nodes: 217 +- max leaves: 109 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 2 17 16 14 3 + + + -- linear combo weights (showing up to 5) + + -0.2390 0.3893 0.3127 0.2354 9.4460 + + + -- cutpoint (score) + --- 0.228758 (0.551606), N = 251 moving right + --- 0.39306 (0.58574), N = 224 moving right + --- 0.648351 (0.645062), N = 179 moving right + --- 0.711083 (0.649263), N = 169 moving right + --- 0.748592 (0.641992), N = 162 moving right + + -- best stat: 0.649263, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 17 3 10 4 7 + + + -- linear combo weights (showing up to 5) + + 0.3025 8.4149 -0.2439 0.5232 3.3055 + + + -- cutpoint (score) + --- 0.375223 (0.523975), N = 255 moving right + --- 0.851319 (0.631913), N = 175 moving right + --- 1.52515 (0.661099), N = 81 moving right + --- 1.72519 (0.652636), N = 63 moving right + --- 1.76135 (0.641891), N = 53 moving right + + -- best stat: 0.661099, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 17 16 13 10 2 + + + -- linear combo weights (showing up to 5) + + 0.4648 0.4338 0.4527 -0.6548 -0.4346 + + + -- cutpoint (score) + --- -0.295414 (0.561159), N = 241 moving right + --- 0.453195 (0.653262), N = 169 moving right + --- 1.96144 (0.675439), N = 52 moving right + --- 2.12849 (0.65514), N = 40 moving right + --- 2.20984 (0.646738), N = 38 moving right + + -- best stat: 0.675439, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 3.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 3.0000e+00 + 2.6400e+02 1.0000e+00 3.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.9275e-01 7.2596e-03 + 7.7000e+01 9.8913e-01 1.0909e-02 + 1.1000e+02 9.7826e-01 2.1898e-02 + 1.8600e+02 9.7464e-01 2.5602e-02 + + +------------ Growing tree 471 -------------- + +- N obs inbag: 276 +- N row inbag: 167 +- max nodes: 219 +- max leaves: 110 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 6 15 12 9 4 + + + -- linear combo weights (showing up to 5) + + 1.6289 0.0051 0.0697 0.2451 1.1454 + + + -- cutpoint (score) + --- -0.0823693 (0.568918), N = 212 moving right + --- -0.0634397 (0.574492), N = 205 moving right + --- 0.203746 (0.656639), N = 155 moving right + --- 0.972086 (0.611559), N = 127 moving right + --- 2.60663 (0.566546), N = 18 moving right + + -- best stat: 0.656639, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 5 2 9 15 6 + + + -- linear combo weights (showing up to 5) + + 1.3058 -0.4044 0.3094 -0.0433 1.8657 + + + -- cutpoint (score) + --- -0.602864 (0.549311), N = 255 moving right + --- -0.527552 (0.593652), N = 217 moving right + --- -0.442488 (0.638553), N = 176 moving right + --- -0.265754 (0.66886), N = 133 moving right + --- 0.790406 (0.58772), N = 70 moving right + + -- best stat: 0.66886, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 16 7 4 2 0 + + + -- linear combo weights (showing up to 5) + + 0.5917 2.2887 1.0702 -0.0069 -0.7578 + + + -- cutpoint (score) + --- -1.13767 (0.546938), N = 254 moving right + --- -0.844256 (0.568538), N = 241 moving right + --- -0.492164 (0.60171), N = 210 moving right + --- 0.514291 (0.71826), N = 101 moving right + --- 0.983746 (0.705099), N = 66 moving right + + -- best stat: 0.71826, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 3.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.1000e+01 9.8551e-01 1.4559e-02 + 1.1000e+02 9.8188e-01 1.8235e-02 + 1.3100e+02 9.7101e-01 2.9306e-02 + + +------------ Growing tree 472 -------------- + +- N obs inbag: 276 +- N row inbag: 170 +- max nodes: 233 +- max leaves: 117 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 4 17 9 8 2 + + + -- linear combo weights (showing up to 5) + + 0.0982 0.3045 -0.5046 1.9729 -1.0348 + + + -- cutpoint (score) + --- -1.55776 (0.527539), N = 259 moving right + --- -0.900969 (0.663498), N = 175 moving right + --- -0.306467 (0.745905), N = 124 moving right + --- 0.0381364 (0.769076), N = 108 moving right + --- 0.19522 (0.767196), N = 96 moving right + + -- best stat: 0.769076, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 9 17 13 12 10 + + + -- linear combo weights (showing up to 5) + + -0.3285 0.3950 0.6549 -0.1107 -0.6546 + + + -- cutpoint (score) + --- 0.148859 (0.573046), N = 231 moving right + --- 1.13922 (0.668387), N = 136 moving right + --- 1.72758 (0.685186), N = 83 moving right + --- 2.00969 (0.64018), N = 63 moving right + --- 3.44942 (0.530568), N = 6 moving right + + -- best stat: 0.685186, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 1 8 6 17 7 + + + -- linear combo weights (showing up to 5) + + 0.3440 1.5559 0.8180 0.2988 3.3462 + + + -- cutpoint (score) + --- -0.665833 (0.525198), N = 261 moving right + --- -0.537022 (0.539031), N = 256 moving right + --- -0.249408 (0.560656), N = 240 moving right + --- -0.239173 (0.562599), N = 238 moving right + --- 9.07165 (0.530735), N = 5 moving right + + -- best stat: 0.562599, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 3.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.8913e-01 1.0870e-02 + 7.7000e+01 9.8551e-01 1.4533e-02 + 1.3100e+02 9.8188e-01 1.8209e-02 + 1.4000e+02 9.7464e-01 2.5589e-02 + 1.8600e+02 9.7101e-01 2.9307e-02 + + +------------ Growing tree 473 -------------- + +- N obs inbag: 276 +- N row inbag: 172 +- max nodes: 225 +- max leaves: 113 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 1 11 3 12 7 + + + -- linear combo weights (showing up to 5) + + 0.4756 0.8676 6.3421 0.2308 2.9021 + + + -- cutpoint (score) + --- -0.529029 (0.684528), N = 184 moving right + --- -0.464393 (0.70609), N = 171 moving right + --- 0.537338 (0.725239), N = 86 moving right + --- 1.4539 (0.657412), N = 44 moving right + --- 10.0864 (0.550228), N = 10 moving right + + -- best stat: 0.725239, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 15 10 8 17 6 + + + -- linear combo weights (showing up to 5) + + -0.1333 -0.4635 1.8540 0.2422 1.8272 + + + -- cutpoint (score) + --- -0.598663 (0.623136), N = 205 moving right + --- -0.541415 (0.639048), N = 198 moving right + --- -0.0310273 (0.708072), N = 158 moving right + --- 0.676992 (0.762832), N = 106 moving right + --- 2.76981 (0.678053), N = 39 moving right + + -- best stat: 0.762832, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 12 4 7 13 14 + + + -- linear combo weights (showing up to 5) + + 0.1449 0.5946 4.2241 0.4490 0.4391 + + + -- cutpoint (score) + --- -0.803788 (0.53304), N = 253 moving right + --- -0.661187 (0.556506), N = 236 moving right + --- -0.449447 (0.599003), N = 212 moving right + --- 0.412306 (0.686038), N = 118 moving right + --- 1.56487 (0.61982), N = 35 moving right + + -- best stat: 0.686038, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 3.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8551e-01 1.4546e-02 + 7.1000e+01 9.7464e-01 2.5575e-02 + 7.7000e+01 9.7101e-01 2.9293e-02 + 1.4000e+02 9.6739e-01 3.3024e-02 + + +------------ Growing tree 474 -------------- + +- N obs inbag: 276 +- N row inbag: 175 +- max nodes: 237 +- max leaves: 119 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 8 2 3 13 5 + + + -- linear combo weights (showing up to 5) + + 1.1139 -0.9142 9.4864 0.1817 0.4654 + + + -- cutpoint (score) + --- -1.68311 (0.571287), N = 241 moving right + --- -1.25675 (0.709504), N = 173 moving right + --- -1.17477 (0.715039), N = 166 moving right + --- -0.550573 (0.74468), N = 104 moving right + --- -0.393462 (0.719359), N = 84 moving right + + -- best stat: 0.74468, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 12 10 7 15 14 + + + -- linear combo weights (showing up to 5) + + 0.1170 -0.3890 5.0249 -0.1563 0.4175 + + + -- cutpoint (score) + --- -1.34206 (0.499158), N = 269 moving right + --- -0.87554 (0.531791), N = 256 moving right + --- -0.308147 (0.602199), N = 191 moving right + --- 0.305061 (0.648222), N = 81 moving right + --- 0.523242 (0.638535), N = 56 moving right + + -- best stat: 0.648222, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 16 3 12 15 4 + + + -- linear combo weights (showing up to 5) + + 0.3043 10.2174 0.0854 0.0187 0.8942 + + + -- cutpoint (score) + --- -0.255806 (0.549314), N = 249 moving right + --- -0.0619037 (0.636908), N = 196 moving right + --- -0.00421503 (0.632139), N = 192 moving right + --- 0.407601 (0.657965), N = 153 moving right + --- 1.00279 (0.655216), N = 67 moving right + + -- best stat: 0.657965, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.7000e+01 9.8913e-01 1.0909e-02 + 1.1000e+02 9.8551e-01 1.4572e-02 + 1.3100e+02 9.8188e-01 1.8249e-02 + + +------------ Growing tree 475 -------------- + +- N obs inbag: 276 +- N row inbag: 174 +- max nodes: 227 +- max leaves: 114 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 3 2 12 1 17 + + + -- linear combo weights (showing up to 5) + + 2.4587 -0.5955 0.2010 0.0382 0.6575 + + + -- cutpoint (score) + --- 1.29325 (0.668261), N = 156 moving right + --- 1.2964 (0.670865), N = 155 moving right + --- 1.37919 (0.674274), N = 127 moving right + --- 1.98535 (0.641164), N = 65 moving right + --- 2.04493 (0.620247), N = 46 moving right + + -- best stat: 0.674274, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 2 16 1 17 8 + + + -- linear combo weights (showing up to 5) + + -0.3533 0.3047 0.1484 0.4257 1.5737 + + + -- cutpoint (score) + --- -0.377223 (0.595669), N = 228 moving right + --- 0.212537 (0.707215), N = 146 moving right + --- 0.709356 (0.744919), N = 106 moving right + --- 1.09518 (0.747057), N = 83 moving right + --- 1.55227 (0.73444), N = 59 moving right + + -- best stat: 0.747057, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 0 17 12 6 2 + + + -- linear combo weights (showing up to 5) + + 0.1274 0.6693 0.1566 1.5068 -0.7191 + + + -- cutpoint (score) + --- 0.627836 (0.577039), N = 230 moving right + --- 0.643469 (0.584237), N = 227 moving right + --- 1.34486 (0.677725), N = 156 moving right + --- 2.07037 (0.624248), N = 52 moving right + --- 3.54871 (0.532264), N = 9 moving right + + -- best stat: 0.677725, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 3.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 5.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.8551e-01 1.4532e-02 + 7.7000e+01 9.8188e-01 1.8209e-02 + 1.8600e+02 9.6377e-01 3.6659e-02 + 1.9800e+02 9.5652e-01 4.4178e-02 + + +------------ Growing tree 476 -------------- + +- N obs inbag: 276 +- N row inbag: 179 +- max nodes: 213 +- max leaves: 107 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 16 6 13 0 5 + + + -- linear combo weights (showing up to 5) + + 0.7336 1.2303 0.4638 -0.2590 1.3278 + + + -- cutpoint (score) + --- -0.514933 (0.652339), N = 201 moving right + --- -0.174478 (0.674824), N = 166 moving right + --- 1.77185 (0.648143), N = 35 moving right + --- 3.43962 (0.546055), N = 10 moving right + --- 3.74931 (0.519454), N = 5 moving right + + -- best stat: 0.674824, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 15 7 5 17 9 + + + -- linear combo weights (showing up to 5) + + -0.1241 8.0343 0.7337 0.5136 0.1973 + + + -- cutpoint (score) + --- 0.996869 (0.593395), N = 231 moving right + --- 1.89165 (0.690564), N = 142 moving right + --- 2.18183 (0.700723), N = 90 moving right + --- 2.36463 (0.696627), N = 70 moving right + --- 10.343 (0.560911), N = 12 moving right + + -- best stat: 0.700723, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 11 8 14 9 3 + + + -- linear combo weights (showing up to 5) + + 0.9564 1.6689 -0.2220 -0.3488 3.4413 + + + -- cutpoint (score) + --- -1.76373 (0.524915), N = 264 moving right + --- -1.58961 (0.554527), N = 248 moving right + --- -1.57536 (0.559205), N = 243 moving right + --- -1.27013 (0.642361), N = 204 moving right + --- -0.626664 (0.751998), N = 121 moving right + + -- best stat: 0.751998, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 3.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 3.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.1000e+01 9.8551e-01 1.4559e-02 + 7.7000e+01 9.7464e-01 2.5588e-02 + 1.1000e+02 9.7101e-01 2.9306e-02 + + +------------ Growing tree 477 -------------- + +- N obs inbag: 276 +- N row inbag: 182 +- max nodes: 203 +- max leaves: 102 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 12 3 6 1 8 + + + -- linear combo weights (showing up to 5) + + 0.0223 5.2863 0.1960 0.3357 1.3943 + + + -- cutpoint (score) + --- -0.711666 (0.645305), N = 187 moving right + --- -0.438493 (0.725874), N = 135 moving right + --- -0.0676393 (0.777712), N = 87 moving right + --- 0.474331 (0.736062), N = 64 moving right + --- 8.74525 (0.563086), N = 10 moving right + + -- best stat: 0.777712, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 1 7 4 5 9 + + + -- linear combo weights (showing up to 5) + + 0.4858 9.4309 0.6285 0.5026 0.6099 + + + -- cutpoint (score) + --- -0.210567 (0.604899), N = 217 moving right + --- -0.141851 (0.626212), N = 207 moving right + --- -0.0695428 (0.644062), N = 200 moving right + --- 0.52902 (0.720311), N = 133 moving right + --- 1.90638 (0.623625), N = 29 moving right + + -- best stat: 0.720311, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 11 6 2 9 8 + + + -- linear combo weights (showing up to 5) + + 0.8741 0.3400 0.7193 -0.3836 1.4447 + + + -- cutpoint (score) + --- -0.660942 (0.57957), N = 236 moving right + --- -0.302915 (0.676441), N = 179 moving right + --- -0.0531421 (0.703929), N = 137 moving right + --- 2.45025 (0.661056), N = 35 moving right + --- 3.19657 (0.644083), N = 30 moving right + + -- best stat: 0.703929, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 7.1000e+01 9.8913e-01 1.0909e-02 + 7.7000e+01 9.8551e-01 1.4572e-02 + 1.3100e+02 9.8188e-01 1.8249e-02 + + +------------ Growing tree 478 -------------- + +- N obs inbag: 276 +- N row inbag: 166 +- max nodes: 231 +- max leaves: 116 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 4 1 0 16 6 + + + -- linear combo weights (showing up to 5) + + 1.0136 0.2375 -0.1713 0.2853 0.3024 + + + -- cutpoint (score) + --- -0.437182 (0.545783), N = 248 moving right + --- -0.285949 (0.577668), N = 225 moving right + --- -0.0990832 (0.601214), N = 209 moving right + --- 0.498241 (0.667784), N = 139 moving right + --- 1.39049 (0.582982), N = 23 moving right + + -- best stat: 0.667784, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 3 14 17 0 8 + + + -- linear combo weights (showing up to 5) + + 4.7443 0.2797 0.4874 -0.2628 1.4877 + + + -- cutpoint (score) + --- 0.289886 (0.651739), N = 210 moving right + --- 1.03812 (0.73603), N = 117 moving right + --- 1.14065 (0.752545), N = 98 moving right + --- 4.26491 (0.660242), N = 32 moving right + --- 7.88171 (0.562503), N = 10 moving right + + -- best stat: 0.752545, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 1 0 8 14 13 + + + -- linear combo weights (showing up to 5) + + 0.4305 -0.1649 1.8351 0.3116 -0.0492 + + + -- cutpoint (score) + --- -1.52914 (0.559641), N = 245 moving right + --- -1.21478 (0.611066), N = 203 moving right + --- -1.07996 (0.640968), N = 184 moving right + --- 0.0851984 (0.739668), N = 63 moving right + --- 6.8308 (0.528512), N = 5 moving right + + -- best stat: 0.739668, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 3.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 3.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 3.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.8551e-01 1.4559e-02 + 1.1000e+02 9.7464e-01 2.5588e-02 + 1.3100e+02 9.7101e-01 2.9306e-02 + + +------------ Growing tree 479 -------------- + +- N obs inbag: 276 +- N row inbag: 178 +- max nodes: 229 +- max leaves: 115 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 4 16 9 6 0 + + + -- linear combo weights (showing up to 5) + + 0.5780 0.5747 0.4480 0.1069 -0.1070 + + + -- cutpoint (score) + --- -0.702123 (0.544752), N = 253 moving right + --- -0.535563 (0.572622), N = 231 moving right + --- 0.152951 (0.715425), N = 138 moving right + --- 0.62506 (0.678169), N = 69 moving right + --- 0.70671 (0.672275), N = 66 moving right + + -- best stat: 0.715425, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 15 3 12 14 13 + + + -- linear combo weights (showing up to 5) + + -0.0689 9.1981 0.0572 0.0606 0.5679 + + + -- cutpoint (score) + --- -0.657219 (0.548682), N = 250 moving right + --- -0.595194 (0.571649), N = 240 moving right + --- -0.215568 (0.665141), N = 174 moving right + --- -0.137109 (0.681565), N = 157 moving right + --- 0.372662 (0.67155), N = 68 moving right + + -- best stat: 0.681565, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 15 14 10 7 11 + + + -- linear combo weights (showing up to 5) + + -0.0954 0.3184 -0.6607 4.2054 0.6271 + + + -- cutpoint (score) + --- -0.276722 (0.687154), N = 172 moving right + --- 0.0314515 (0.721186), N = 136 moving right + --- 0.340114 (0.74877), N = 102 moving right + --- 1.01521 (0.696692), N = 64 moving right + --- 2.74866 (0.610221), N = 22 moving right + + -- best stat: 0.74877, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.8551e-01 1.4559e-02 + 1.1000e+02 9.7826e-01 2.1912e-02 + 1.3100e+02 9.7101e-01 2.9319e-02 + + +------------ Growing tree 480 -------------- + +- N obs inbag: 276 +- N row inbag: 181 +- max nodes: 229 +- max leaves: 115 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 11 0 7 12 8 + + + -- linear combo weights (showing up to 5) + + 0.4908 -0.3239 4.8329 -0.0382 1.5165 + + + -- cutpoint (score) + --- -1.64285 (0.515846), N = 269 moving right + --- -1.41724 (0.592381), N = 228 moving right + --- -1.1224 (0.680224), N = 175 moving right + --- -1.10392 (0.686237), N = 172 moving right + --- -0.344616 (0.762093), N = 104 moving right + + -- best stat: 0.762093, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 10 12 14 11 7 + + + -- linear combo weights (showing up to 5) + + -0.6647 -0.0630 0.3581 0.7189 5.7820 + + + -- cutpoint (score) + --- -1.34557 (0.545638), N = 247 moving right + --- -0.908346 (0.60365), N = 218 moving right + --- -0.114034 (0.704217), N = 137 moving right + --- -0.0112978 (0.72431), N = 124 moving right + --- 0.306134 (0.741728), N = 94 moving right + + -- best stat: 0.741728, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 12 13 7 3 17 + + + -- linear combo weights (showing up to 5) + + 0.1215 0.2824 3.8427 12.5458 0.4604 + + + -- cutpoint (score) + --- 1.04738 (0.635556), N = 194 moving right + --- 1.04929 (0.632298), N = 193 moving right + --- 1.21625 (0.678944), N = 160 moving right + --- 1.65957 (0.696575), N = 96 moving right + --- 14.3744 (0.581268), N = 13 moving right + + -- best stat: 0.696575, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 3.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 3.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.8913e-01 1.0870e-02 + 5.1000e+01 9.8551e-01 1.4533e-02 + 7.1000e+01 9.7826e-01 2.1886e-02 + 7.7000e+01 9.6739e-01 3.2997e-02 + 1.1000e+02 9.6377e-01 3.6742e-02 + + +------------ Growing tree 481 -------------- + +- N obs inbag: 276 +- N row inbag: 174 +- max nodes: 223 +- max leaves: 112 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 15 14 17 11 10 + + + -- linear combo weights (showing up to 5) + + 0.0404 0.1195 0.7251 1.0084 -0.5817 + + + -- cutpoint (score) + --- 1.75648 (0.710413), N = 157 moving right + --- 2.44764 (0.767772), N = 94 moving right + --- 2.45436 (0.771621), N = 92 moving right + --- 2.84845 (0.736682), N = 73 moving right + --- 3.42747 (0.695689), N = 51 moving right + + -- best stat: 0.771621, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 5 7 3 16 8 + + + -- linear combo weights (showing up to 5) + + 0.5725 0.9853 0.5332 0.5924 1.7980 + + + -- cutpoint (score) + --- -1.40229 (0.561381), N = 240 moving right + --- -0.367158 (0.765005), N = 107 moving right + --- 0.324748 (0.737914), N = 76 moving right + --- 1.78376 (0.660036), N = 35 moving right + --- 6.1612 (0.551673), N = 8 moving right + + -- best stat: 0.765005, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 5 9 17 4 2 + + + -- linear combo weights (showing up to 5) + + 0.8173 0.2320 0.7124 0.3865 -1.0340 + + + -- cutpoint (score) + --- 0.286805 (0.537144), N = 259 moving right + --- 1.443 (0.697808), N = 153 moving right + --- 2.16333 (0.688684), N = 80 moving right + --- 2.8759 (0.611282), N = 40 moving right + --- 3.07948 (0.535523), N = 12 moving right + + -- best stat: 0.697808, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 3.0000e+00 + 3.3400e+02 1.0000e+00 1.0000e+00 + 3.8800e+02 1.0000e+00 2.0000e+00 + 4.0000e+02 1.0000e+00 1.0000e+00 + 4.6000e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.8551e-01 1.4559e-02 + 1.4000e+02 9.8188e-01 1.8235e-02 + 2.1600e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 482 -------------- + +- N obs inbag: 276 +- N row inbag: 176 +- max nodes: 215 +- max leaves: 108 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 12 2 14 10 1 + + + -- linear combo weights (showing up to 5) + + -0.0074 -0.6809 0.4612 -0.7609 0.3982 + + + -- cutpoint (score) + --- -1.82789 (0.553537), N = 241 moving right + --- -0.631473 (0.681578), N = 137 moving right + --- -0.583545 (0.687162), N = 131 moving right + --- 0.313363 (0.648649), N = 51 moving right + --- 1.07461 (0.564289), N = 19 moving right + + -- best stat: 0.687162, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 15 6 0 2 4 + + + -- linear combo weights (showing up to 5) + + -0.2149 0.8210 0.0096 -0.4940 0.7567 + + + -- cutpoint (score) + --- -0.482649 (0.59839), N = 206 moving right + --- 0.331685 (0.636129), N = 79 moving right + --- 0.405517 (0.616514), N = 67 moving right + --- 0.596683 (0.58587), N = 42 moving right + --- 1.00962 (0.555882), N = 21 moving right + + -- best stat: 0.636129, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 12 11 2 7 10 + + + -- linear combo weights (showing up to 5) + + -0.2204 1.0742 -0.3244 10.3892 -0.6069 + + + -- cutpoint (score) + --- -1.49445 (0.561208), N = 237 moving right + --- -1.22832 (0.602762), N = 213 moving right + --- 0.00578611 (0.725238), N = 95 moving right + --- 0.100054 (0.728478), N = 92 moving right + --- 1.68484 (0.632631), N = 28 moving right + + -- best stat: 0.728478, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 3.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.8913e-01 1.0870e-02 + 7.1000e+01 9.8551e-01 1.4533e-02 + 7.7000e+01 9.7826e-01 2.1886e-02 + 1.1000e+02 9.7464e-01 2.5589e-02 + 1.3100e+02 9.7101e-01 2.9307e-02 + + +------------ Growing tree 483 -------------- + +- N obs inbag: 276 +- N row inbag: 169 +- max nodes: 231 +- max leaves: 116 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 10 15 0 9 7 + + + -- linear combo weights (showing up to 5) + + -0.7672 -0.0879 -0.3006 0.3436 10.7156 + + + -- cutpoint (score) + --- -0.995925 (0.576396), N = 236 moving right + --- -0.576302 (0.626423), N = 189 moving right + --- -0.356012 (0.664621), N = 161 moving right + --- 0.261278 (0.700004), N = 82 moving right + --- 1.20289 (0.630402), N = 37 moving right + + -- best stat: 0.700004, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 11 17 14 13 7 + + + -- linear combo weights (showing up to 5) + + 0.9262 0.5106 0.2205 0.3277 10.7650 + + + -- cutpoint (score) + --- 0.351845 (0.576904), N = 234 moving right + --- 0.407023 (0.588458), N = 230 moving right + --- 0.7407 (0.624921), N = 203 moving right + --- 1.78325 (0.739112), N = 99 moving right + --- 4.01895 (0.608372), N = 22 moving right + + -- best stat: 0.739112, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 11 7 16 17 13 + + + -- linear combo weights (showing up to 5) + + 0.9270 10.2487 0.4089 0.4171 0.3688 + + + -- cutpoint (score) + --- 0.0993887 (0.591463), N = 231 moving right + --- 0.458798 (0.642993), N = 204 moving right + --- 0.785291 (0.715791), N = 154 moving right + --- 1.25461 (0.712236), N = 115 moving right + --- 1.73893 (0.72815), N = 84 moving right + + -- best stat: 0.72815, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 6.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 3.3400e+02 1.0000e+00 3.0000e+00 + 3.4800e+02 1.0000e+00 1.0000e+00 + 3.8800e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.7826e-01 2.1739e-02 + 7.7000e+01 9.7464e-01 2.5443e-02 + 1.1000e+02 9.7101e-01 2.9160e-02 + 1.4000e+02 9.6739e-01 3.2892e-02 + 1.7900e+02 9.6377e-01 3.6637e-02 + + +------------ Growing tree 484 -------------- + +- N obs inbag: 276 +- N row inbag: 175 +- max nodes: 243 +- max leaves: 122 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 6 17 8 1 13 + + + -- linear combo weights (showing up to 5) + + -0.0423 0.4624 1.4925 0.3555 0.1115 + + + -- cutpoint (score) + --- 0.280491 (0.637386), N = 205 moving right + --- 1.26618 (0.759139), N = 115 moving right + --- 1.33317 (0.766266), N = 111 moving right + --- 2.47948 (0.659418), N = 47 moving right + --- 3.85193 (0.622998), N = 30 moving right + + -- best stat: 0.766266, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 5 1 10 4 7 + + + -- linear combo weights (showing up to 5) + + 0.6527 0.4092 -0.4957 0.2604 6.4187 + + + -- cutpoint (score) + --- -0.33079 (0.625239), N = 203 moving right + --- -0.02199 (0.66028), N = 166 moving right + --- 0.275181 (0.721454), N = 123 moving right + --- 0.290443 (0.715151), N = 120 moving right + --- 0.476762 (0.734884), N = 105 moving right + + -- best stat: 0.734884, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 14 11 4 17 16 + + + -- linear combo weights (showing up to 5) + + 0.3976 0.7417 -0.0233 0.6381 0.4542 + + + -- cutpoint (score) + --- 2.09656 (0.72519), N = 110 moving right + --- 2.20908 (0.730037), N = 98 moving right + --- 2.39219 (0.719921), N = 85 moving right + --- 2.41965 (0.714059), N = 83 moving right + --- 3.76252 (0.570025), N = 21 moving right + + -- best stat: 0.730037, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 4.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 3.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8188e-01 1.8169e-02 + 7.1000e+01 9.7826e-01 2.1859e-02 + 1.1000e+02 9.7464e-01 2.5562e-02 + 1.3100e+02 9.6739e-01 3.2997e-02 + + +------------ Growing tree 485 -------------- + +- N obs inbag: 276 +- N row inbag: 172 +- max nodes: 223 +- max leaves: 112 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 6 2 8 12 15 + + + -- linear combo weights (showing up to 5) + + -0.2772 0.2333 2.4010 0.1792 -0.2588 + + + -- cutpoint (score) + --- -1.12831 (0.639991), N = 196 moving right + --- -1.05491 (0.659032), N = 186 moving right + --- -0.47392 (0.747876), N = 120 moving right + --- -0.195217 (0.761623), N = 96 moving right + --- 8.05094 (0.541199), N = 7 moving right + + -- best stat: 0.761623, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 10 3 4 12 7 + + + -- linear combo weights (showing up to 5) + + -0.3735 1.7359 0.5377 0.2073 17.3823 + + + -- cutpoint (score) + --- 0.0767333 (0.646928), N = 170 moving right + --- 0.198321 (0.659352), N = 152 moving right + --- 0.259646 (0.65235), N = 138 moving right + --- 0.703424 (0.654592), N = 54 moving right + --- 2.09869 (0.611685), N = 18 moving right + + -- best stat: 0.659352, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 16 5 6 0 8 + + + -- linear combo weights (showing up to 5) + + 0.3360 0.7881 -0.3886 -0.1870 2.2691 + + + -- cutpoint (score) + --- -1.59932 (0.567519), N = 240 moving right + --- -1.5586 (0.575759), N = 235 moving right + --- -1.43372 (0.647462), N = 198 moving right + --- -0.723862 (0.727682), N = 135 moving right + --- -0.558589 (0.738185), N = 125 moving right + + -- best stat: 0.738185, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 3.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 3.0000e+00 + 2.1600e+02 1.0000e+00 2.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + 3.3400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 7.1000e+01 9.8188e-01 1.8195e-02 + 1.3100e+02 9.7464e-01 2.5575e-02 + 1.7900e+02 9.6377e-01 3.6728e-02 + 2.1600e+02 9.5652e-01 4.4247e-02 + + +------------ Growing tree 486 -------------- + +- N obs inbag: 276 +- N row inbag: 175 +- max nodes: 233 +- max leaves: 117 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 3 8 14 11 10 + + + -- linear combo weights (showing up to 5) + + 1.8833 1.4149 -0.1235 0.3821 -0.2454 + + + -- cutpoint (score) + --- -1.39999 (0.530334), N = 259 moving right + --- 0.192617 (0.722899), N = 89 moving right + --- 0.199442 (0.722559), N = 88 moving right + --- 0.249979 (0.720144), N = 83 moving right + --- 4.88231 (0.575357), N = 13 moving right + + -- best stat: 0.722899, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 10 7 8 13 11 + + + -- linear combo weights (showing up to 5) + + -0.3263 3.2259 1.4369 -0.1290 0.3328 + + + -- cutpoint (score) + --- -1.11818 (0.59709), N = 231 moving right + --- -0.917055 (0.637623), N = 201 moving right + --- -0.908613 (0.650794), N = 193 moving right + --- 0.117319 (0.765726), N = 94 moving right + --- 0.392935 (0.719646), N = 70 moving right + + -- best stat: 0.765726, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 5 1 17 2 13 + + + -- linear combo weights (showing up to 5) + + 0.7507 0.2818 0.5214 -0.6249 0.2429 + + + -- cutpoint (score) + --- 1.15409 (0.673844), N = 161 moving right + --- 1.44802 (0.702263), N = 117 moving right + --- 1.61859 (0.706514), N = 105 moving right + --- 1.89421 (0.672368), N = 75 moving right + --- 2.18574 (0.632614), N = 40 moving right + + -- best stat: 0.706514, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 4.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + 3.3400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 7.1000e+01 9.8551e-01 1.4546e-02 + 7.7000e+01 9.8188e-01 1.8222e-02 + 1.1000e+02 9.6739e-01 3.2982e-02 + 1.3100e+02 9.6377e-01 3.6728e-02 + + +------------ Growing tree 487 -------------- + +- N obs inbag: 276 +- N row inbag: 177 +- max nodes: 245 +- max leaves: 123 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 9 10 7 2 12 + + + -- linear combo weights (showing up to 5) + + 0.2590 -0.6022 4.1755 -1.0851 0.0902 + + + -- cutpoint (score) + --- -1.91097 (0.528648), N = 251 moving right + --- -1.59412 (0.562749), N = 231 moving right + --- -1.01984 (0.671592), N = 133 moving right + --- -0.43566 (0.650276), N = 79 moving right + --- -0.266835 (0.636127), N = 64 moving right + + -- best stat: 0.671592, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 6 2 5 14 16 + + + -- linear combo weights (showing up to 5) + + 0.0921 -1.0232 1.0098 0.4223 0.9606 + + + -- cutpoint (score) + --- -1.97843 (0.534948), N = 257 moving right + --- -1.74732 (0.563246), N = 243 moving right + --- -1.0869 (0.68399), N = 149 moving right + --- -0.564638 (0.717078), N = 117 moving right + --- 0.230292 (0.674797), N = 74 moving right + + -- best stat: 0.717078, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 7 2 15 9 12 + + + -- linear combo weights (showing up to 5) + + 4.3897 -0.9241 -0.1691 0.3150 0.1726 + + + -- cutpoint (score) + --- -1.39821 (0.527266), N = 264 moving right + --- -0.97582 (0.649926), N = 155 moving right + --- -0.68915 (0.637859), N = 87 moving right + --- -0.654248 (0.630195), N = 82 moving right + --- -0.57622 (0.632277), N = 73 moving right + + -- best stat: 0.649926, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 2.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.9275e-01 7.2596e-03 + 7.7000e+01 9.8913e-01 1.0909e-02 + 1.1000e+02 9.8188e-01 1.8235e-02 + 1.3100e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 488 -------------- + +- N obs inbag: 276 +- N row inbag: 167 +- max nodes: 211 +- max leaves: 106 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 9 17 12 10 8 + + + -- linear combo weights (showing up to 5) + + -0.4794 0.3813 0.0897 -0.7397 2.1458 + + + -- cutpoint (score) + --- -0.51615 (0.609094), N = 216 moving right + --- 0.0697811 (0.700927), N = 157 moving right + --- 0.460887 (0.746354), N = 129 moving right + --- 0.887773 (0.763985), N = 107 moving right + --- 3.69177 (0.677158), N = 35 moving right + + -- best stat: 0.763985, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 1 16 4 5 6 + + + -- linear combo weights (showing up to 5) + + 0.2923 0.6936 0.9007 0.0002 1.5642 + + + -- cutpoint (score) + --- -0.284955 (0.608681), N = 206 moving right + --- -0.0803729 (0.639437), N = 172 moving right + --- 0.20702 (0.672391), N = 145 moving right + --- 1.05935 (0.683057), N = 79 moving right + --- 1.94749 (0.585325), N = 18 moving right + + -- best stat: 0.683057, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 9 7 10 8 14 + + + -- linear combo weights (showing up to 5) + + -0.3888 5.6987 -0.7039 1.8481 0.1284 + + + -- cutpoint (score) + --- -1.45286 (0.59081), N = 225 moving right + --- -0.645394 (0.734078), N = 134 moving right + --- -0.598599 (0.747355), N = 128 moving right + --- -0.302594 (0.763746), N = 105 moving right + --- 1.22845 (0.697118), N = 46 moving right + + -- best stat: 0.763746, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 4.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + 3.3400e+02 1.0000e+00 2.0000e+00 + 4.6000e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.1000e+01 9.8188e-01 1.8222e-02 + 7.7000e+01 9.7826e-01 2.1912e-02 + 1.7900e+02 9.7464e-01 2.5616e-02 + + +------------ Growing tree 489 -------------- + +- N obs inbag: 276 +- N row inbag: 181 +- max nodes: 225 +- max leaves: 113 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 1 14 11 2 16 + + + -- linear combo weights (showing up to 5) + + 0.2832 0.3238 1.0769 0.6488 0.6237 + + + -- cutpoint (score) + --- -0.856036 (0.561023), N = 244 moving right + --- -0.769003 (0.575724), N = 237 moving right + --- -0.558583 (0.612762), N = 221 moving right + --- -0.246649 (0.688251), N = 179 moving right + --- 0.475702 (0.733002), N = 111 moving right + + -- best stat: 0.733002, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 2 12 13 15 1 + + + -- linear combo weights (showing up to 5) + + 0.1220 0.1361 0.4848 -0.2520 0.5544 + + + -- cutpoint (score) + --- -0.795599 (0.565989), N = 240 moving right + --- -0.417023 (0.597079), N = 216 moving right + --- -0.0868288 (0.67667), N = 143 moving right + --- 0.614671 (0.650389), N = 61 moving right + --- 1.12152 (0.535821), N = 23 moving right + + -- best stat: 0.67667, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 6 14 12 0 11 + + + -- linear combo weights (showing up to 5) + + 1.0022 0.2218 -0.2322 -0.0768 1.2600 + + + -- cutpoint (score) + --- -1.08802 (0.559021), N = 248 moving right + --- -0.739429 (0.650624), N = 203 moving right + --- 0.115549 (0.702187), N = 101 moving right + --- 0.316163 (0.722776), N = 84 moving right + --- 2.48617 (0.573879), N = 16 moving right + + -- best stat: 0.722776, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 3.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.8913e-01 1.0896e-02 + 7.1000e+01 9.8188e-01 1.8222e-02 + 7.7000e+01 9.7101e-01 2.9292e-02 + 1.1000e+02 9.6739e-01 3.3023e-02 + + +------------ Growing tree 490 -------------- + +- N obs inbag: 276 +- N row inbag: 169 +- max nodes: 219 +- max leaves: 110 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 16 8 4 9 6 + + + -- linear combo weights (showing up to 5) + + 0.2310 1.8052 0.0660 -0.1805 1.2319 + + + -- cutpoint (score) + --- -1.1174 (0.556507), N = 241 moving right + --- -0.890234 (0.657223), N = 177 moving right + --- -0.415571 (0.726683), N = 121 moving right + --- 0.329321 (0.676401), N = 78 moving right + --- 0.694243 (0.686471), N = 64 moving right + + -- best stat: 0.726683, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 2 0 17 8 9 + + + -- linear combo weights (showing up to 5) + + -0.0539 -0.3207 0.1883 1.8554 -0.2741 + + + -- cutpoint (score) + --- -0.762314 (0.571709), N = 233 moving right + --- -0.592586 (0.640863), N = 197 moving right + --- 0.863737 (0.65102), N = 60 moving right + --- 0.899225 (0.647329), N = 53 moving right + --- 5.07236 (0.568433), N = 11 moving right + + -- best stat: 0.65102, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 9 10 2 13 3 + + + -- linear combo weights (showing up to 5) + + 0.4043 -0.2144 0.1523 0.3228 5.6365 + + + -- cutpoint (score) + --- -0.389236 (0.532655), N = 227 moving right + --- 0.10418 (0.634507), N = 126 moving right + --- 0.176651 (0.628369), N = 113 moving right + --- 0.386395 (0.645669), N = 72 moving right + --- 0.826181 (0.665786), N = 40 moving right + + -- best stat: 0.665786, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 3.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 3.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 2.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8188e-01 1.8195e-02 + 7.1000e+01 9.7826e-01 2.1885e-02 + 1.3100e+02 9.7464e-01 2.5589e-02 + 1.7900e+02 9.6739e-01 3.3024e-02 + + +------------ Growing tree 491 -------------- + +- N obs inbag: 276 +- N row inbag: 177 +- max nodes: 245 +- max leaves: 123 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 11 6 13 5 0 + + + -- linear combo weights (showing up to 5) + + 1.0004 0.8033 0.2528 1.2053 0.2162 + + + -- cutpoint (score) + --- -0.731233 (0.571107), N = 234 moving right + --- -0.698561 (0.586583), N = 227 moving right + --- 0.0335778 (0.67416), N = 150 moving right + --- 0.653354 (0.698013), N = 119 moving right + --- 2.80717 (0.564289), N = 19 moving right + + -- best stat: 0.698013, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 14 13 11 5 6 + + + -- linear combo weights (showing up to 5) + + 0.2576 0.2409 0.9487 1.1832 0.6693 + + + -- cutpoint (score) + --- -0.482602 (0.626155), N = 198 moving right + --- -0.0629538 (0.657126), N = 147 moving right + --- 0.654041 (0.700924), N = 111 moving right + --- 1.3309 (0.698351), N = 55 moving right + --- 3.91405 (0.520829), N = 9 moving right + + -- best stat: 0.700924, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 13 12 5 9 10 + + + -- linear combo weights (showing up to 5) + + 0.3016 0.0933 1.3781 0.1008 -0.5608 + + + -- cutpoint (score) + --- -1.04372 (0.546897), N = 252 moving right + --- -0.622704 (0.575746), N = 229 moving right + --- 0.0510224 (0.656262), N = 155 moving right + --- 0.0881979 (0.651491), N = 147 moving right + --- 2.13649 (0.592311), N = 25 moving right + + -- best stat: 0.656262, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 4.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 2.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 7.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.8551e-01 1.4559e-02 + 1.1000e+02 9.8188e-01 1.8235e-02 + 1.3100e+02 9.6739e-01 3.2996e-02 + + +------------ Growing tree 492 -------------- + +- N obs inbag: 276 +- N row inbag: 187 +- max nodes: 249 +- max leaves: 125 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 8 13 5 9 16 + + + -- linear combo weights (showing up to 5) + + 1.6467 -0.0207 0.3471 -0.1753 0.5932 + + + -- cutpoint (score) + --- -1.35613 (0.52762), N = 256 moving right + --- -0.341732 (0.740268), N = 137 moving right + --- -0.259202 (0.728198), N = 124 moving right + --- 0.325501 (0.714674), N = 90 moving right + --- 0.540526 (0.709652), N = 82 moving right + + -- best stat: 0.740268, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 3 6 14 5 1 + + + -- linear combo weights (showing up to 5) + + 6.4992 -0.3150 0.3913 1.2727 0.5669 + + + -- cutpoint (score) + --- -0.556665 (0.556989), N = 235 moving right + --- 0.0598719 (0.664923), N = 150 moving right + --- 0.28695 (0.668248), N = 133 moving right + --- 0.351789 (0.679262), N = 126 moving right + --- 7.00892 (0.587172), N = 16 moving right + + -- best stat: 0.679262, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 6 15 3 9 7 + + + -- linear combo weights (showing up to 5) + + 0.6778 -0.1223 4.0733 0.3090 8.2857 + + + -- cutpoint (score) + --- -0.292543 (0.521299), N = 263 moving right + --- -0.190685 (0.56208), N = 243 moving right + --- -0.165337 (0.574565), N = 232 moving right + --- 0.023053 (0.67095), N = 135 moving right + --- 0.224491 (0.665807), N = 79 moving right + + -- best stat: 0.67095, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 3.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 2.6400e+02 1.0000e+00 3.0000e+00 + 3.0400e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 7.7000e+01 9.9638e-01 3.6232e-03 + 1.1000e+02 9.9275e-01 7.2596e-03 + 1.3100e+02 9.8551e-01 1.4559e-02 + 1.7900e+02 9.7826e-01 2.1912e-02 + 1.8600e+02 9.6739e-01 3.3023e-02 + + +------------ Growing tree 493 -------------- + +- N obs inbag: 276 +- N row inbag: 175 +- max nodes: 213 +- max leaves: 107 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 1 3 17 9 11 + + + -- linear combo weights (showing up to 5) + + 0.2531 6.6182 0.4603 0.4158 0.9092 + + + -- cutpoint (score) + --- -0.20052 (0.522595), N = 266 moving right + --- 0.322788 (0.604528), N = 223 moving right + --- 0.596601 (0.657573), N = 198 moving right + --- 1.39355 (0.767421), N = 113 moving right + --- 2.10126 (0.727915), N = 80 moving right + + -- best stat: 0.767421, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 8 2 7 15 0 + + + -- linear combo weights (showing up to 5) + + 2.1955 -0.1804 4.2430 -0.1031 -0.1209 + + + -- cutpoint (score) + --- -1.78321 (0.512112), N = 271 moving right + --- -1.75787 (0.516233), N = 269 moving right + --- 1.42121 (0.651143), N = 33 moving right + --- 4.7814 (0.609237), N = 18 moving right + --- 6.03677 (0.59957), N = 17 moving right + + -- best stat: 0.651143, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 15 3 0 13 16 + + + -- linear combo weights (showing up to 5) + + -0.0974 7.8444 -0.1383 0.3796 0.3170 + + + -- cutpoint (score) + --- -0.206532 (0.654268), N = 141 moving right + --- -0.108004 (0.659067), N = 127 moving right + --- 0.0510058 (0.675843), N = 100 moving right + --- 0.179355 (0.651845), N = 75 moving right + --- 0.190308 (0.662259), N = 71 moving right + + -- best stat: 0.675843, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 3.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 3.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + 3.3400e+02 1.0000e+00 4.0000e+00 + 5.1500e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9275e-01 7.2464e-03 + 7.1000e+01 9.8913e-01 1.0896e-02 + 7.7000e+01 9.7826e-01 2.1885e-02 + 2.1600e+02 9.7464e-01 2.5589e-02 + 2.2300e+02 9.7101e-01 2.9306e-02 + + +------------ Growing tree 494 -------------- + +- N obs inbag: 276 +- N row inbag: 179 +- max nodes: 221 +- max leaves: 111 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 0 8 2 3 7 + + + -- linear combo weights (showing up to 5) + + -0.2512 1.1418 -0.3940 5.8533 6.2241 + + + -- cutpoint (score) + --- -0.948256 (0.703372), N = 149 moving right + --- -0.72492 (0.722521), N = 126 moving right + --- -0.278249 (0.728715), N = 73 moving right + --- 0.984241 (0.67558), N = 40 moving right + --- 10.4606 (0.587891), N = 14 moving right + + -- best stat: 0.728715, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 17 9 5 11 15 + + + -- linear combo weights (showing up to 5) + + 0.7027 0.2779 0.2901 0.4904 -0.1321 + + + -- cutpoint (score) + --- 1.69594 (0.667483), N = 191 moving right + --- 1.87169 (0.694891), N = 167 moving right + --- 2.12825 (0.726428), N = 134 moving right + --- 2.17738 (0.729363), N = 133 moving right + --- 3.16116 (0.646269), N = 41 moving right + + -- best stat: 0.729363, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 3 8 1 12 9 + + + -- linear combo weights (showing up to 5) + + 7.5592 1.2977 0.2050 0.0429 0.0326 + + + -- cutpoint (score) + --- -0.700871 (0.638233), N = 197 moving right + --- -0.390994 (0.742844), N = 133 moving right + --- -0.378602 (0.745051), N = 132 moving right + --- -0.155224 (0.750698), N = 102 moving right + --- 0.957102 (0.673029), N = 46 moving right + + -- best stat: 0.750698, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 1.0000e+00 + 5.1000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 2.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + 3.2600e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9638e-01 3.6232e-03 + 5.1000e+01 9.9275e-01 7.2596e-03 + 1.1000e+02 9.8913e-01 1.0909e-02 + 1.4000e+02 9.8551e-01 1.4572e-02 + 1.7900e+02 9.8188e-01 1.8249e-02 + + +------------ Growing tree 495 -------------- + +- N obs inbag: 276 +- N row inbag: 178 +- max nodes: 203 +- max leaves: 102 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 14 3 5 10 0 + + + -- linear combo weights (showing up to 5) + + 0.1147 6.0144 0.9287 -0.7126 -0.4381 + + + -- cutpoint (score) + --- -0.764187 (0.571144), N = 230 moving right + --- -0.2923 (0.674487), N = 155 moving right + --- 1.02372 (0.677265), N = 51 moving right + --- 1.18116 (0.687662), N = 42 moving right + --- 7.85112 (0.538541), N = 5 moving right + + -- best stat: 0.687662, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 11 14 16 3 13 + + + -- linear combo weights (showing up to 5) + + 0.6022 0.0335 0.7949 5.6579 0.2404 + + + -- cutpoint (score) + --- -0.891351 (0.621807), N = 208 moving right + --- -0.714238 (0.663664), N = 183 moving right + --- -0.642957 (0.68094), N = 168 moving right + --- 0.125893 (0.762436), N = 97 moving right + --- 0.314778 (0.74153), N = 82 moving right + + -- best stat: 0.762436, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 1 13 3 11 10 + + + -- linear combo weights (showing up to 5) + + 0.4540 0.3046 5.4597 0.5899 -0.6525 + + + -- cutpoint (score) + --- -1.52664 (0.552433), N = 244 moving right + --- -1.3435 (0.566304), N = 238 moving right + --- -0.558027 (0.697835), N = 172 moving right + --- -0.258656 (0.727705), N = 127 moving right + --- 7.42351 (0.553935), N = 8 moving right + + -- best stat: 0.727705, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 5.1000e+01 1.0000e+00 1.0000e+00 + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 2.1600e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 3.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 5.1000e+01 9.9638e-01 3.6232e-03 + 7.1000e+01 9.9275e-01 7.2596e-03 + 7.7000e+01 9.8913e-01 1.0909e-02 + 1.4000e+02 9.8188e-01 1.8235e-02 + 1.7900e+02 9.7464e-01 2.5615e-02 + + +------------ Growing tree 496 -------------- + +- N obs inbag: 276 +- N row inbag: 176 +- max nodes: 239 +- max leaves: 120 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 7 0 16 3 17 + + + -- linear combo weights (showing up to 5) + + 4.9675 -0.2895 0.4475 4.5969 0.2456 + + + -- cutpoint (score) + --- 0.165186 (0.594094), N = 212 moving right + --- 0.253945 (0.608303), N = 202 moving right + --- 1.07646 (0.704736), N = 63 moving right + --- 1.47543 (0.650738), N = 37 moving right + --- 10.6641 (0.575091), N = 13 moving right + + -- best stat: 0.704736, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 3 6 2 7 17 + + + -- linear combo weights (showing up to 5) + + 4.8634 1.0082 -0.8825 5.5489 0.2668 + + + -- cutpoint (score) + --- -0.348826 (0.599118), N = 213 moving right + --- 0.800463 (0.683739), N = 56 moving right + --- 5.04825 (0.64349), N = 30 moving right + --- 5.46692 (0.635513), N = 28 moving right + --- 6.05641 (0.616606), N = 20 moving right + + -- best stat: 0.683739, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 3 14 15 2 17 + + + -- linear combo weights (showing up to 5) + + 7.2592 0.0709 -0.1099 -0.7342 0.3245 + + + -- cutpoint (score) + --- 0.471821 (0.651601), N = 114 moving right + --- 0.546372 (0.652119), N = 100 moving right + --- 0.620399 (0.644545), N = 77 moving right + --- 0.666397 (0.642915), N = 71 moving right + --- 0.762455 (0.662109), N = 54 moving right + + -- best stat: 0.662109, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 3.0000e+00 + 7.1000e+01 1.0000e+00 2.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 1.0000e+00 + 1.4000e+02 1.0000e+00 1.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8188e-01 1.8195e-02 + 7.1000e+01 9.7464e-01 2.5575e-02 + 1.1000e+02 9.7101e-01 2.9293e-02 + 1.3100e+02 9.6739e-01 3.3024e-02 + + +------------ Growing tree 497 -------------- + +- N obs inbag: 276 +- N row inbag: 184 +- max nodes: 231 +- max leaves: 116 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 0 3 10 16 13 + + + -- linear combo weights (showing up to 5) + + -0.2827 4.4196 -0.5346 0.3533 0.2127 + + + -- cutpoint (score) + --- -0.830202 (0.554122), N = 232 moving right + --- -0.733893 (0.560619), N = 217 moving right + --- -0.506662 (0.628828), N = 178 moving right + --- 0.153246 (0.71406), N = 85 moving right + --- 0.899453 (0.638902), N = 30 moving right + + -- best stat: 0.71406, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 4 11 5 16 17 + + + -- linear combo weights (showing up to 5) + + 0.6619 1.0120 0.9543 0.3589 0.3398 + + + -- cutpoint (score) + --- -0.070097 (0.565063), N = 244 moving right + --- 1.80496 (0.740801), N = 114 moving right + --- 2.05109 (0.732213), N = 95 moving right + --- 3.17825 (0.663873), N = 38 moving right + --- 4.84742 (0.540149), N = 10 moving right + + -- best stat: 0.740801, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 14 6 13 1 9 + + + -- linear combo weights (showing up to 5) + + 0.2770 1.0302 0.1415 0.4498 0.2427 + + + -- cutpoint (score) + --- -0.345333 (0.608715), N = 206 moving right + --- -0.277177 (0.612595), N = 193 moving right + --- -0.03058 (0.661839), N = 142 moving right + --- 0.0301289 (0.627208), N = 125 moving right + --- 0.185931 (0.627735), N = 99 moving right + + -- best stat: 0.661839, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.1000e+02 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.7900e+02 1.0000e+00 1.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 3.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 7.1000e+01 9.9638e-01 3.6232e-03 + 7.7000e+01 9.9275e-01 7.2596e-03 + 1.1000e+02 9.8913e-01 1.0909e-02 + 1.3100e+02 9.8188e-01 1.8235e-02 + 1.7900e+02 9.7826e-01 2.1925e-02 + + +------------ Growing tree 498 -------------- + +- N obs inbag: 276 +- N row inbag: 169 +- max nodes: 197 +- max leaves: 99 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 6 2 3 0 8 + + + -- linear combo weights (showing up to 5) + + 0.4052 -1.0451 6.5784 0.0368 1.6715 + + + -- cutpoint (score) + --- -1.09321 (0.752642), N = 105 moving right + --- -1.02102 (0.739491), N = 100 moving right + --- -0.375519 (0.75081), N = 66 moving right + --- -0.185482 (0.724954), N = 57 moving right + --- 1.94993 (0.649054), N = 26 moving right + + -- best stat: 0.752642, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 1 5 16 11 7 + + + -- linear combo weights (showing up to 5) + + 0.5000 0.6626 0.2795 0.8080 3.2644 + + + -- cutpoint (score) + --- -1.07181 (0.548025), N = 245 moving right + --- -0.541574 (0.640364), N = 193 moving right + --- -0.295755 (0.710418), N = 153 moving right + --- 1.40329 (0.656897), N = 53 moving right + --- 1.83264 (0.601099), N = 27 moving right + + -- best stat: 0.710418, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 17 7 6 0 9 + + + -- linear combo weights (showing up to 5) + + 0.4920 4.8064 1.6726 0.0785 0.5425 + + + -- cutpoint (score) + --- 0.759195 (0.561035), N = 243 moving right + --- 0.856246 (0.570805), N = 233 moving right + --- 1.16588 (0.622047), N = 194 moving right + --- 1.55839 (0.694143), N = 139 moving right + --- 1.74544 (0.670988), N = 116 moving right + + -- best stat: 0.694143, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 7.1000e+01 1.0000e+00 1.0000e+00 + 7.7000e+01 1.0000e+00 4.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 2.0000e+00 + 1.9800e+02 1.0000e+00 1.0000e+00 + 2.2300e+02 1.0000e+00 1.0000e+00 + 2.6400e+02 1.0000e+00 1.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 1.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 7.1000e+01 9.9638e-01 3.6232e-03 + 7.7000e+01 9.8188e-01 1.8169e-02 + 1.3100e+02 9.7464e-01 2.5549e-02 + 1.8600e+02 9.7101e-01 2.9266e-02 + 1.9100e+02 9.6377e-01 3.6729e-02 + + +------------ Growing tree 499 -------------- + +- N obs inbag: 276 +- N row inbag: 179 +- max nodes: 233 +- max leaves: 117 + +-- attempting to split node 0 (N = 276, try number 1) + + -- columns sampled (showing up to 5) + + 13 6 4 2 1 + + + -- linear combo weights (showing up to 5) + + 0.3676 -0.4604 0.6502 0.4927 0.6738 + + + -- cutpoint (score) + --- 0.0454134 (0.579022), N = 227 moving right + --- 0.465527 (0.630631), N = 177 moving right + --- 0.558754 (0.666619), N = 160 moving right + --- 0.96496 (0.674033), N = 106 moving right + --- 1.38862 (0.61831), N = 46 moving right + + -- best stat: 0.674033, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 2) + + -- columns sampled (showing up to 5) + + 9 6 5 17 12 + + + -- linear combo weights (showing up to 5) + + 0.3864 -0.2246 0.9741 0.4153 0.1352 + + + -- cutpoint (score) + --- 0.611025 (0.566741), N = 241 moving right + --- 0.838925 (0.577515), N = 223 moving right + --- 1.02613 (0.604786), N = 206 moving right + --- 2.13851 (0.622322), N = 70 moving right + --- 2.7697 (0.551568), N = 19 moving right + + -- best stat: 0.622322, min to split: 0.999 + +-- attempting to split node 0 (N = 276, try number 3) + + -- columns sampled (showing up to 5) + + 5 17 0 16 8 + + + -- linear combo weights (showing up to 5) + + 0.4790 0.3211 -0.1514 0.3724 1.7822 + + + -- cutpoint (score) + --- -0.441199 (0.583136), N = 233 moving right + --- 0.0386227 (0.660733), N = 177 moving right + --- 0.249344 (0.710896), N = 149 moving right + --- 0.953561 (0.737149), N = 93 moving right + --- 1.21715 (0.72776), N = 76 moving right + + -- best stat: 0.737149, min to split: 0.999 + +-- sprouting node 0 into a leaf (N = 276) + + -- time & status & weights in this node + + 4.1000e+01 1.0000e+00 2.0000e+00 + 5.1000e+01 1.0000e+00 2.0000e+00 + 7.7000e+01 1.0000e+00 1.0000e+00 + 1.3100e+02 1.0000e+00 2.0000e+00 + 1.4000e+02 1.0000e+00 2.0000e+00 + 1.8600e+02 1.0000e+00 1.0000e+00 + 1.9100e+02 1.0000e+00 1.0000e+00 + 2.1600e+02 1.0000e+00 3.0000e+00 + 3.0400e+02 1.0000e+00 1.0000e+00 + 3.2100e+02 1.0000e+00 2.0000e+00 + + + -- leaf_data (showing up to 5 rows) + + 4.1000e+01 9.9275e-01 7.2464e-03 + 5.1000e+01 9.8551e-01 1.4546e-02 + 7.7000e+01 9.8188e-01 1.8222e-02 + 1.3100e+02 9.7464e-01 2.5602e-02 + 1.4000e+02 9.6739e-01 3.3037e-02 + + +--- Computing oobag predictions: tree 0 --- + + -- N preds expected: 100 + -- N preds made: 100 + +--- Computing oobag predictions: tree 1 --- + + -- N preds expected: 93 + -- N preds made: 93 + +--- Computing oobag predictions: tree 2 --- + + -- N preds expected: 96 + -- N preds made: 96 + +--- Computing oobag predictions: tree 3 --- + + -- N preds expected: 93 + -- N preds made: 93 + +--- Computing oobag predictions: tree 4 --- + + -- N preds expected: 102 + -- N preds made: 102 + +--- Computing oobag predictions: tree 5 --- + + -- N preds expected: 104 + -- N preds made: 104 + +--- Computing oobag predictions: tree 6 --- + + -- N preds expected: 107 + -- N preds made: 107 + +--- Computing oobag predictions: tree 7 --- + + -- N preds expected: 101 + -- N preds made: 101 + +--- Computing oobag predictions: tree 8 --- + + -- N preds expected: 102 + -- N preds made: 102 + +--- Computing oobag predictions: tree 9 --- + + -- N preds expected: 107 + -- N preds made: 107 + +--- Computing oobag predictions: tree 10 --- + + -- N preds expected: 102 + -- N preds made: 102 + +--- Computing oobag predictions: tree 11 --- + + -- N preds expected: 102 + -- N preds made: 102 + +--- Computing oobag predictions: tree 12 --- + + -- N preds expected: 99 + -- N preds made: 99 + +--- Computing oobag predictions: tree 13 --- + + -- N preds expected: 104 + -- N preds made: 104 + +--- Computing oobag predictions: tree 14 --- + + -- N preds expected: 107 + -- N preds made: 107 + +--- Computing oobag predictions: tree 15 --- + + -- N preds expected: 108 + -- N preds made: 108 + +--- Computing oobag predictions: tree 16 --- + + -- N preds expected: 105 + -- N preds made: 105 + +--- Computing oobag predictions: tree 17 --- + + -- N preds expected: 91 + -- N preds made: 91 + +--- Computing oobag predictions: tree 18 --- + + -- N preds expected: 109 + -- N preds made: 109 + +--- Computing oobag predictions: tree 19 --- + + -- N preds expected: 94 + -- N preds made: 94 + +--- Computing oobag predictions: tree 20 --- + + -- N preds expected: 97 + -- N preds made: 97 + +--- Computing oobag predictions: tree 21 --- + + -- N preds expected: 109 + -- N preds made: 109 + +--- Computing oobag predictions: tree 22 --- + + -- N preds expected: 91 + -- N preds made: 91 + +--- Computing oobag predictions: tree 23 --- + + -- N preds expected: 92 + -- N preds made: 92 + +--- Computing oobag predictions: tree 24 --- + + -- N preds expected: 103 + -- N preds made: 103 + +--- Computing oobag predictions: tree 25 --- + + -- N preds expected: 108 + -- N preds made: 108 + +--- Computing oobag predictions: tree 26 --- + + -- N preds expected: 97 + -- N preds made: 97 + +--- Computing oobag predictions: tree 27 --- + + -- N preds expected: 99 + -- N preds made: 99 + +--- Computing oobag predictions: tree 28 --- + + -- N preds expected: 101 + -- N preds made: 101 + +--- Computing oobag predictions: tree 29 --- + + -- N preds expected: 109 + -- N preds made: 109 + +--- Computing oobag predictions: tree 30 --- + + -- N preds expected: 104 + -- N preds made: 104 + +--- Computing oobag predictions: tree 31 --- + + -- N preds expected: 95 + -- N preds made: 95 + +--- Computing oobag predictions: tree 32 --- + + -- N preds expected: 102 + -- N preds made: 102 + +--- Computing oobag predictions: tree 33 --- + + -- N preds expected: 103 + -- N preds made: 103 + +--- Computing oobag predictions: tree 34 --- + + -- N preds expected: 103 + -- N preds made: 103 + +--- Computing oobag predictions: tree 35 --- + + -- N preds expected: 102 + -- N preds made: 102 + +--- Computing oobag predictions: tree 36 --- + + -- N preds expected: 100 + -- N preds made: 100 + +--- Computing oobag predictions: tree 37 --- + + -- N preds expected: 106 + -- N preds made: 106 + +--- Computing oobag predictions: tree 38 --- + + -- N preds expected: 103 + -- N preds made: 103 + +--- Computing oobag predictions: tree 39 --- + + -- N preds expected: 96 + -- N preds made: 96 + +--- Computing oobag predictions: tree 40 --- + + -- N preds expected: 95 + -- N preds made: 95 + +--- Computing oobag predictions: tree 41 --- + + -- N preds expected: 99 + -- N preds made: 99 + +--- Computing oobag predictions: tree 42 --- + + -- N preds expected: 99 + -- N preds made: 99 + +--- Computing oobag predictions: tree 43 --- + + -- N preds expected: 105 + -- N preds made: 105 + +--- Computing oobag predictions: tree 44 --- + + -- N preds expected: 100 + -- N preds made: 100 + +--- Computing oobag predictions: tree 45 --- + + -- N preds expected: 100 + -- N preds made: 100 + +--- Computing oobag predictions: tree 46 --- + + -- N preds expected: 92 + -- N preds made: 92 + +--- Computing oobag predictions: tree 47 --- + + -- N preds expected: 93 + -- N preds made: 93 + +--- Computing oobag predictions: tree 48 --- + + -- N preds expected: 102 + -- N preds made: 102 + +--- Computing oobag predictions: tree 49 --- + + -- N preds expected: 107 + -- N preds made: 107 + +--- Computing oobag predictions: tree 50 --- + + -- N preds expected: 98 + -- N preds made: 98 + +--- Computing oobag predictions: tree 51 --- + + -- N preds expected: 107 + -- N preds made: 107 + +--- Computing oobag predictions: tree 52 --- + + -- N preds expected: 103 + -- N preds made: 103 + +--- Computing oobag predictions: tree 53 --- + + -- N preds expected: 97 + -- N preds made: 97 + +--- Computing oobag predictions: tree 54 --- + + -- N preds expected: 104 + -- N preds made: 104 + +--- Computing oobag predictions: tree 55 --- + + -- N preds expected: 97 + -- N preds made: 97 + +--- Computing oobag predictions: tree 56 --- + + -- N preds expected: 114 + -- N preds made: 114 + +--- Computing oobag predictions: tree 57 --- + + -- N preds expected: 104 + -- N preds made: 104 + +--- Computing oobag predictions: tree 58 --- + + -- N preds expected: 104 + -- N preds made: 104 + +--- Computing oobag predictions: tree 59 --- + + -- N preds expected: 107 + -- N preds made: 107 + +--- Computing oobag predictions: tree 60 --- + + -- N preds expected: 102 + -- N preds made: 102 + +--- Computing oobag predictions: tree 61 --- + + -- N preds expected: 100 + -- N preds made: 100 + +--- Computing oobag predictions: tree 62 --- + + -- N preds expected: 101 + -- N preds made: 101 + +--- Computing oobag predictions: tree 63 --- + + -- N preds expected: 101 + -- N preds made: 101 + +--- Computing oobag predictions: tree 64 --- + + -- N preds expected: 96 + -- N preds made: 96 + +--- Computing oobag predictions: tree 65 --- + + -- N preds expected: 104 + -- N preds made: 104 + +--- Computing oobag predictions: tree 66 --- + + -- N preds expected: 102 + -- N preds made: 102 + +--- Computing oobag predictions: tree 67 --- + + -- N preds expected: 104 + -- N preds made: 104 + +--- Computing oobag predictions: tree 68 --- + + -- N preds expected: 95 + -- N preds made: 95 + +--- Computing oobag predictions: tree 69 --- + + -- N preds expected: 101 + -- N preds made: 101 + +--- Computing oobag predictions: tree 70 --- + + -- N preds expected: 94 + -- N preds made: 94 + +--- Computing oobag predictions: tree 71 --- + + -- N preds expected: 110 + -- N preds made: 110 + +--- Computing oobag predictions: tree 72 --- + + -- N preds expected: 116 + -- N preds made: 116 + +--- Computing oobag predictions: tree 73 --- + + -- N preds expected: 110 + -- N preds made: 110 + +--- Computing oobag predictions: tree 74 --- + + -- N preds expected: 100 + -- N preds made: 100 + +--- Computing oobag predictions: tree 75 --- + + -- N preds expected: 103 + -- N preds made: 103 + +--- Computing oobag predictions: tree 76 --- + + -- N preds expected: 100 + -- N preds made: 100 + +--- Computing oobag predictions: tree 77 --- + + -- N preds expected: 102 + -- N preds made: 102 + +--- Computing oobag predictions: tree 78 --- + + -- N preds expected: 100 + -- N preds made: 100 + +--- Computing oobag predictions: tree 79 --- + + -- N preds expected: 111 + -- N preds made: 111 + +--- Computing oobag predictions: tree 80 --- + + -- N preds expected: 100 + -- N preds made: 100 + +--- Computing oobag predictions: tree 81 --- + + -- N preds expected: 110 + -- N preds made: 110 + +--- Computing oobag predictions: tree 82 --- + + -- N preds expected: 94 + -- N preds made: 94 + +--- Computing oobag predictions: tree 83 --- + + -- N preds expected: 103 + -- N preds made: 103 + +--- Computing oobag predictions: tree 84 --- + + -- N preds expected: 98 + -- N preds made: 98 + +--- Computing oobag predictions: tree 85 --- + + -- N preds expected: 97 + -- N preds made: 97 + +--- Computing oobag predictions: tree 86 --- + + -- N preds expected: 106 + -- N preds made: 106 + +--- Computing oobag predictions: tree 87 --- + + -- N preds expected: 109 + -- N preds made: 109 + +--- Computing oobag predictions: tree 88 --- + + -- N preds expected: 89 + -- N preds made: 89 + +--- Computing oobag predictions: tree 89 --- + + -- N preds expected: 110 + -- N preds made: 110 + +--- Computing oobag predictions: tree 90 --- + + -- N preds expected: 100 + -- N preds made: 100 + +--- Computing oobag predictions: tree 91 --- + + -- N preds expected: 103 + -- N preds made: 103 + +--- Computing oobag predictions: tree 92 --- + + -- N preds expected: 100 + -- N preds made: 100 + +--- Computing oobag predictions: tree 93 --- + + -- N preds expected: 104 + -- N preds made: 104 + +--- Computing oobag predictions: tree 94 --- + + -- N preds expected: 98 + -- N preds made: 98 + +--- Computing oobag predictions: tree 95 --- + + -- N preds expected: 106 + -- N preds made: 106 + +--- Computing oobag predictions: tree 96 --- + + -- N preds expected: 98 + -- N preds made: 98 + +--- Computing oobag predictions: tree 97 --- + + -- N preds expected: 107 + -- N preds made: 107 + +--- Computing oobag predictions: tree 98 --- + + -- N preds expected: 99 + -- N preds made: 99 + +--- Computing oobag predictions: tree 99 --- + + -- N preds expected: 100 + -- N preds made: 100 + +--- Computing oobag predictions: tree 100 --- + + -- N preds expected: 102 + -- N preds made: 102 + +--- Computing oobag predictions: tree 101 --- + + -- N preds expected: 98 + -- N preds made: 98 + +--- Computing oobag predictions: tree 102 --- + + -- N preds expected: 98 + -- N preds made: 98 + +--- Computing oobag predictions: tree 103 --- + + -- N preds expected: 102 + -- N preds made: 102 + +--- Computing oobag predictions: tree 104 --- + + -- N preds expected: 101 + -- N preds made: 101 + +--- Computing oobag predictions: tree 105 --- + + -- N preds expected: 104 + -- N preds made: 104 + +--- Computing oobag predictions: tree 106 --- + + -- N preds expected: 100 + -- N preds made: 100 + +--- Computing oobag predictions: tree 107 --- + + -- N preds expected: 97 + -- N preds made: 97 + +--- Computing oobag predictions: tree 108 --- + + -- N preds expected: 106 + -- N preds made: 106 + +--- Computing oobag predictions: tree 109 --- + + -- N preds expected: 103 + -- N preds made: 103 + +--- Computing oobag predictions: tree 110 --- + + -- N preds expected: 104 + -- N preds made: 104 + +--- Computing oobag predictions: tree 111 --- + + -- N preds expected: 106 + -- N preds made: 106 + +--- Computing oobag predictions: tree 112 --- + + -- N preds expected: 105 + -- N preds made: 105 + +--- Computing oobag predictions: tree 113 --- + + -- N preds expected: 107 + -- N preds made: 107 + +--- Computing oobag predictions: tree 114 --- + + -- N preds expected: 111 + -- N preds made: 111 + +--- Computing oobag predictions: tree 115 --- + + -- N preds expected: 97 + -- N preds made: 97 + +--- Computing oobag predictions: tree 116 --- + + -- N preds expected: 101 + -- N preds made: 101 + +--- Computing oobag predictions: tree 117 --- + + -- N preds expected: 106 + -- N preds made: 106 + +--- Computing oobag predictions: tree 118 --- + + -- N preds expected: 94 + -- N preds made: 94 + +--- Computing oobag predictions: tree 119 --- + + -- N preds expected: 98 + -- N preds made: 98 + +--- Computing oobag predictions: tree 120 --- + + -- N preds expected: 102 + -- N preds made: 102 + +--- Computing oobag predictions: tree 121 --- + + -- N preds expected: 100 + -- N preds made: 100 + +--- Computing oobag predictions: tree 122 --- + + -- N preds expected: 100 + -- N preds made: 100 + +--- Computing oobag predictions: tree 123 --- + + -- N preds expected: 101 + -- N preds made: 101 + +--- Computing oobag predictions: tree 124 --- + + -- N preds expected: 100 + -- N preds made: 100 + +--- Computing oobag predictions: tree 125 --- + + -- N preds expected: 105 + -- N preds made: 105 + +--- Computing oobag predictions: tree 126 --- + + -- N preds expected: 99 + -- N preds made: 99 + +--- Computing oobag predictions: tree 127 --- + + -- N preds expected: 106 + -- N preds made: 106 + +--- Computing oobag predictions: tree 128 --- + + -- N preds expected: 106 + -- N preds made: 106 + +--- Computing oobag predictions: tree 129 --- + + -- N preds expected: 103 + -- N preds made: 103 + +--- Computing oobag predictions: tree 130 --- + + -- N preds expected: 104 + -- N preds made: 104 + +--- Computing oobag predictions: tree 131 --- + + -- N preds expected: 100 + -- N preds made: 100 + +--- Computing oobag predictions: tree 132 --- + + -- N preds expected: 112 + -- N preds made: 112 + +--- Computing oobag predictions: tree 133 --- + + -- N preds expected: 99 + -- N preds made: 99 + +--- Computing oobag predictions: tree 134 --- + + -- N preds expected: 105 + -- N preds made: 105 + +--- Computing oobag predictions: tree 135 --- + + -- N preds expected: 106 + -- N preds made: 106 + +--- Computing oobag predictions: tree 136 --- + + -- N preds expected: 99 + -- N preds made: 99 + +--- Computing oobag predictions: tree 137 --- + + -- N preds expected: 113 + -- N preds made: 113 + +--- Computing oobag predictions: tree 138 --- + + -- N preds expected: 109 + -- N preds made: 109 + +--- Computing oobag predictions: tree 139 --- + + -- N preds expected: 102 + -- N preds made: 102 + +--- Computing oobag predictions: tree 140 --- + + -- N preds expected: 108 + -- N preds made: 108 + +--- Computing oobag predictions: tree 141 --- + + -- N preds expected: 98 + -- N preds made: 98 + +--- Computing oobag predictions: tree 142 --- + + -- N preds expected: 107 + -- N preds made: 107 + +--- Computing oobag predictions: tree 143 --- + + -- N preds expected: 98 + -- N preds made: 98 + +--- Computing oobag predictions: tree 144 --- + + -- N preds expected: 89 + -- N preds made: 89 + +--- Computing oobag predictions: tree 145 --- + + -- N preds expected: 95 + -- N preds made: 95 + +--- Computing oobag predictions: tree 146 --- + + -- N preds expected: 97 + -- N preds made: 97 + +--- Computing oobag predictions: tree 147 --- + + -- N preds expected: 101 + -- N preds made: 101 + +--- Computing oobag predictions: tree 148 --- + + -- N preds expected: 93 + -- N preds made: 93 + +--- Computing oobag predictions: tree 149 --- + + -- N preds expected: 102 + -- N preds made: 102 + +--- Computing oobag predictions: tree 150 --- + + -- N preds expected: 101 + -- N preds made: 101 + +--- Computing oobag predictions: tree 151 --- + + -- N preds expected: 112 + -- N preds made: 112 + +--- Computing oobag predictions: tree 152 --- + + -- N preds expected: 93 + -- N preds made: 93 + +--- Computing oobag predictions: tree 153 --- + + -- N preds expected: 104 + -- N preds made: 104 + +--- Computing oobag predictions: tree 154 --- + + -- N preds expected: 101 + -- N preds made: 101 + +--- Computing oobag predictions: tree 155 --- + + -- N preds expected: 111 + -- N preds made: 111 + +--- Computing oobag predictions: tree 156 --- + + -- N preds expected: 101 + -- N preds made: 101 + +--- Computing oobag predictions: tree 157 --- + + -- N preds expected: 95 + -- N preds made: 95 + +--- Computing oobag predictions: tree 158 --- + + -- N preds expected: 102 + -- N preds made: 102 + +--- Computing oobag predictions: tree 159 --- + + -- N preds expected: 106 + -- N preds made: 106 + +--- Computing oobag predictions: tree 160 --- + + -- N preds expected: 101 + -- N preds made: 101 + +--- Computing oobag predictions: tree 161 --- + + -- N preds expected: 100 + -- N preds made: 100 + +--- Computing oobag predictions: tree 162 --- + + -- N preds expected: 103 + -- N preds made: 103 + +--- Computing oobag predictions: tree 163 --- + + -- N preds expected: 94 + -- N preds made: 94 + +--- Computing oobag predictions: tree 164 --- + + -- N preds expected: 107 + -- N preds made: 107 + +--- Computing oobag predictions: tree 165 --- + + -- N preds expected: 93 + -- N preds made: 93 + +--- Computing oobag predictions: tree 166 --- + + -- N preds expected: 101 + -- N preds made: 101 + +--- Computing oobag predictions: tree 167 --- + + -- N preds expected: 98 + -- N preds made: 98 + +--- Computing oobag predictions: tree 168 --- + + -- N preds expected: 104 + -- N preds made: 104 + +--- Computing oobag predictions: tree 169 --- + + -- N preds expected: 95 + -- N preds made: 95 + +--- Computing oobag predictions: tree 170 --- + + -- N preds expected: 92 + -- N preds made: 92 + +--- Computing oobag predictions: tree 171 --- + + -- N preds expected: 104 + -- N preds made: 104 + +--- Computing oobag predictions: tree 172 --- + + -- N preds expected: 109 + -- N preds made: 109 + +--- Computing oobag predictions: tree 173 --- + + -- N preds expected: 105 + -- N preds made: 105 + +--- Computing oobag predictions: tree 174 --- + + -- N preds expected: 108 + -- N preds made: 108 + +--- Computing oobag predictions: tree 175 --- + + -- N preds expected: 103 + -- N preds made: 103 + +--- Computing oobag predictions: tree 176 --- + + -- N preds expected: 103 + -- N preds made: 103 + +--- Computing oobag predictions: tree 177 --- + + -- N preds expected: 97 + -- N preds made: 97 + +--- Computing oobag predictions: tree 178 --- + + -- N preds expected: 98 + -- N preds made: 98 + +--- Computing oobag predictions: tree 179 --- + + -- N preds expected: 96 + -- N preds made: 96 + +--- Computing oobag predictions: tree 180 --- + + -- N preds expected: 94 + -- N preds made: 94 + +--- Computing oobag predictions: tree 181 --- + + -- N preds expected: 97 + -- N preds made: 97 + +--- Computing oobag predictions: tree 182 --- + + -- N preds expected: 96 + -- N preds made: 96 + +--- Computing oobag predictions: tree 183 --- + + -- N preds expected: 114 + -- N preds made: 114 + +--- Computing oobag predictions: tree 184 --- + + -- N preds expected: 109 + -- N preds made: 109 + +--- Computing oobag predictions: tree 185 --- + + -- N preds expected: 100 + -- N preds made: 100 + +--- Computing oobag predictions: tree 186 --- + + -- N preds expected: 101 + -- N preds made: 101 + +--- Computing oobag predictions: tree 187 --- + + -- N preds expected: 88 + -- N preds made: 88 + +--- Computing oobag predictions: tree 188 --- + + -- N preds expected: 99 + -- N preds made: 99 + +--- Computing oobag predictions: tree 189 --- + + -- N preds expected: 97 + -- N preds made: 97 + +--- Computing oobag predictions: tree 190 --- + + -- N preds expected: 108 + -- N preds made: 108 + +--- Computing oobag predictions: tree 191 --- + + -- N preds expected: 99 + -- N preds made: 99 + +--- Computing oobag predictions: tree 192 --- + + -- N preds expected: 103 + -- N preds made: 103 + +--- Computing oobag predictions: tree 193 --- + + -- N preds expected: 97 + -- N preds made: 97 + +--- Computing oobag predictions: tree 194 --- + + -- N preds expected: 111 + -- N preds made: 111 + +--- Computing oobag predictions: tree 195 --- + + -- N preds expected: 108 + -- N preds made: 108 + +--- Computing oobag predictions: tree 196 --- + + -- N preds expected: 105 + -- N preds made: 105 + +--- Computing oobag predictions: tree 197 --- + + -- N preds expected: 104 + -- N preds made: 104 + +--- Computing oobag predictions: tree 198 --- + + -- N preds expected: 101 + -- N preds made: 101 + +--- Computing oobag predictions: tree 199 --- + + -- N preds expected: 101 + -- N preds made: 101 + +--- Computing oobag predictions: tree 200 --- + + -- N preds expected: 103 + -- N preds made: 103 + +--- Computing oobag predictions: tree 201 --- + + -- N preds expected: 97 + -- N preds made: 97 + +--- Computing oobag predictions: tree 202 --- + + -- N preds expected: 101 + -- N preds made: 101 + +--- Computing oobag predictions: tree 203 --- + + -- N preds expected: 99 + -- N preds made: 99 + +--- Computing oobag predictions: tree 204 --- + + -- N preds expected: 100 + -- N preds made: 100 + +--- Computing oobag predictions: tree 205 --- + + -- N preds expected: 106 + -- N preds made: 106 + +--- Computing oobag predictions: tree 206 --- + + -- N preds expected: 105 + -- N preds made: 105 + +--- Computing oobag predictions: tree 207 --- + + -- N preds expected: 102 + -- N preds made: 102 + +--- Computing oobag predictions: tree 208 --- + + -- N preds expected: 91 + -- N preds made: 91 + +--- Computing oobag predictions: tree 209 --- + + -- N preds expected: 93 + -- N preds made: 93 + +--- Computing oobag predictions: tree 210 --- + + -- N preds expected: 109 + -- N preds made: 109 + +--- Computing oobag predictions: tree 211 --- + + -- N preds expected: 107 + -- N preds made: 107 + +--- Computing oobag predictions: tree 212 --- + + -- N preds expected: 101 + -- N preds made: 101 + +--- Computing oobag predictions: tree 213 --- + + -- N preds expected: 105 + -- N preds made: 105 + +--- Computing oobag predictions: tree 214 --- + + -- N preds expected: 102 + -- N preds made: 102 + +--- Computing oobag predictions: tree 215 --- + + -- N preds expected: 109 + -- N preds made: 109 + +--- Computing oobag predictions: tree 216 --- + + -- N preds expected: 101 + -- N preds made: 101 + +--- Computing oobag predictions: tree 217 --- + + -- N preds expected: 106 + -- N preds made: 106 + +--- Computing oobag predictions: tree 218 --- + + -- N preds expected: 100 + -- N preds made: 100 + +--- Computing oobag predictions: tree 219 --- + + -- N preds expected: 102 + -- N preds made: 102 + +--- Computing oobag predictions: tree 220 --- + + -- N preds expected: 98 + -- N preds made: 98 + +--- Computing oobag predictions: tree 221 --- + + -- N preds expected: 98 + -- N preds made: 98 + +--- Computing oobag predictions: tree 222 --- + + -- N preds expected: 96 + -- N preds made: 96 + +--- Computing oobag predictions: tree 223 --- + + -- N preds expected: 97 + -- N preds made: 97 + +--- Computing oobag predictions: tree 224 --- + + -- N preds expected: 98 + -- N preds made: 98 + +--- Computing oobag predictions: tree 225 --- + + -- N preds expected: 106 + -- N preds made: 106 + +--- Computing oobag predictions: tree 226 --- + + -- N preds expected: 115 + -- N preds made: 115 + +--- Computing oobag predictions: tree 227 --- + + -- N preds expected: 103 + -- N preds made: 103 + +--- Computing oobag predictions: tree 228 --- + + -- N preds expected: 102 + -- N preds made: 102 + +--- Computing oobag predictions: tree 229 --- + + -- N preds expected: 98 + -- N preds made: 98 + +--- Computing oobag predictions: tree 230 --- + + -- N preds expected: 108 + -- N preds made: 108 + +--- Computing oobag predictions: tree 231 --- + + -- N preds expected: 103 + -- N preds made: 103 + +--- Computing oobag predictions: tree 232 --- + + -- N preds expected: 103 + -- N preds made: 103 + +--- Computing oobag predictions: tree 233 --- + + -- N preds expected: 100 + -- N preds made: 100 + +--- Computing oobag predictions: tree 234 --- + + -- N preds expected: 104 + -- N preds made: 104 + +--- Computing oobag predictions: tree 235 --- + + -- N preds expected: 99 + -- N preds made: 99 + +--- Computing oobag predictions: tree 236 --- + + -- N preds expected: 103 + -- N preds made: 103 + +--- Computing oobag predictions: tree 237 --- + + -- N preds expected: 102 + -- N preds made: 102 + +--- Computing oobag predictions: tree 238 --- + + -- N preds expected: 104 + -- N preds made: 104 + +--- Computing oobag predictions: tree 239 --- + + -- N preds expected: 104 + -- N preds made: 104 + +--- Computing oobag predictions: tree 240 --- + + -- N preds expected: 100 + -- N preds made: 100 + +--- Computing oobag predictions: tree 241 --- + + -- N preds expected: 103 + -- N preds made: 103 + +--- Computing oobag predictions: tree 242 --- + + -- N preds expected: 102 + -- N preds made: 102 + +--- Computing oobag predictions: tree 243 --- + + -- N preds expected: 103 + -- N preds made: 103 + +--- Computing oobag predictions: tree 244 --- + + -- N preds expected: 115 + -- N preds made: 115 + +--- Computing oobag predictions: tree 245 --- + + -- N preds expected: 99 + -- N preds made: 99 + +--- Computing oobag predictions: tree 246 --- + + -- N preds expected: 96 + -- N preds made: 96 + +--- Computing oobag predictions: tree 247 --- + + -- N preds expected: 95 + -- N preds made: 95 + +--- Computing oobag predictions: tree 248 --- + + -- N preds expected: 101 + -- N preds made: 101 + +--- Computing oobag predictions: tree 249 --- + + -- N preds expected: 100 + -- N preds made: 100 + +--- Computing oobag predictions: tree 250 --- + + -- N preds expected: 94 + -- N preds made: 94 + +--- Computing oobag predictions: tree 251 --- + + -- N preds expected: 94 + -- N preds made: 94 + +--- Computing oobag predictions: tree 252 --- + + -- N preds expected: 108 + -- N preds made: 108 + +--- Computing oobag predictions: tree 253 --- + + -- N preds expected: 100 + -- N preds made: 100 + +--- Computing oobag predictions: tree 254 --- + + -- N preds expected: 114 + -- N preds made: 114 + +--- Computing oobag predictions: tree 255 --- + + -- N preds expected: 99 + -- N preds made: 99 + +--- Computing oobag predictions: tree 256 --- + + -- N preds expected: 106 + -- N preds made: 106 + +--- Computing oobag predictions: tree 257 --- + + -- N preds expected: 98 + -- N preds made: 98 + +--- Computing oobag predictions: tree 258 --- + + -- N preds expected: 100 + -- N preds made: 100 + +--- Computing oobag predictions: tree 259 --- + + -- N preds expected: 102 + -- N preds made: 102 + +--- Computing oobag predictions: tree 260 --- + + -- N preds expected: 109 + -- N preds made: 109 + +--- Computing oobag predictions: tree 261 --- + + -- N preds expected: 99 + -- N preds made: 99 + +--- Computing oobag predictions: tree 262 --- + + -- N preds expected: 104 + -- N preds made: 104 + +--- Computing oobag predictions: tree 263 --- + + -- N preds expected: 100 + -- N preds made: 100 + +--- Computing oobag predictions: tree 264 --- + + -- N preds expected: 102 + -- N preds made: 102 + +--- Computing oobag predictions: tree 265 --- + + -- N preds expected: 94 + -- N preds made: 94 + +--- Computing oobag predictions: tree 266 --- + + -- N preds expected: 112 + -- N preds made: 112 + +--- Computing oobag predictions: tree 267 --- + + -- N preds expected: 96 + -- N preds made: 96 + +--- Computing oobag predictions: tree 268 --- + + -- N preds expected: 104 + -- N preds made: 104 + +--- Computing oobag predictions: tree 269 --- + + -- N preds expected: 97 + -- N preds made: 97 + +--- Computing oobag predictions: tree 270 --- + + -- N preds expected: 101 + -- N preds made: 101 + +--- Computing oobag predictions: tree 271 --- + + -- N preds expected: 100 + -- N preds made: 100 + +--- Computing oobag predictions: tree 272 --- + + -- N preds expected: 108 + -- N preds made: 108 + +--- Computing oobag predictions: tree 273 --- + + -- N preds expected: 104 + -- N preds made: 104 + +--- Computing oobag predictions: tree 274 --- + + -- N preds expected: 104 + -- N preds made: 104 + +--- Computing oobag predictions: tree 275 --- + + -- N preds expected: 106 + -- N preds made: 106 + +--- Computing oobag predictions: tree 276 --- + + -- N preds expected: 102 + -- N preds made: 102 + +--- Computing oobag predictions: tree 277 --- + + -- N preds expected: 103 + -- N preds made: 103 + +--- Computing oobag predictions: tree 278 --- + + -- N preds expected: 104 + -- N preds made: 104 + +--- Computing oobag predictions: tree 279 --- + + -- N preds expected: 103 + -- N preds made: 103 + +--- Computing oobag predictions: tree 280 --- + + -- N preds expected: 100 + -- N preds made: 100 + +--- Computing oobag predictions: tree 281 --- + + -- N preds expected: 94 + -- N preds made: 94 + +--- Computing oobag predictions: tree 282 --- + + -- N preds expected: 99 + -- N preds made: 99 + +--- Computing oobag predictions: tree 283 --- + + -- N preds expected: 111 + -- N preds made: 111 + +--- Computing oobag predictions: tree 284 --- + + -- N preds expected: 105 + -- N preds made: 105 + +--- Computing oobag predictions: tree 285 --- + + -- N preds expected: 114 + -- N preds made: 114 + +--- Computing oobag predictions: tree 286 --- + + -- N preds expected: 103 + -- N preds made: 103 + +--- Computing oobag predictions: tree 287 --- + + -- N preds expected: 99 + -- N preds made: 99 + +--- Computing oobag predictions: tree 288 --- + + -- N preds expected: 103 + -- N preds made: 103 + +--- Computing oobag predictions: tree 289 --- + + -- N preds expected: 105 + -- N preds made: 105 + +--- Computing oobag predictions: tree 290 --- + + -- N preds expected: 97 + -- N preds made: 97 + +--- Computing oobag predictions: tree 291 --- + + -- N preds expected: 107 + -- N preds made: 107 + +--- Computing oobag predictions: tree 292 --- + + -- N preds expected: 95 + -- N preds made: 95 + +--- Computing oobag predictions: tree 293 --- + + -- N preds expected: 104 + -- N preds made: 104 + +--- Computing oobag predictions: tree 294 --- + + -- N preds expected: 109 + -- N preds made: 109 + +--- Computing oobag predictions: tree 295 --- + + -- N preds expected: 94 + -- N preds made: 94 + +--- Computing oobag predictions: tree 296 --- + + -- N preds expected: 101 + -- N preds made: 101 + +--- Computing oobag predictions: tree 297 --- + + -- N preds expected: 105 + -- N preds made: 105 + +--- Computing oobag predictions: tree 298 --- + + -- N preds expected: 102 + -- N preds made: 102 + +--- Computing oobag predictions: tree 299 --- + + -- N preds expected: 97 + -- N preds made: 97 + +--- Computing oobag predictions: tree 300 --- + + -- N preds expected: 109 + -- N preds made: 109 + +--- Computing oobag predictions: tree 301 --- + + -- N preds expected: 100 + -- N preds made: 100 + +--- Computing oobag predictions: tree 302 --- + + -- N preds expected: 96 + -- N preds made: 96 + +--- Computing oobag predictions: tree 303 --- + + -- N preds expected: 90 + -- N preds made: 90 + +--- Computing oobag predictions: tree 304 --- + + -- N preds expected: 110 + -- N preds made: 110 + +--- Computing oobag predictions: tree 305 --- + + -- N preds expected: 94 + -- N preds made: 94 + +--- Computing oobag predictions: tree 306 --- + + -- N preds expected: 99 + -- N preds made: 99 + +--- Computing oobag predictions: tree 307 --- + + -- N preds expected: 111 + -- N preds made: 111 + +--- Computing oobag predictions: tree 308 --- + + -- N preds expected: 106 + -- N preds made: 106 + +--- Computing oobag predictions: tree 309 --- + + -- N preds expected: 97 + -- N preds made: 97 + +--- Computing oobag predictions: tree 310 --- + + -- N preds expected: 97 + -- N preds made: 97 + +--- Computing oobag predictions: tree 311 --- + + -- N preds expected: 100 + -- N preds made: 100 + +--- Computing oobag predictions: tree 312 --- + + -- N preds expected: 99 + -- N preds made: 99 + +--- Computing oobag predictions: tree 313 --- + + -- N preds expected: 101 + -- N preds made: 101 + +--- Computing oobag predictions: tree 314 --- + + -- N preds expected: 107 + -- N preds made: 107 + +--- Computing oobag predictions: tree 315 --- + + -- N preds expected: 103 + -- N preds made: 103 + +--- Computing oobag predictions: tree 316 --- + + -- N preds expected: 91 + -- N preds made: 91 + +--- Computing oobag predictions: tree 317 --- + + -- N preds expected: 101 + -- N preds made: 101 + +--- Computing oobag predictions: tree 318 --- + + -- N preds expected: 102 + -- N preds made: 102 + +--- Computing oobag predictions: tree 319 --- + + -- N preds expected: 102 + -- N preds made: 102 + +--- Computing oobag predictions: tree 320 --- + + -- N preds expected: 104 + -- N preds made: 104 + +--- Computing oobag predictions: tree 321 --- + + -- N preds expected: 97 + -- N preds made: 97 + +--- Computing oobag predictions: tree 322 --- + + -- N preds expected: 102 + -- N preds made: 102 + +--- Computing oobag predictions: tree 323 --- + + -- N preds expected: 96 + -- N preds made: 96 + +--- Computing oobag predictions: tree 324 --- + + -- N preds expected: 98 + -- N preds made: 98 + +--- Computing oobag predictions: tree 325 --- + + -- N preds expected: 101 + -- N preds made: 101 + +--- Computing oobag predictions: tree 326 --- + + -- N preds expected: 100 + -- N preds made: 100 + +--- Computing oobag predictions: tree 327 --- + + -- N preds expected: 98 + -- N preds made: 98 + +--- Computing oobag predictions: tree 328 --- + + -- N preds expected: 108 + -- N preds made: 108 + +--- Computing oobag predictions: tree 329 --- + + -- N preds expected: 103 + -- N preds made: 103 + +--- Computing oobag predictions: tree 330 --- + + -- N preds expected: 101 + -- N preds made: 101 + +--- Computing oobag predictions: tree 331 --- + + -- N preds expected: 96 + -- N preds made: 96 + +--- Computing oobag predictions: tree 332 --- + + -- N preds expected: 101 + -- N preds made: 101 + +--- Computing oobag predictions: tree 333 --- + + -- N preds expected: 97 + -- N preds made: 97 + +--- Computing oobag predictions: tree 334 --- + + -- N preds expected: 97 + -- N preds made: 97 + +--- Computing oobag predictions: tree 335 --- + + -- N preds expected: 98 + -- N preds made: 98 + +--- Computing oobag predictions: tree 336 --- + + -- N preds expected: 88 + -- N preds made: 88 + +--- Computing oobag predictions: tree 337 --- + + -- N preds expected: 107 + -- N preds made: 107 + +--- Computing oobag predictions: tree 338 --- + + -- N preds expected: 108 + -- N preds made: 108 + +--- Computing oobag predictions: tree 339 --- + + -- N preds expected: 99 + -- N preds made: 99 + +--- Computing oobag predictions: tree 340 --- + + -- N preds expected: 99 + -- N preds made: 99 + +--- Computing oobag predictions: tree 341 --- + + -- N preds expected: 120 + -- N preds made: 120 + +--- Computing oobag predictions: tree 342 --- + + -- N preds expected: 101 + -- N preds made: 101 + +--- Computing oobag predictions: tree 343 --- + + -- N preds expected: 105 + -- N preds made: 105 + +--- Computing oobag predictions: tree 344 --- + + -- N preds expected: 108 + -- N preds made: 108 + +--- Computing oobag predictions: tree 345 --- + + -- N preds expected: 102 + -- N preds made: 102 + +--- Computing oobag predictions: tree 346 --- + + -- N preds expected: 104 + -- N preds made: 104 + +--- Computing oobag predictions: tree 347 --- + + -- N preds expected: 98 + -- N preds made: 98 + +--- Computing oobag predictions: tree 348 --- + + -- N preds expected: 109 + -- N preds made: 109 + +--- Computing oobag predictions: tree 349 --- + + -- N preds expected: 99 + -- N preds made: 99 + +--- Computing oobag predictions: tree 350 --- + + -- N preds expected: 102 + -- N preds made: 102 + +--- Computing oobag predictions: tree 351 --- + + -- N preds expected: 91 + -- N preds made: 91 + +--- Computing oobag predictions: tree 352 --- + + -- N preds expected: 109 + -- N preds made: 109 + +--- Computing oobag predictions: tree 353 --- + + -- N preds expected: 103 + -- N preds made: 103 + +--- Computing oobag predictions: tree 354 --- + + -- N preds expected: 102 + -- N preds made: 102 + +--- Computing oobag predictions: tree 355 --- + + -- N preds expected: 104 + -- N preds made: 104 + +--- Computing oobag predictions: tree 356 --- + + -- N preds expected: 101 + -- N preds made: 101 + +--- Computing oobag predictions: tree 357 --- + + -- N preds expected: 95 + -- N preds made: 95 + +--- Computing oobag predictions: tree 358 --- + + -- N preds expected: 106 + -- N preds made: 106 + +--- Computing oobag predictions: tree 359 --- + + -- N preds expected: 113 + -- N preds made: 113 + +--- Computing oobag predictions: tree 360 --- + + -- N preds expected: 104 + -- N preds made: 104 + +--- Computing oobag predictions: tree 361 --- + + -- N preds expected: 98 + -- N preds made: 98 + +--- Computing oobag predictions: tree 362 --- + + -- N preds expected: 95 + -- N preds made: 95 + +--- Computing oobag predictions: tree 363 --- + + -- N preds expected: 104 + -- N preds made: 104 + +--- Computing oobag predictions: tree 364 --- + + -- N preds expected: 101 + -- N preds made: 101 + +--- Computing oobag predictions: tree 365 --- + + -- N preds expected: 104 + -- N preds made: 104 + +--- Computing oobag predictions: tree 366 --- + + -- N preds expected: 93 + -- N preds made: 93 + +--- Computing oobag predictions: tree 367 --- + + -- N preds expected: 102 + -- N preds made: 102 + +--- Computing oobag predictions: tree 368 --- + + -- N preds expected: 97 + -- N preds made: 97 + +--- Computing oobag predictions: tree 369 --- + + -- N preds expected: 101 + -- N preds made: 101 + +--- Computing oobag predictions: tree 370 --- + + -- N preds expected: 99 + -- N preds made: 99 + +--- Computing oobag predictions: tree 371 --- + + -- N preds expected: 105 + -- N preds made: 105 + +--- Computing oobag predictions: tree 372 --- + + -- N preds expected: 108 + -- N preds made: 108 + +--- Computing oobag predictions: tree 373 --- + + -- N preds expected: 97 + -- N preds made: 97 + +--- Computing oobag predictions: tree 374 --- + + -- N preds expected: 113 + -- N preds made: 113 + +--- Computing oobag predictions: tree 375 --- + + -- N preds expected: 96 + -- N preds made: 96 + +--- Computing oobag predictions: tree 376 --- + + -- N preds expected: 104 + -- N preds made: 104 + +--- Computing oobag predictions: tree 377 --- + + -- N preds expected: 100 + -- N preds made: 100 + +--- Computing oobag predictions: tree 378 --- + + -- N preds expected: 102 + -- N preds made: 102 + +--- Computing oobag predictions: tree 379 --- + + -- N preds expected: 105 + -- N preds made: 105 + +--- Computing oobag predictions: tree 380 --- + + -- N preds expected: 105 + -- N preds made: 105 + +--- Computing oobag predictions: tree 381 --- + + -- N preds expected: 97 + -- N preds made: 97 + +--- Computing oobag predictions: tree 382 --- + + -- N preds expected: 101 + -- N preds made: 101 + +--- Computing oobag predictions: tree 383 --- + + -- N preds expected: 102 + -- N preds made: 102 + +--- Computing oobag predictions: tree 384 --- + + -- N preds expected: 101 + -- N preds made: 101 + +--- Computing oobag predictions: tree 385 --- + + -- N preds expected: 107 + -- N preds made: 107 + +--- Computing oobag predictions: tree 386 --- + + -- N preds expected: 108 + -- N preds made: 108 + +--- Computing oobag predictions: tree 387 --- + + -- N preds expected: 97 + -- N preds made: 97 + +--- Computing oobag predictions: tree 388 --- + + -- N preds expected: 103 + -- N preds made: 103 + +--- Computing oobag predictions: tree 389 --- + + -- N preds expected: 94 + -- N preds made: 94 + +--- Computing oobag predictions: tree 390 --- + + -- N preds expected: 102 + -- N preds made: 102 + +--- Computing oobag predictions: tree 391 --- + + -- N preds expected: 95 + -- N preds made: 95 + +--- Computing oobag predictions: tree 392 --- + + -- N preds expected: 100 + -- N preds made: 100 + +--- Computing oobag predictions: tree 393 --- + + -- N preds expected: 112 + -- N preds made: 112 + +--- Computing oobag predictions: tree 394 --- + + -- N preds expected: 102 + -- N preds made: 102 + +--- Computing oobag predictions: tree 395 --- + + -- N preds expected: 98 + -- N preds made: 98 + +--- Computing oobag predictions: tree 396 --- + + -- N preds expected: 98 + -- N preds made: 98 + +--- Computing oobag predictions: tree 397 --- + + -- N preds expected: 93 + -- N preds made: 93 + +--- Computing oobag predictions: tree 398 --- + + -- N preds expected: 98 + -- N preds made: 98 + +--- Computing oobag predictions: tree 399 --- + + -- N preds expected: 91 + -- N preds made: 91 + +--- Computing oobag predictions: tree 400 --- + + -- N preds expected: 113 + -- N preds made: 113 + +--- Computing oobag predictions: tree 401 --- + + -- N preds expected: 112 + -- N preds made: 112 + +--- Computing oobag predictions: tree 402 --- + + -- N preds expected: 99 + -- N preds made: 99 + +--- Computing oobag predictions: tree 403 --- + + -- N preds expected: 99 + -- N preds made: 99 + +--- Computing oobag predictions: tree 404 --- + + -- N preds expected: 103 + -- N preds made: 103 + +--- Computing oobag predictions: tree 405 --- + + -- N preds expected: 98 + -- N preds made: 98 + +--- Computing oobag predictions: tree 406 --- + + -- N preds expected: 103 + -- N preds made: 103 + +--- Computing oobag predictions: tree 407 --- + + -- N preds expected: 100 + -- N preds made: 100 + +--- Computing oobag predictions: tree 408 --- + + -- N preds expected: 97 + -- N preds made: 97 + +--- Computing oobag predictions: tree 409 --- + + -- N preds expected: 94 + -- N preds made: 94 + +--- Computing oobag predictions: tree 410 --- + + -- N preds expected: 103 + -- N preds made: 103 + +--- Computing oobag predictions: tree 411 --- + + -- N preds expected: 105 + -- N preds made: 105 + +--- Computing oobag predictions: tree 412 --- + + -- N preds expected: 104 + -- N preds made: 104 + +--- Computing oobag predictions: tree 413 --- + + -- N preds expected: 103 + -- N preds made: 103 + +--- Computing oobag predictions: tree 414 --- + + -- N preds expected: 101 + -- N preds made: 101 + +--- Computing oobag predictions: tree 415 --- + + -- N preds expected: 106 + -- N preds made: 106 + +--- Computing oobag predictions: tree 416 --- + + -- N preds expected: 96 + -- N preds made: 96 + +--- Computing oobag predictions: tree 417 --- + + -- N preds expected: 101 + -- N preds made: 101 + +--- Computing oobag predictions: tree 418 --- + + -- N preds expected: 106 + -- N preds made: 106 + +--- Computing oobag predictions: tree 419 --- + + -- N preds expected: 98 + -- N preds made: 98 + +--- Computing oobag predictions: tree 420 --- + + -- N preds expected: 104 + -- N preds made: 104 + +--- Computing oobag predictions: tree 421 --- + + -- N preds expected: 105 + -- N preds made: 105 + +--- Computing oobag predictions: tree 422 --- + + -- N preds expected: 104 + -- N preds made: 104 + +--- Computing oobag predictions: tree 423 --- + + -- N preds expected: 106 + -- N preds made: 106 + +--- Computing oobag predictions: tree 424 --- + + -- N preds expected: 101 + -- N preds made: 101 + +--- Computing oobag predictions: tree 425 --- + + -- N preds expected: 82 + -- N preds made: 82 + +--- Computing oobag predictions: tree 426 --- + + -- N preds expected: 99 + -- N preds made: 99 + +--- Computing oobag predictions: tree 427 --- + + -- N preds expected: 98 + -- N preds made: 98 + +--- Computing oobag predictions: tree 428 --- + + -- N preds expected: 98 + -- N preds made: 98 + +--- Computing oobag predictions: tree 429 --- + + -- N preds expected: 102 + -- N preds made: 102 + +--- Computing oobag predictions: tree 430 --- + + -- N preds expected: 102 + -- N preds made: 102 + +--- Computing oobag predictions: tree 431 --- + + -- N preds expected: 106 + -- N preds made: 106 + +--- Computing oobag predictions: tree 432 --- + + -- N preds expected: 98 + -- N preds made: 98 + +--- Computing oobag predictions: tree 433 --- + + -- N preds expected: 102 + -- N preds made: 102 + +--- Computing oobag predictions: tree 434 --- + + -- N preds expected: 108 + -- N preds made: 108 + +--- Computing oobag predictions: tree 435 --- + + -- N preds expected: 90 + -- N preds made: 90 + +--- Computing oobag predictions: tree 436 --- + + -- N preds expected: 96 + -- N preds made: 96 + +--- Computing oobag predictions: tree 437 --- + + -- N preds expected: 104 + -- N preds made: 104 + +--- Computing oobag predictions: tree 438 --- + + -- N preds expected: 98 + -- N preds made: 98 + +--- Computing oobag predictions: tree 439 --- + + -- N preds expected: 109 + -- N preds made: 109 + +--- Computing oobag predictions: tree 440 --- + + -- N preds expected: 105 + -- N preds made: 105 + +--- Computing oobag predictions: tree 441 --- + + -- N preds expected: 100 + -- N preds made: 100 + +--- Computing oobag predictions: tree 442 --- + + -- N preds expected: 98 + -- N preds made: 98 + +--- Computing oobag predictions: tree 443 --- + + -- N preds expected: 102 + -- N preds made: 102 + +--- Computing oobag predictions: tree 444 --- + + -- N preds expected: 108 + -- N preds made: 108 + +--- Computing oobag predictions: tree 445 --- + + -- N preds expected: 108 + -- N preds made: 108 + +--- Computing oobag predictions: tree 446 --- + + -- N preds expected: 104 + -- N preds made: 104 + +--- Computing oobag predictions: tree 447 --- + + -- N preds expected: 103 + -- N preds made: 103 + +--- Computing oobag predictions: tree 448 --- + + -- N preds expected: 97 + -- N preds made: 97 + +--- Computing oobag predictions: tree 449 --- + + -- N preds expected: 102 + -- N preds made: 102 + +--- Computing oobag predictions: tree 450 --- + + -- N preds expected: 100 + -- N preds made: 100 + +--- Computing oobag predictions: tree 451 --- + + -- N preds expected: 97 + -- N preds made: 97 + +--- Computing oobag predictions: tree 452 --- + + -- N preds expected: 100 + -- N preds made: 100 + +--- Computing oobag predictions: tree 453 --- + + -- N preds expected: 106 + -- N preds made: 106 + +--- Computing oobag predictions: tree 454 --- + + -- N preds expected: 98 + -- N preds made: 98 + +--- Computing oobag predictions: tree 455 --- + + -- N preds expected: 97 + -- N preds made: 97 + +--- Computing oobag predictions: tree 456 --- + + -- N preds expected: 108 + -- N preds made: 108 + +--- Computing oobag predictions: tree 457 --- + + -- N preds expected: 99 + -- N preds made: 99 + +--- Computing oobag predictions: tree 458 --- + + -- N preds expected: 92 + -- N preds made: 92 + +--- Computing oobag predictions: tree 459 --- + + -- N preds expected: 101 + -- N preds made: 101 + +--- Computing oobag predictions: tree 460 --- + + -- N preds expected: 99 + -- N preds made: 99 + +--- Computing oobag predictions: tree 461 --- + + -- N preds expected: 98 + -- N preds made: 98 + +--- Computing oobag predictions: tree 462 --- + + -- N preds expected: 99 + -- N preds made: 99 + +--- Computing oobag predictions: tree 463 --- + + -- N preds expected: 109 + -- N preds made: 109 + +--- Computing oobag predictions: tree 464 --- + + -- N preds expected: 104 + -- N preds made: 104 + +--- Computing oobag predictions: tree 465 --- + + -- N preds expected: 101 + -- N preds made: 101 + +--- Computing oobag predictions: tree 466 --- + + -- N preds expected: 103 + -- N preds made: 103 + +--- Computing oobag predictions: tree 467 --- + + -- N preds expected: 101 + -- N preds made: 101 + +--- Computing oobag predictions: tree 468 --- + + -- N preds expected: 103 + -- N preds made: 103 + +--- Computing oobag predictions: tree 469 --- + + -- N preds expected: 108 + -- N preds made: 108 + +--- Computing oobag predictions: tree 470 --- + + -- N preds expected: 97 + -- N preds made: 97 + +--- Computing oobag predictions: tree 471 --- + + -- N preds expected: 109 + -- N preds made: 109 + +--- Computing oobag predictions: tree 472 --- + + -- N preds expected: 106 + -- N preds made: 106 + +--- Computing oobag predictions: tree 473 --- + + -- N preds expected: 104 + -- N preds made: 104 + +--- Computing oobag predictions: tree 474 --- + + -- N preds expected: 101 + -- N preds made: 101 + +--- Computing oobag predictions: tree 475 --- + + -- N preds expected: 102 + -- N preds made: 102 + +--- Computing oobag predictions: tree 476 --- + + -- N preds expected: 97 + -- N preds made: 97 + +--- Computing oobag predictions: tree 477 --- + + -- N preds expected: 94 + -- N preds made: 94 + +--- Computing oobag predictions: tree 478 --- + + -- N preds expected: 110 + -- N preds made: 110 + +--- Computing oobag predictions: tree 479 --- + + -- N preds expected: 98 + -- N preds made: 98 + +--- Computing oobag predictions: tree 480 --- + + -- N preds expected: 95 + -- N preds made: 95 + +--- Computing oobag predictions: tree 481 --- + + -- N preds expected: 102 + -- N preds made: 102 + +--- Computing oobag predictions: tree 482 --- + + -- N preds expected: 100 + -- N preds made: 100 + +--- Computing oobag predictions: tree 483 --- + + -- N preds expected: 107 + -- N preds made: 107 + +--- Computing oobag predictions: tree 484 --- + + -- N preds expected: 101 + -- N preds made: 101 + +--- Computing oobag predictions: tree 485 --- + + -- N preds expected: 104 + -- N preds made: 104 + +--- Computing oobag predictions: tree 486 --- + + -- N preds expected: 101 + -- N preds made: 101 + +--- Computing oobag predictions: tree 487 --- + + -- N preds expected: 99 + -- N preds made: 99 + +--- Computing oobag predictions: tree 488 --- + + -- N preds expected: 109 + -- N preds made: 109 + +--- Computing oobag predictions: tree 489 --- + + -- N preds expected: 95 + -- N preds made: 95 + +--- Computing oobag predictions: tree 490 --- + + -- N preds expected: 107 + -- N preds made: 107 + +--- Computing oobag predictions: tree 491 --- + + -- N preds expected: 99 + -- N preds made: 99 + +--- Computing oobag predictions: tree 492 --- + + -- N preds expected: 89 + -- N preds made: 89 + +--- Computing oobag predictions: tree 493 --- + + -- N preds expected: 101 + -- N preds made: 101 + +--- Computing oobag predictions: tree 494 --- + + -- N preds expected: 97 + -- N preds made: 97 + +--- Computing oobag predictions: tree 495 --- + + -- N preds expected: 98 + -- N preds made: 98 + +--- Computing oobag predictions: tree 496 --- + + -- N preds expected: 100 + -- N preds made: 100 + +--- Computing oobag predictions: tree 497 --- + + -- N preds expected: 92 + -- N preds made: 92 + +--- Computing oobag predictions: tree 498 --- + + -- N preds expected: 107 + -- N preds made: 107 + +--- Computing oobag predictions: tree 499 --- + + -- N preds expected: 97 + -- N preds made: 97 + diff --git a/scratch.R b/scratch.R index 455079bd..1947d076 100644 --- a/scratch.R +++ b/scratch.R @@ -3,22 +3,26 @@ library(riskRegression) library(survival) tictoc::tic() +sink("orsf-output.txt") fit <- orsf(pbc_orsf, formula = Surv(time, status) ~ . - id, - oobag_pred_type = 'leaf', + oobag_pred_type = 'risk', oobag_pred_horizon = 1000, split_rule = 'logrank', + split_min_stat = 0.1, tree_seeds = 1:500, - importance = 'negate', - n_thread = 10) + n_tree = 500, + importance = 'none', + n_thread = 1, + verbose_progress = 0) +sink() tictoc::toc() fit$importance->tmp -# sink("orsf-output.txt") tictoc::tic() orsf_vi_negate(fit)->tmp2 +orsf_pd_oob(fit, pred_spec = list(bili = c(1:5))) tictoc::toc() -# sink() prd_5 = predict(fit, new_data = pbc_orsf, n_thread = 5, pred_type = 'mort', pred_aggregate = F, pred_horizon = c(500, 1000)) diff --git a/src/Data.h b/src/Data.h index 1f0406b9..e2370355 100644 --- a/src/Data.h +++ b/src/Data.h @@ -106,14 +106,40 @@ } + void fill_col(double value, uword j){ + + x.col(j).fill(value); + + } + + void restore_cols(arma::uvec cols){ + + if(cols.size() != mat_restore_values.n_cols){ + stop("restore_cols is not the right size"); + } + + uword i = 0; + for(const auto& j : cols){ + x.col(j) = mat_restore_values.col(i); + ++i; + } + + } + // member variables arma::uword n_cols; arma::uword n_rows; arma::vec w; + // for single column ops (e.g., permutation importance) arma::vec col_restore_values; + // for multi-column ops (e.g., partial dependence) + arma::mat mat_restore_values; + + + bool has_weights; private: diff --git a/src/Forest.cpp b/src/Forest.cpp index 64b633f2..4d043479 100644 --- a/src/Forest.cpp +++ b/src/Forest.cpp @@ -43,6 +43,10 @@ void Forest::init(std::unique_ptr input_data, EvalType oobag_eval_type, arma::uword oobag_eval_every, Rcpp::RObject oobag_R_function, + PartialDepType pd_type, + arma::mat& pd_x_vals, + arma::uvec& pd_x_cols, + arma::vec& pd_probs, uint n_thread, int verbosity){ @@ -73,6 +77,10 @@ void Forest::init(std::unique_ptr input_data, this->oobag_eval_type = oobag_eval_type; this->oobag_eval_every = oobag_eval_every; this->oobag_R_function = oobag_R_function; + this->pd_type = pd_type; + this->pd_x_vals = pd_x_vals; + this->pd_x_cols = pd_x_cols; + this->pd_probs = pd_probs; this->n_thread = n_thread; this->verbosity = verbosity; @@ -101,7 +109,7 @@ void Forest::init(std::unique_ptr input_data, void Forest::run(bool oobag){ - if (grow_mode) { // case 1: grow a new forest + if (grow_mode) { // if the forest hasn't been grown // plant first plant(); @@ -115,23 +123,26 @@ void Forest::run(bool oobag){ this->pred_values = predict(oobag); } - } else { - - // just initialize trees if the forest was already grown + } else { // if the forest was already grown + // initialize trees init_trees(); - } - // case 2: a grown forest used for prediction + // if using a grown forest for prediction if(pred_mode){ this->pred_values = predict(oobag); } - // case 3: a grown forest used for variable importance + // if using a grown forest for variable importance if(vi_type == VI_PERMUTE || vi_type == VI_NEGATE){ compute_oobag_vi(); } + // if using a grown forest for partial dependence + if(pd_type == PD_SUMMARY || pd_type == PD_ICE){ + this->pd_values = compute_dependence(oobag); + } + } void Forest::init_trees(){ @@ -557,28 +568,40 @@ mat Forest::predict(bool oobag) { } -// std::vector Forest::compute_dependence(bool oobag, -// mat x_vals, -// umat x_cols, -// bool summarize){ -// -// mat preds_summary; -// -// for(uword i = 0; i < x_vals.n_rows){ -// -// data->fill_x(x_vals[i], x_cols[i]); -// -// mat preds = predict(oobag); -// -// data->restore_col(x_vals[i], x_cols[i]); -// -// if(summarize) preds_summary = mean(preds,0); -// -// } -// -// -// -// } +std::vector Forest::compute_dependence(bool oobag){ + + uword n = pd_x_vals.n_rows; + + std::vector result; + result.reserve(n); + + for(uword i = 0; i < n; ++i){ + + uword j = 0; + for(const auto& x_col : pd_x_cols){ + data->fill_col(pd_x_vals.at(i, j), x_col); + ++j; + } + + mat preds = predict(oobag); + + if(pd_type == PD_SUMMARY){ + + mat preds_quant = quantile(preds, pd_probs, 0); + mat preds_summary = mean(preds, 0); + result.push_back(join_vert(preds_summary, preds_quant)); + + } else if(pd_type == PD_ICE) { + + result.push_back(preds); + + } + + } + + return(result); + +} void Forest::predict_single_thread(Data* prediction_data, bool oobag, diff --git a/src/Forest.h b/src/Forest.h index b093a68c..f2d284e8 100644 --- a/src/Forest.h +++ b/src/Forest.h @@ -65,6 +65,10 @@ class Forest { EvalType oobag_eval_type, arma::uword oobag_eval_every, Rcpp::RObject oobag_R_function, + PartialDepType pd_type, + arma::mat& pd_x_vals, + arma::uvec& pd_x_cols, + arma::vec& pd_probs, uint n_thread, int verbosity); @@ -190,6 +194,10 @@ class Forest { return(pred_values); } + std::vector& get_pd_values(){ + return(pd_values); + } + void run(bool oobag); virtual void plant() = 0; @@ -198,6 +206,8 @@ class Forest { arma::mat predict(bool oobag); + std::vector compute_dependence(bool oobag); + protected: void init_trees(); @@ -276,16 +286,21 @@ class Forest { arma::uword lincomb_ties_method; RObject lincomb_R_function; + bool grow_mode; + // predictions + PredType pred_type; bool pred_mode; bool pred_aggregate; - PredType pred_type; - - // is forest already grown? - bool grow_mode; - arma::mat pred_values; + // partial dependence + PartialDepType pd_type; + std::vector pd_values; + arma::mat pd_x_vals; + arma::uvec pd_x_cols; + arma::vec pd_probs; + // out-of-bag bool oobag_pred; arma::vec oobag_denom; diff --git a/src/RcppExports.cpp b/src/RcppExports.cpp index 62168773..a143d34f 100644 --- a/src/RcppExports.cpp +++ b/src/RcppExports.cpp @@ -56,8 +56,8 @@ BEGIN_RCPP END_RCPP } // orsf_cpp -List orsf_cpp(arma::mat& x, arma::mat& y, arma::vec& w, arma::uword tree_type_R, Rcpp::IntegerVector& tree_seeds, Rcpp::List loaded_forest, Rcpp::RObject lincomb_R_function, Rcpp::RObject oobag_R_function, arma::uword n_tree, arma::uword mtry, arma::uword vi_type_R, double vi_max_pvalue, double leaf_min_events, double leaf_min_obs, arma::uword split_rule_R, double split_min_events, double split_min_obs, double split_min_stat, arma::uword split_max_cuts, arma::uword split_max_retry, arma::uword lincomb_type_R, double lincomb_eps, arma::uword lincomb_iter_max, bool lincomb_scale, double lincomb_alpha, arma::uword lincomb_df_target, arma::uword lincomb_ties_method, bool pred_mode, arma::uword pred_type_R, arma::vec pred_horizon, bool pred_aggregate, bool oobag, arma::uword oobag_eval_type_R, arma::uword oobag_eval_every, unsigned int n_thread, bool write_forest, bool run_forest, int verbosity); -RcppExport SEXP _aorsf_orsf_cpp(SEXP xSEXP, SEXP ySEXP, SEXP wSEXP, SEXP tree_type_RSEXP, SEXP tree_seedsSEXP, SEXP loaded_forestSEXP, SEXP lincomb_R_functionSEXP, SEXP oobag_R_functionSEXP, SEXP n_treeSEXP, SEXP mtrySEXP, SEXP vi_type_RSEXP, SEXP vi_max_pvalueSEXP, SEXP leaf_min_eventsSEXP, SEXP leaf_min_obsSEXP, SEXP split_rule_RSEXP, SEXP split_min_eventsSEXP, SEXP split_min_obsSEXP, SEXP split_min_statSEXP, SEXP split_max_cutsSEXP, SEXP split_max_retrySEXP, SEXP lincomb_type_RSEXP, SEXP lincomb_epsSEXP, SEXP lincomb_iter_maxSEXP, SEXP lincomb_scaleSEXP, SEXP lincomb_alphaSEXP, SEXP lincomb_df_targetSEXP, SEXP lincomb_ties_methodSEXP, SEXP pred_modeSEXP, SEXP pred_type_RSEXP, SEXP pred_horizonSEXP, SEXP pred_aggregateSEXP, SEXP oobagSEXP, SEXP oobag_eval_type_RSEXP, SEXP oobag_eval_everySEXP, SEXP n_threadSEXP, SEXP write_forestSEXP, SEXP run_forestSEXP, SEXP verbositySEXP) { +List orsf_cpp(arma::mat& x, arma::mat& y, arma::vec& w, arma::uword tree_type_R, Rcpp::IntegerVector& tree_seeds, Rcpp::List loaded_forest, Rcpp::RObject lincomb_R_function, Rcpp::RObject oobag_R_function, arma::uword n_tree, arma::uword mtry, arma::uword vi_type_R, double vi_max_pvalue, double leaf_min_events, double leaf_min_obs, arma::uword split_rule_R, double split_min_events, double split_min_obs, double split_min_stat, arma::uword split_max_cuts, arma::uword split_max_retry, arma::uword lincomb_type_R, double lincomb_eps, arma::uword lincomb_iter_max, bool lincomb_scale, double lincomb_alpha, arma::uword lincomb_df_target, arma::uword lincomb_ties_method, bool pred_mode, arma::uword pred_type_R, arma::vec pred_horizon, bool pred_aggregate, bool oobag, arma::uword oobag_eval_type_R, arma::uword oobag_eval_every, int pd_type_R, arma::mat& pd_vals, arma::uvec& pd_cols, arma::vec& pd_probs, unsigned int n_thread, bool write_forest, bool run_forest, int verbosity); +RcppExport SEXP _aorsf_orsf_cpp(SEXP xSEXP, SEXP ySEXP, SEXP wSEXP, SEXP tree_type_RSEXP, SEXP tree_seedsSEXP, SEXP loaded_forestSEXP, SEXP lincomb_R_functionSEXP, SEXP oobag_R_functionSEXP, SEXP n_treeSEXP, SEXP mtrySEXP, SEXP vi_type_RSEXP, SEXP vi_max_pvalueSEXP, SEXP leaf_min_eventsSEXP, SEXP leaf_min_obsSEXP, SEXP split_rule_RSEXP, SEXP split_min_eventsSEXP, SEXP split_min_obsSEXP, SEXP split_min_statSEXP, SEXP split_max_cutsSEXP, SEXP split_max_retrySEXP, SEXP lincomb_type_RSEXP, SEXP lincomb_epsSEXP, SEXP lincomb_iter_maxSEXP, SEXP lincomb_scaleSEXP, SEXP lincomb_alphaSEXP, SEXP lincomb_df_targetSEXP, SEXP lincomb_ties_methodSEXP, SEXP pred_modeSEXP, SEXP pred_type_RSEXP, SEXP pred_horizonSEXP, SEXP pred_aggregateSEXP, SEXP oobagSEXP, SEXP oobag_eval_type_RSEXP, SEXP oobag_eval_everySEXP, SEXP pd_type_RSEXP, SEXP pd_valsSEXP, SEXP pd_colsSEXP, SEXP pd_probsSEXP, SEXP n_threadSEXP, SEXP write_forestSEXP, SEXP run_forestSEXP, SEXP verbositySEXP) { BEGIN_RCPP Rcpp::RObject rcpp_result_gen; Rcpp::RNGScope rcpp_rngScope_gen; @@ -95,11 +95,15 @@ BEGIN_RCPP Rcpp::traits::input_parameter< bool >::type oobag(oobagSEXP); Rcpp::traits::input_parameter< arma::uword >::type oobag_eval_type_R(oobag_eval_type_RSEXP); Rcpp::traits::input_parameter< arma::uword >::type oobag_eval_every(oobag_eval_everySEXP); + Rcpp::traits::input_parameter< int >::type pd_type_R(pd_type_RSEXP); + Rcpp::traits::input_parameter< arma::mat& >::type pd_vals(pd_valsSEXP); + Rcpp::traits::input_parameter< arma::uvec& >::type pd_cols(pd_colsSEXP); + Rcpp::traits::input_parameter< arma::vec& >::type pd_probs(pd_probsSEXP); Rcpp::traits::input_parameter< unsigned int >::type n_thread(n_threadSEXP); Rcpp::traits::input_parameter< bool >::type write_forest(write_forestSEXP); Rcpp::traits::input_parameter< bool >::type run_forest(run_forestSEXP); Rcpp::traits::input_parameter< int >::type verbosity(verbositySEXP); - rcpp_result_gen = Rcpp::wrap(orsf_cpp(x, y, w, tree_type_R, tree_seeds, loaded_forest, lincomb_R_function, oobag_R_function, n_tree, mtry, vi_type_R, vi_max_pvalue, leaf_min_events, leaf_min_obs, split_rule_R, split_min_events, split_min_obs, split_min_stat, split_max_cuts, split_max_retry, lincomb_type_R, lincomb_eps, lincomb_iter_max, lincomb_scale, lincomb_alpha, lincomb_df_target, lincomb_ties_method, pred_mode, pred_type_R, pred_horizon, pred_aggregate, oobag, oobag_eval_type_R, oobag_eval_every, n_thread, write_forest, run_forest, verbosity)); + rcpp_result_gen = Rcpp::wrap(orsf_cpp(x, y, w, tree_type_R, tree_seeds, loaded_forest, lincomb_R_function, oobag_R_function, n_tree, mtry, vi_type_R, vi_max_pvalue, leaf_min_events, leaf_min_obs, split_rule_R, split_min_events, split_min_obs, split_min_stat, split_max_cuts, split_max_retry, lincomb_type_R, lincomb_eps, lincomb_iter_max, lincomb_scale, lincomb_alpha, lincomb_df_target, lincomb_ties_method, pred_mode, pred_type_R, pred_horizon, pred_aggregate, oobag, oobag_eval_type_R, oobag_eval_every, pd_type_R, pd_vals, pd_cols, pd_probs, n_thread, write_forest, run_forest, verbosity)); return rcpp_result_gen; END_RCPP } @@ -108,7 +112,7 @@ static const R_CallMethodDef CallEntries[] = { {"_aorsf_coxph_fit_exported", (DL_FUNC) &_aorsf_coxph_fit_exported, 6}, {"_aorsf_compute_cstat_exported_vec", (DL_FUNC) &_aorsf_compute_cstat_exported_vec, 4}, {"_aorsf_compute_cstat_exported_uvec", (DL_FUNC) &_aorsf_compute_cstat_exported_uvec, 4}, - {"_aorsf_orsf_cpp", (DL_FUNC) &_aorsf_orsf_cpp, 38}, + {"_aorsf_orsf_cpp", (DL_FUNC) &_aorsf_orsf_cpp, 42}, {NULL, NULL, 0} }; diff --git a/src/Tree.cpp b/src/Tree.cpp index a37a7778..93729a90 100644 --- a/src/Tree.cpp +++ b/src/Tree.cpp @@ -901,6 +901,9 @@ pred_leaf.zeros(prediction_data->n_rows); + // if tree is root node, 0 is the correct leaf prediction + if(coef_values.size() == 0) return; + if(VERBOSITY > 0){ Rcout << "---- computing leaf predictions ----" << std::endl; } @@ -961,7 +964,16 @@ } - if(oobag) pred_leaf.elem(rows_inbag).fill(max_nodes); + if(oobag){ + // If the forest is loaded, only rows_oobag is saved. + if(rows_inbag.size() == 0){ + pred_leaf.elem(find(pred_leaf == 0)).fill(max_nodes); + } else { + pred_leaf.elem(rows_inbag).fill(max_nodes); + } + + + } } diff --git a/src/TreeSurvival.cpp b/src/TreeSurvival.cpp index 62d3847d..399903cc 100644 --- a/src/TreeSurvival.cpp +++ b/src/TreeSurvival.cpp @@ -564,7 +564,6 @@ for(; ;) { - // Rcout << "leaf_id: " << leaf_id << std::endl; // copies of leaf data using same aux memory leaf_times = vec(leaf_pred_indx[leaf_id].begin(), diff --git a/src/globals.h b/src/globals.h index 2174e531..bdb99d88 100644 --- a/src/globals.h +++ b/src/globals.h @@ -41,6 +41,12 @@ EVAL_R_FUNCTION = 2 }; + enum PartialDepType { + PD_NONE = 0, + PD_SUMMARY = 1, + PD_ICE = 2 + }; + // Linear combination method enum LinearCombo { LC_NEWTON_RAPHSON = 1, diff --git a/src/orsf_oop.cpp b/src/orsf_oop.cpp index 80ea511e..6d5f7616 100644 --- a/src/orsf_oop.cpp +++ b/src/orsf_oop.cpp @@ -105,6 +105,10 @@ bool oobag, arma::uword oobag_eval_type_R, arma::uword oobag_eval_every, + int pd_type_R, + arma::mat& pd_vals, + arma::uvec& pd_cols, + arma::vec& pd_probs, unsigned int n_thread, bool write_forest, bool run_forest, @@ -125,6 +129,7 @@ LinearCombo lincomb_type = (LinearCombo) lincomb_type_R; PredType pred_type = (PredType) pred_type_R; EvalType oobag_eval_type = (EvalType) oobag_eval_type_R; + PartialDepType pd_type = (PartialDepType) pd_type_R; // R functions cannot be called from multiple threads if(lincomb_type == LC_R_FUNCTION || @@ -184,6 +189,10 @@ oobag_eval_type, oobag_eval_every, oobag_R_function, + pd_type, + pd_vals, + pd_cols, + pd_probs, n_thread, verbosity); @@ -253,25 +262,21 @@ if(vi_type != VI_NONE){ vec vi_output; - if(run_forest){ - if(vi_type == VI_ANOVA){ - vi_output = forest->get_vi_numer() / forest->get_vi_denom(); - } else { - vi_output = forest->get_vi_numer() / n_tree; - } - } - result.push_back(vi_output, "importance"); } + if(pd_type != PD_NONE){ + result.push_back(forest->get_pd_values(), "pd_values"); + } + return(result); }