Nothing
test_that("is_scenario", {
expect_true(is_scenario(GUTS_RED_IT()))
expect_true(is_scenario(new("EffectScenario")))
expect_equal(is_scenario(c(GUTS_RED_IT(),Lemna_Schmitt())), c(TRUE,TRUE))
expect_equal(is_scenario(c(DEB_abj(),NA)), c(TRUE,FALSE))
# non-scenario arguments
expect_false(is_scenario(c()))
expect_false(is_scenario(NA))
expect_false(is_scenario(NULL))
expect_false(is_scenario(1))
expect_equal(is_scenario(1:5), FALSE)
})
test_that("is_sequence", {
sc <- new("EffectScenario") %>% set_times(0:6)
suppressWarnings(sq <- sequence(list(sc)))
expect_true(is_sequence(sq))
expect_equal(is_sequence(list(sq, sq)), c(TRUE, TRUE))
expect_false(is_sequence(minnow_it))
expect_false(is_sequence(1))
expect_error(is_sequence())
})
test_that("is_caliset", {
cs <- caliset(minnow_it, data.frame(t=0, n=0))
expect_true(is_caliset(cs))
expect_equal(is_caliset(list(cs, cs)), c(TRUE, TRUE))
expect_false(is_caliset(minnow_it))
expect_false(is_caliset(1))
expect_error(is_caliset())
})
test_that("is_parameter_set", {
expect_true(is_parameter_set(parameter_set("test")))
expect_equal(is_parameter_set(c(parameter_set("test"),parameter_set("test"))), c(TRUE,TRUE))
# invalid arguments
expect_false(is_parameter_set(NA))
expect_false(is_parameter_set(NULL))
expect_false(is_parameter_set(1))
expect_equal(is_parameter_set(1:5), FALSE)
})
test_that("is_param_match", {
sc_unt <- new("EffectScenario", name="foo", tag="")
sc_tgd <- new("EffectScenario", name="foo", tag="bar")
sc_other <- new("EffectScenario", name="baz")
ps_unt <- parameter_set(model="foo", tag="")
ps_tgd <- parameter_set(model="foo", tag="bar")
ps_other <- parameter_set(model="baz", tag="")
# match
expect_true(is_param_match(sc_unt, ps_unt))
expect_true(is_param_match(sc_tgd, ps_tgd))
# no match
expect_false(is_param_match(sc_unt, ps_tgd))
expect_false(is_param_match(sc_unt, ps_other))
expect_false(is_param_match(sc_tgd, ps_unt))
expect_false(is_param_match(sc_tgd, ps_other))
expect_false(is_param_match(sc_other, ps_unt))
expect_false(is_param_match(sc_other, ps_tgd))
# vectorised parameter sets
expect_equal(c(FALSE,FALSE), is_param_match(sc_unt, c(ps_tgd, ps_tgd)))
expect_equal(c(TRUE,FALSE), is_param_match(sc_unt, c(ps_unt, ps_tgd)))
expect_equal(c(TRUE,FALSE), is_param_match(sc_unt, c(ps_unt, ps_other)))
expect_equal(c(TRUE,TRUE), is_param_match(sc_tgd, c(ps_tgd, ps_tgd)))
# invalid inputs
expect_error(is_param_match(NULL, NULL))
expect_error(is_param_match(c(), c()))
expect_error(is_param_match(sc_unt, c()))
expect_error(is_param_match(c(), ps_unt))
})
test_that("is_guts", {
expect_true(is_guts(GUTS_RED_IT()))
expect_true(is_guts(GUTS_RED_SD()))
expect_equal(is_guts(c(GUTS_RED_IT(),GUTS_RED_IT())), c(TRUE,TRUE))
# deprecated alias
expect_true(is_GUTS(GUTS_RED_IT()))
# invalid arguments
expect_false(is_guts(list()))
expect_false(is_guts(NA))
expect_false(is_guts(NULL))
expect_false(is_guts(1))
expect_equal(is_guts(1:5), FALSE)
})
test_that("is_guts_it", {
expect_true(is_guts_it(GUTS_RED_IT()))
expect_equal(is_guts_it(c(GUTS_RED_IT(),GUTS_RED_IT())), c(TRUE,TRUE))
# deprecated alias
expect_true(is_GUTS_IT(GUTS_RED_IT()))
# invalid arguments
expect_false(is_guts_it(list()))
expect_false(is_guts_it(GUTS_RED_SD()))
expect_false(is_guts_it(NA))
expect_false(is_guts_it(NULL))
expect_false(is_guts_it(1))
expect_equal(is_guts_it(1:5), FALSE)
})
test_that("is_guts_sd", {
expect_true(is_guts_sd(GUTS_RED_SD()))
expect_equal(is_guts_sd(c(GUTS_RED_SD(),GUTS_RED_SD())), c(TRUE,TRUE))
# deprecated alias
expect_true(is_GUTS_SD(GUTS_RED_SD()))
# invalid arguments
expect_false(is_guts_sd(list()))
expect_false(is_guts_sd(GUTS_RED_IT()))
expect_false(is_guts_sd(NA))
expect_false(is_guts_sd(NULL))
expect_false(is_guts_sd(1))
expect_equal(is_guts_sd(1:5), FALSE)
})
test_that("is_deb", {
expect_true(is_deb(DEB_abj()))
expect_equal(is_deb(c(DEB_abj(),DEB_abj())), c(TRUE,TRUE))
# deprecated alias
expect_true(is_DEB(DEB_abj()))
# invalid arguments
expect_false(is_deb(list()))
expect_false(is_deb(GUTS_RED_IT()))
expect_false(is_deb(NA))
expect_false(is_deb(NULL))
expect_false(is_deb(1))
expect_equal(is_deb(1:5), FALSE)
})
test_that("is_lemna", {
expect_true(is_lemna(Lemna_Schmitt()))
expect_true(is_lemna(Lemna_SchmittThold()))
expect_true(is_lemna(Lemna_SETAC()))
expect_equal(is_lemna(c(Lemna_Schmitt(),Lemna_Schmitt())), c(TRUE,TRUE))
# deprecated alias
expect_true(is_Lemna(Lemna_Schmitt()))
# invalid arguments
expect_false(is_lemna(list()))
expect_false(is_lemna(GUTS_RED_IT()))
expect_false(is_lemna(NA))
expect_false(is_lemna(NULL))
expect_false(is_lemna(1))
expect_equal(is_lemna(1:5), FALSE)
})
test_that("is_LemnaThreshold", {
lifecycle::expect_deprecated(expect_true(is_LemnaThreshold(Lemna_SchmittThold())))
lifecycle::expect_deprecated(expect_equal(is_LemnaThreshold(c(Lemna_SchmittThold(),Lemna_SchmittThold())), c(TRUE,TRUE)))
# invalid arguments
lifecycle::expect_deprecated(expect_false(is_LemnaThreshold(list())))
lifecycle::expect_deprecated(expect_false(is_LemnaThreshold(Lemna_Schmitt())))
lifecycle::expect_deprecated(expect_false(is_LemnaThreshold(NA)))
lifecycle::expect_deprecated(expect_false(is_LemnaThreshold(NULL)))
lifecycle::expect_deprecated(expect_false(is_LemnaThreshold(1)))
lifecycle::expect_deprecated(expect_equal(is_LemnaThreshold(1:5), FALSE))
})
test_that("is_regular_series", {
# exposure series
expect_false(is_regular_series(ExposureSeries(series=data.frame(t=0:5, c=0:5))))
expect_true(is_regular_series(ExposureSeries(series=data.frame(t=0:5, c=0:5), meta=list(regular.series=TRUE))))
# some numeric vector of output times
expect_true(is_regular_series(1))
expect_true(is_regular_series(0:10))
expect_true(is_regular_series(seq(0,10,0.1)))
expect_true(is_regular_series(seq(0,10,0.3)))
expect_true(is_regular_series(seq(0,10.12,0.127)))
# invalid arguments
expect_error(is_regular_series(NA))
expect_error(is_regular_series(NULL))
expect_error(is_regular_series(c()))
expect_error(is_regular_series(c(NA,NA)))
})
test_that("is_control_required", {
expect_true(is_control_required(Lemna_Schmitt()))
expect_true(is_control_required(DEB_abj()))
expect_equal(is_control_required(c(Lemna_Schmitt(),Lemna_Schmitt())), c(TRUE,TRUE))
# invalid arguments
expect_false(is_control_required(GUTS_RED_IT()))
expect_error(is_control_required(NA))
expect_error(is_control_required(NULL))
expect_error(is_control_required(1))
expect_error(is_control_required(1:5))
})
Any scripts or data that you put into this service are public.
Add the following code to your website.
For more information on customizing the embed code, read Embedding Snippets.