Skip to content

Commit

Permalink
defer test until censored updates in new PR
Browse files Browse the repository at this point in the history
  • Loading branch information
‘topepo’ committed Sep 25, 2024
1 parent 539e5a7 commit 623a9c7
Showing 1 changed file with 2 additions and 4 deletions.
6 changes: 2 additions & 4 deletions tests/testthat/test-surv_reg_survreg.R
Original file line number Diff line number Diff line change
Expand Up @@ -10,8 +10,6 @@ complete_form <- survival::Surv(time) ~ group
# ------------------------------------------------------------------------------

test_that('survival execution', {
skip_on_travis()

rlang::local_options(lifecycle_verbosity = "quiet")
surv_basic <- surv_reg() %>% set_engine("survival")
surv_lnorm <- surv_reg(dist = "lognormal") %>% set_engine("survival")
Expand Down Expand Up @@ -46,7 +44,7 @@ test_that('survival execution', {
})

test_that('survival prediction', {
skip_on_travis()
skip_if_not_installed("censored", minimum_version = "0.3.2.9001")

rlang::local_options(lifecycle_verbosity = "quiet")
surv_basic <- surv_reg() %>% set_engine("survival")
Expand All @@ -67,7 +65,7 @@ test_that('survival prediction', {
apply(exp_quant, 1, function(x)
tibble(.pred = x, .quantile = (2:4) / 5))
exp_quant <- tibble(.pred = exp_quant)
obs_quant <- predict(res, head(lung), type = "quantile", quantile = (2:4)/5)
obs_quant <- predict(res, head(lung), type = "quantile", quantile_level = (2:4)/5)

expect_equal(as.data.frame(exp_quant), as.data.frame(obs_quant))

Expand Down

0 comments on commit 623a9c7

Please sign in to comment.