tidymodels / rules

parsnip extension for rule-based models
https://rules.tidymodels.org
Other
40 stars 4 forks source link

new warning coming from xrf::xrf() #81

Open EmilHvitfeldt opened 5 months ago

EmilHvitfeldt commented 5 months ago

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

topepo commented 4 months ago

That's not an argument to xgb.train(). I'll look at those test files.

topepo commented 4 months ago

Those should not be arguments in the test files. The lines below them (with predict()) specify the penalty value. I'll update.