Skip to content

Commit

Permalink
update add-in info (#673)
Browse files Browse the repository at this point in the history
  • Loading branch information
topepo authored Mar 16, 2022
1 parent f89cdea commit e7e6f6e
Show file tree
Hide file tree
Showing 2 changed files with 5 additions and 2 deletions.
Binary file modified data/model_db.rda
Binary file not shown.
7 changes: 5 additions & 2 deletions inst/add-in/parsnip_model_db.R
Original file line number Diff line number Diff line change
Expand Up @@ -7,7 +7,8 @@ library(tidymodels)
library(usethis)

# also requires installation of:
packages <- c("parsnip", "discrim", "plsmod", "rules", "baguette", "poissonreg", "modeltime", "modeltime.gluonts")
packages <- c("parsnip", "discrim", "plsmod", "rules", "baguette", "poissonreg",
"multilevelmod", "modeltime", "modeltime.gluonts")

# ------------------------------------------------------------------------------

Expand Down Expand Up @@ -63,6 +64,9 @@ get_tunable_param <- function(mode, package, model, engine) {

model_db <-
purrr::map_dfr(packages, print_methods) %>%
dplyr::filter(engine != "liquidSVM") %>%
dplyr::filter(model != "surv_reg") %>%
dplyr::filter(engine != "spark") %>%
dplyr::filter(!is.na(engine)) %>%
dplyr::mutate(label = paste0(model, " (", engine, ")")) %>%
dplyr::arrange(model, engine, mode)
Expand All @@ -77,7 +81,6 @@ num_modes <-

model_db <-
dplyr::left_join(model_db, num_modes, by = c("package", "model", "engine")) %>%
dplyr::filter(engine != "spark") %>%
dplyr::mutate(parameters = purrr::pmap(list(mode, package, model, engine), get_tunable_param))

usethis::use_data(model_db, overwrite = TRUE)
Expand Down

0 comments on commit e7e6f6e

Please sign in to comment.