Skip to content

Commit

Permalink
adjust prop only if not NULL
Browse files Browse the repository at this point in the history
  • Loading branch information
simonpcouch committed Sep 19, 2024
1 parent da629aa commit b5e9952
Showing 1 changed file with 2 additions and 2 deletions.
4 changes: 2 additions & 2 deletions R/fit.R
Original file line number Diff line number Diff line change
Expand Up @@ -105,10 +105,10 @@ make_inner_split <- function(object, data) {

# add_tailor(prop) is the proportion to train the postprocessor, while
# rsample::mc_cv(prop) is the proportion to train the model (#247)
prop <- 1 - object$post$actions$tailor$prop
prop <- object$post$actions$tailor$prop
rsample::inner_split(
mocked_split,
list(prop = if (is.null(prop)) 2/3 else prop)
list(prop = if (is.null(prop)) 2/3 else 1 - prop)
)
}

Expand Down

0 comments on commit b5e9952

Please sign in to comment.