Skip to content

Commit aa996d9

Browse files
committed
Avoid cryptic errors if functions are called with no valid species selected by their species argument. Closes #251.
1 parent 96248a6 commit aa996d9

File tree

5 files changed

+61
-14
lines changed

5 files changed

+61
-14
lines changed

R/match.R

+3
Original file line numberDiff line numberDiff line change
@@ -45,6 +45,9 @@ matchBiomasses <- function(params, species = NULL) {
4545
return.logical = TRUE) &
4646
!is.na(params@species_params$biomass_observed) &
4747
params@species_params$biomass_observed > 0
48+
if (length(species) == 0) {
49+
return(params)
50+
}
4851
for (sp in (1:nrow(params@species_params))[species]) {
4952
cutoff <- params@species_params$biomass_cutoff[[sp]]
5053
if (is.null(cutoff) || is.na(cutoff)) {

R/plots.R

+14-7
Original file line numberDiff line numberDiff line change
@@ -251,7 +251,7 @@ plotBiomass <- function(sim, species = NULL,
251251
is.flag(return_data),
252252
length(ylim) == 2)
253253
params <- sim@params
254-
species <- valid_species_arg(sim, species)
254+
species <- valid_species_arg(sim, species, error_on_empty = TRUE)
255255
if (missing(start_time)) start_time <-
256256
as.numeric(dimnames(sim@n)[[1]][1])
257257
if (missing(end_time)) end_time <-
@@ -364,7 +364,7 @@ plotYield <- function(sim, sim2,
364364
is.flag(log),
365365
is.flag(return_data))
366366
params <- sim@params
367-
species <- valid_species_arg(sim, species)
367+
species <- valid_species_arg(sim, species, error_on_empty = TRUE)
368368
if (missing(sim2)) {
369369
y <- getYield(sim, ...)
370370
y_total <- rowSums(y)
@@ -465,7 +465,7 @@ plotYieldGear <- function(sim,
465465
is.flag(total),
466466
is.flag(return_data))
467467
params <- sim@params
468-
species <- valid_species_arg(sim, species)
468+
species <- valid_species_arg(sim, species, error_on_empty = TRUE)
469469

470470
y <- getYieldGear(sim, ...)
471471
y_total <- rowSums(y, dims = 2)
@@ -590,6 +590,9 @@ plotSpectra <- function(object, species = NULL,
590590
length(wlim) == 2,
591591
length(ylim) == 2)
592592
species <- valid_species_arg(object, species)
593+
if (length(species) == 0 && !total && !resource) {
594+
stop("There is nothing to plot as no valid species have been selected.")
595+
}
593596
if (is(object, "MizerSim")) {
594597
if (missing(time_range)) {
595598
time_range <- max(as.numeric(dimnames(object@n)$time))
@@ -787,7 +790,8 @@ plotFeedingLevel <- function(object, species = NULL,
787790
}
788791

789792
# selector for desired species
790-
sel_sp <- valid_species_arg(params, species, return.logical = TRUE)
793+
sel_sp <- valid_species_arg(params, species, return.logical = TRUE,
794+
error_on_empty = TRUE)
791795
species <- dimnames(params@initial_n)$sp[sel_sp]
792796
feed <- feed[sel_sp, , drop = FALSE]
793797

@@ -908,7 +912,7 @@ plotPredMort <- function(object, species = NULL,
908912
pred_mort <- apply(pred_mort, c(2, 3), mean)
909913
}
910914

911-
species <- valid_species_arg(params, species)
915+
species <- valid_species_arg(params, species, error_on_empty = TRUE)
912916
pred_mort <- pred_mort[as.character(dimnames(pred_mort)[[1]]) %in% species, , drop = FALSE]
913917
plot_dat <- data.frame(
914918
w = rep(params@w, each = length(species)),
@@ -1000,7 +1004,7 @@ plotFMort <- function(object, species = NULL,
10001004
if (length(dim(f)) == 3) {
10011005
f <- apply(f, c(2, 3), mean)
10021006
}
1003-
species <- valid_species_arg(params, species)
1007+
species <- valid_species_arg(params, species, error_on_empty = TRUE)
10041008
f <- f[as.character(dimnames(f)[[1]]) %in% species, , drop = FALSE]
10051009
plot_dat <- data.frame(w = rep(params@w, each = length(species)),
10061010
value = c(f),
@@ -1077,7 +1081,7 @@ plotGrowthCurves <- function(object, species = NULL,
10771081
} else if (is(object, "MizerParams")) {
10781082
params <- validParams(object)
10791083
}
1080-
species <- valid_species_arg(params, species)
1084+
species <- valid_species_arg(params, species, error_on_empty = TRUE)
10811085
sp_sel <- params@species_params$species %in% species
10821086
ws <- getGrowthCurves(params, species, max_age, percentage)
10831087
plot_dat <- reshape2::melt(ws)
@@ -1216,6 +1220,9 @@ plotDiet <- function(object, species = NULL, return_data = FALSE) {
12161220
assert_that(is.flag(return_data))
12171221
params <- validParams(object)
12181222
species <- valid_species_arg(object, species, return.logical = TRUE)
1223+
if (sum(species) != 1) {
1224+
stop("You need to select a single species for which to plot the diet.")
1225+
}
12191226
diet <- getDiet(params)[species, , ]
12201227
prey <- dimnames(diet)$prey
12211228
# the plot looks better upsided down

R/steady.R

+22-6
Original file line numberDiff line numberDiff line change
@@ -313,38 +313,48 @@ constant_other <- function(params, n_other, component, ...) {
313313
#' each species whether it is to be selected (TRUE) or not.
314314
#' @param return.logical Whether the return value should be a logical vector.
315315
#' Default FALSE.
316+
#' @param error_on_empty Whether to throw an error if there are zero valid
317+
#' species. Default FALSE.
316318
#'
317319
#' @return A vector of species names, in the same order as specified in the
318320
#' 'species' argument. If 'return.logical = TRUE' then a logical vector is
319321
#' returned instead, with length equal to the number of species, with
320322
#' TRUE entry for each selected species.
321323
#' @export
322324
#' @concept helper
323-
valid_species_arg <- function(object, species = NULL, return.logical = FALSE) {
325+
valid_species_arg <- function(object, species = NULL, return.logical = FALSE,
326+
error_on_empty = FALSE) {
324327
if (is(object, "MizerSim")) {
325328
params <- object@params
326329
} else if (is(object, "MizerParams")) {
327330
params <- object
328331
} else {
329332
stop("The first argument must be a MizerSim or MizerParams object.")
330333
}
331-
assert_that(is.flag(return.logical))
334+
assert_that(is.flag(return.logical),
335+
is.flag(error_on_empty))
332336
all_species <- dimnames(params@initial_n)$sp
333337
no_sp <- nrow(params@species_params)
334338
# Set species if missing to list of all non-background species
335339
if (is.null(species)) {
336340
species <- dimnames(params@initial_n)$sp[!is.na(params@A)]
337341
if (length(species) == 0) { # There are no non-background species.
342+
if (error_on_empty) {
343+
stop("No species have been selected.")
344+
}
338345
if (return.logical) {
339346
return(rep(FALSE, no_sp))
340347
} else {
341-
return(NULL)
348+
vector("character")
342349
}
343350
}
344351
}
345352
if (is.logical(species)) {
346353
if (length(species) != no_sp) {
347-
stop("The boolean `species` argument has the wrong length")
354+
stop("The boolean `species` argument has the wrong length.")
355+
}
356+
if (!any(species) && error_on_empty) {
357+
stop("No species have been selected.")
348358
}
349359
if (return.logical) {
350360
return(species)
@@ -354,9 +364,12 @@ valid_species_arg <- function(object, species = NULL, return.logical = FALSE) {
354364
if (is.numeric(species)) {
355365
if (!all(species %in% (1:no_sp))) {
356366
warning("A numeric 'species' argument should only contain the ",
357-
"integers 1 to ", no_sp)
367+
"integers 1 to ", no_sp, ".")
358368
}
359369
species.logical <- 1:no_sp %in% species
370+
if (!any(species.logical) && error_on_empty) {
371+
stop("No species have been selected.")
372+
}
360373
if (return.logical) {
361374
return(species.logical)
362375
}
@@ -365,9 +378,12 @@ valid_species_arg <- function(object, species = NULL, return.logical = FALSE) {
365378
invalid <- setdiff(species, all_species)
366379
if (length(invalid) > 0) {
367380
warning("The following species do not exist: ",
368-
toString(invalid))
381+
toString(invalid), ".")
369382
}
370383
species <- intersect(species, all_species)
384+
if (length(species) == 0 && error_on_empty) {
385+
stop("No species have been selected.")
386+
}
371387
if (return.logical) {
372388
return(all_species %in% species)
373389
}

man/valid_species_arg.Rd

+9-1
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

tests/testthat/test-steady.R

+13
Original file line numberDiff line numberDiff line change
@@ -91,6 +91,7 @@ test_that("steady() preserves R_max", {
9191

9292
# valid_species_arg ----
9393
test_that("valid_species_arg works", {
94+
# character species argument
9495
expect_warning(s <- valid_species_arg(NS_params, c("non", "sense")),
9596
"The following species do not exist: non, sense")
9697
expect_identical(s, vector(mode = "character"))
@@ -100,6 +101,10 @@ test_that("valid_species_arg works", {
100101
expect_identical(valid_species_arg(NS_params, c("Sprat", "Sandeel"),
101102
return.logical = TRUE),
102103
c(TRUE, TRUE, rep(FALSE, 10)))
104+
expect_error(
105+
valid_species_arg(NS_params, c("non", "sense"), error_on_empty = TRUE) |>
106+
suppressWarnings(),
107+
"No species have been selected.")
103108
# numeric species argument
104109
expect_warning(s <- valid_species_arg(NS_params, c(2.5, 13)),
105110
"A numeric 'species' argument should only contain the integers 1 to 12")
@@ -111,6 +116,10 @@ test_that("valid_species_arg works", {
111116
expect_identical(valid_species_arg(NS_params, c(3, 1),
112117
return.logical = TRUE),
113118
c(TRUE, FALSE, TRUE, rep(FALSE, 9)))
119+
expect_error(
120+
valid_species_arg(NS_params, 13, error_on_empty = TRUE) |>
121+
suppressWarnings(),
122+
"No species have been selected.")
114123
# logical species argument
115124
expect_error(valid_species_arg(NS_params, c(TRUE, FALSE)),
116125
"The boolean `species` argument has the wrong length")
@@ -121,6 +130,10 @@ test_that("valid_species_arg works", {
121130
c(TRUE, FALSE, TRUE, rep(FALSE, 9)),
122131
return.logical = TRUE),
123132
c(TRUE, FALSE, TRUE, rep(FALSE, 9)))
133+
expect_error(
134+
valid_species_arg(NS_params, rep(FALSE, 12), error_on_empty = TRUE) |>
135+
suppressWarnings(),
136+
"No species have been selected.")
124137
# called with MizerSim object
125138
sim <- project(NS_params, t_max = 1, dt = 1)
126139
expect_identical(valid_species_arg(sim, "Cod"),

0 commit comments

Comments
 (0)