Skip to content

Commit

Permalink
merge pr #141: stacks v1.0.0
Browse files Browse the repository at this point in the history
  • Loading branch information
simonpcouch authored Jul 6, 2022
2 parents a8f8cf2 + 2f1836c commit 672ec3f
Show file tree
Hide file tree
Showing 3 changed files with 11 additions and 5 deletions.
2 changes: 1 addition & 1 deletion DESCRIPTION
Original file line number Diff line number Diff line change
@@ -1,6 +1,6 @@
Package: stacks
Title: Tidy Model Stacking
Version: 0.2.4.9000
Version: 1.0.0
Authors@R: c(
person(given = "Simon",
family = "Couch",
Expand Down
11 changes: 8 additions & 3 deletions NEWS.md
Original file line number Diff line number Diff line change
@@ -1,8 +1,13 @@
# stacks (development version)
# stacks 1.0.0

To be released as stacks 1.0.0.
stacks 1.0.0 is the first production release of the package. While this release
includes only a few minor bug fixes, it's accompanied by a white paper
recently published in the Journal of Open Source software. You can read
that paper [here](https://doi.org/10.21105/joss.04471)!

* Addressed re-introduction of bug arising from outcome levels that are not
This release:

* Addresses re-introduction of a bug arising from outcome levels that are not
valid column names in the multinomial classification setting (#133).
* Fixes bug where stacks will return incorrect predictions if an elastic net
meta-learner is used, the `type` argument to `predict` is set to `"class"`,
Expand Down
3 changes: 2 additions & 1 deletion R/add_candidates.R
Original file line number Diff line number Diff line change
Expand Up @@ -506,7 +506,8 @@ collate_predictions <- function(x) {

# given a set of candidate columns, removes those with hard class predictions
remove_class_preds <- function(x) {
lvls <- make.names(levels(factor(x[[1]])))
lvls <- make.names(paste0(".prefix.", levels(factor(x[[1]]))))
lvls <- gsub(".prefix.", "", lvls, fixed = TRUE)

# gather indices for the columns with class probability predictions
prob_preds_idx <- purrr::map(paste0(".pred_", lvls), grepl, x = colnames(x)) %>%
Expand Down

0 comments on commit 672ec3f

Please sign in to comment.