-
Notifications
You must be signed in to change notification settings - Fork 7
Closed
Labels
tidy-dev-day 🤓Tidyverse Developer Day rstd.io/tidy-dev-dayTidyverse Developer Day rstd.io/tidy-dev-dayupkeepmaintenance, infrastructure, and similarmaintenance, infrastructure, and similar
Description
Happens in test-rule-fit-binomial.R, test-rule-fit-multinomial.R, and test-rule-fit-regression.R.
library(rules)
#> Loading required package: parsnip
data("ad_data", package = "modeldata")
ad_mod <- ad_data %>%
dplyr::slice(-(1:10)) %>%
dplyr::select(Class, Genotype, p_tau, MMP10)
set.seed(4526)
rf_fit_exp <-
xrf::xrf(
Class ~ .,
data = ad_mod,
family = "binomial",
xgb_control = list(nrounds = 3, min_child_weight = 3, penalty = 1),
verbose = 0
)
#> [16:33:02] WARNING: src/learner.cc:767:
#> Parameters: { "penalty" } are not used.Created on 2024-04-09 with reprex v2.1.0
Metadata
Metadata
Assignees
Labels
tidy-dev-day 🤓Tidyverse Developer Day rstd.io/tidy-dev-dayTidyverse Developer Day rstd.io/tidy-dev-dayupkeepmaintenance, infrastructure, and similarmaintenance, infrastructure, and similar