Skip to content

Commit ba1b69a

Browse files
committed
Ensure that all man pages state the return value, as required by CRAN.
1 parent cb173d0 commit ba1b69a

39 files changed

+114
-13
lines changed

R/compareParams.R

+1
Original file line numberDiff line numberDiff line change
@@ -4,6 +4,7 @@
44
#'
55
#' @param params1 First MizerParams object
66
#' @param params2 Second MizerParams object
7+
#' @return String describing the differences
78
#' @export
89
#' @examples
910
#' params1 <- NS_params

R/customFunction.R

+2
Original file line numberDiff line numberDiff line change
@@ -34,6 +34,7 @@
3434
#'
3535
#' @param name Name of mizer function to replace
3636
#' @param fun The custom function to use as replacement
37+
#' @return No return value, called for side effects
3738
#' @export
3839
#' @examples
3940
#' \dontrun{
@@ -54,4 +55,5 @@ customFunction <- function(name, fun) {
5455
}
5556
environment(fun) <- asNamespace("mizer")
5657
utils::assignInNamespace(name, fun, ns = "mizer")
58+
invisible()
5759
}

R/deprecated.R

+1
Original file line numberDiff line numberDiff line change
@@ -10,6 +10,7 @@
1010
#' @inheritParams newTraitParams
1111
#' @param q Allometric exponent of search volume
1212
#' @param ... Unused
13+
#' @return A MizerParams object
1314
#' @export
1415
#' @concept deprecated
1516
set_multispecies_model <-

R/extension.R

+2
Original file line numberDiff line numberDiff line change
@@ -255,6 +255,8 @@ getComponent <- function(params, component) {
255255

256256
#' @param object An object of class MizerParams or MizerSim
257257
#' @rdname initialNOther-set
258+
#' @return A named list with the initial values of other ecosystem
259+
#' components
258260
#' @export
259261
initialNOther <- function(object) {
260262
if (is(object, "MizerParams")) {

R/plots.R

+1
Original file line numberDiff line numberDiff line change
@@ -115,6 +115,7 @@ utils::globalVariables(c("time", "value", "Species", "w", "gear", "Age",
115115
#' @param ytrans Transformation for the y-axis.
116116
#' @param y_ticks The approximate number of ticks desired on the y axis
117117
#' @param highlight Name or vector of names of the species to be highlighted.
118+
#' @return A ggplot2 object
118119
#' @keywords internal
119120
#' @export
120121
plotDataFrame <- function(frame, params, style = "line", xlab = waiver(),

R/project_methods.R

+1
Original file line numberDiff line numberDiff line change
@@ -41,6 +41,7 @@
4141
#' @param rates_fns Named list of the functions to call to calculate the rates.
4242
#' Note that this list holds the functions themselves, not their names.
4343
#' @param ... Unused
44+
#' @return List of rates.
4445
#' @export
4546
#' @family mizer rate functions
4647
mizerRates <- function(params, n, n_pp, n_other,

R/reproduction.R

+1-1
Original file line numberDiff line numberDiff line change
@@ -67,7 +67,7 @@ mizerRDI <- function(params, n, n_pp, n_other, t,
6767
#' @param mort A two dimensional array (species x size) holding the mortality
6868
#' rate as calculated by [mizerMort()].
6969
#' @param ... Unused
70-
#'
70+
#' @return Vector with the value for each species
7171
#' @export
7272
#' @family functions calculating density-dependent reproduction rate
7373
#' @examples

R/resource_dynamics.R

+2
Original file line numberDiff line numberDiff line change
@@ -53,6 +53,7 @@ resource_constant <- function(params, n_pp, ...) {
5353
#' sizes.
5454
#'
5555
#' @param params A MizerParams object
56+
#' @return A named list of resource parameters.
5657
#' @export
5758
resource_params <- function(params) {
5859
params@resource_params
@@ -86,6 +87,7 @@ resource_params <- function(params) {
8687
#' [resource_level()], [resource_rate()] and [resource_capacity()] instead.
8788
#'
8889
#' @param params A MizerParams object
90+
#' @return Name of the function that determines the resource dynamics
8991
#' @keywords internal
9092
#' @export
9193
getResourceDynamics <- function(params) {

R/saveParams.R

+1
Original file line numberDiff line numberDiff line change
@@ -11,6 +11,7 @@
1111
#' @param params A MizerParams object
1212
#' @param file The name of the file or a connection where the MizerParams object
1313
#' is saved to or read from.
14+
#' @return NULL invisibly
1415
#' @export
1516
saveParams <- function(params, file) {
1617
params <- validParams(params)

R/selectivity_funcs.R

+10-6
Original file line numberDiff line numberDiff line change
@@ -13,12 +13,13 @@
1313
#' selectivity function is length based, it uses the
1414
#' length-weight parameters `a` and `b` to convert between length and weight.
1515
#'
16-
#' @param w the size of the individual.
16+
#' @param w Vector of sizes.
1717
#' @param l25 the length which gives a selectivity of 25%.
1818
#' @param l50 the length which gives a selectivity of 50%.
1919
#' @param species_params A list with the species params for the current species.
20-
#' Used to get at the length-weight parameters `a` and `b`
20+
#' Used to get at the length-weight parameters `a` and `b`.
2121
#' @param ... Unused
22+
#' @return Vector of selectivities at the given sizes.
2223
#' @export
2324
#' @family selectivity functions
2425
sigmoid_length <- function(w, l25, l50, species_params, ...) {
@@ -56,14 +57,15 @@ sigmoid_length <- function(w, l25, l50, species_params, ...) {
5657
#' selectivity function is length based, it uses the
5758
#' length-weight parameters `a` and `b` to convert between length and weight.
5859
#'
59-
#' @param w the size of the individual.
60+
#' @param w Vector of sizes.
6061
#' @param l25 the length which gives a selectivity of 25%.
6162
#' @param l50 the length which gives a selectivity of 50%.
6263
#' @param l50_right the length which gives a selectivity of 50%.
6364
#' @param l25_right the length which gives a selectivity of 25%.
6465
#' @param species_params A list with the species params for the current species.
6566
#' Used to get at the length-weight parameters `a` and `b`
6667
#' @param ... Unused
68+
#' @return Vector of selectivities at the given sizes.
6769
#' @export
6870
#' @family selectivity functions
6971
double_sigmoid_length <- function(w, l25, l50, l50_right, l25_right,
@@ -98,9 +100,10 @@ double_sigmoid_length <- function(w, l25, l50, l50_right, l25_right,
98100
#' A knife-edge selectivity function where weights greater or equal to
99101
#' `knife_edge_size` are selected.
100102
#'
101-
#' @param w The size of the individual.
103+
#' @param w Vector of sizes.
102104
#' @param knife_edge_size The weight at which the knife-edge operates.
103105
#' @param ... Unused
106+
#' @return Vector of selectivities at the given sizes.
104107
#' @export
105108
#' @family selectivity functions
106109
knife_edge <- function(w, knife_edge_size, ...) {
@@ -114,10 +117,11 @@ knife_edge <- function(w, knife_edge_size, ...) {
114117
#' A sigmoidal selectivity function with 50% selectivity at
115118
#' weight `sigmoidal_weight` and width `sigmoidal_sigma`.
116119
#'
117-
#' @param w The size of the individual.
120+
#' @param w Vector of sizes.
118121
#' @param sigmoidal_weight The weight at which the knife-edge operates.
119-
#' @param sigmoidal_sigma The width of the selection function
122+
#' @param sigmoidal_sigma The width of the selection function.
120123
#' @param ... Unused
124+
#' @return Vector of selectivities at the given sizes.
121125
#' @export
122126
#' @family selectivity functions
123127
sigmoid_weight <- function(w, sigmoidal_weight, sigmoidal_sigma, ...) {

R/setFishing.R

+2
Original file line numberDiff line numberDiff line change
@@ -322,6 +322,7 @@ setFishing <- function(params, selectivity = NULL, catchability = NULL,
322322
#' illustrates how this facilitates changing an individual gear parameter.
323323
#'
324324
#' @param params A MizerParams object
325+
#' @return Data frame with gear parameters
325326
#' @export
326327
#' @family functions for setting parameters
327328
#' @examples
@@ -427,6 +428,7 @@ getInitialEffort <- function(params) {
427428
#' specify a time-varying effort.
428429
#'
429430
#' @param params A MizerParams object
431+
#' @return Effort vector
430432
#' @export
431433
initial_effort <- function(params) {
432434
params@initial_effort

R/setInitialValues.R

+4
Original file line numberDiff line numberDiff line change
@@ -132,6 +132,8 @@ setInitialValues <- function(params, sim, time_range, geometric_mean = FALSE) {
132132

133133
#' @rdname initialN-set
134134
#' @param object An object of class MizerParams or MizerSim
135+
#' @return A matrix with dimensions species x size holding the initial number
136+
#' densities for the fish spectra.
135137
#' @export
136138
#' @examples
137139
#' # Doubling abundance of Cod in the initial state of the North Sea model
@@ -184,6 +186,8 @@ initialN <- function(object) {
184186

185187
#' @rdname initialNResource-set
186188
#' @param object An object of class MizerParams or MizerSim
189+
#' @return A vector with the initial number densities for the resource
190+
#' spectrum
187191
#' @export
188192
initialNResource <- function(object) {
189193
if (is(object, "MizerParams")) {

R/species_params.R

+1
Original file line numberDiff line numberDiff line change
@@ -114,6 +114,7 @@
114114
#' MizerParams object, in case your own code makes use of them.
115115
#'
116116
#' @param params A MizerParams object
117+
#' @return Data frame of species parameters
117118
#' @export
118119
#' @seealso [validSpeciesParams()]
119120
#' @family functions for setting parameters

R/steady.R

+4
Original file line numberDiff line numberDiff line change
@@ -68,6 +68,8 @@ distanceSSLogN <- function(params, current, previous) {
6868
#' this uses the function [distanceSSLogN()] that you can use as a model for your
6969
#' own distance function.
7070
#' @param ... Further arguments will be passed on to your distance function.
71+
#'
72+
#' @return A MizerParams or a MizerSim object
7173
#' @seealso [distanceSSLogN()], [distanceMaxRelRDI()]
7274
#' @export
7375
projectToSteady <- function(params,
@@ -216,6 +218,7 @@ projectToSteady <- function(params,
216218
#' of the `reproduction_level`.
217219
#' @param progress_bar A shiny progress object to implement a progress bar in a
218220
#' shiny app. Default FALSE.
221+
#' @return A MizerParams or a MizerSim object
219222
#' @export
220223
#' @examples
221224
#' \dontrun{
@@ -301,6 +304,7 @@ steady <- function(params, t_max = 100, t_per = 1.5, dt = 0.1,
301304
#' @param n_other Abundances of other components
302305
#' @param component Name of the component that is being updated
303306
#' @param ... Unused
307+
#' @return The current value of the component
304308
#' @export
305309
#' @concept helper
306310
constant_other <- function(params, n_other, component, ...) {

man/MizerParams.Rd

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

man/compareParams.Rd

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

man/constantEggRDI.Rd

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

man/constant_other.Rd

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

man/customFunction.Rd

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

man/double_sigmoid_length.Rd

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

man/figures/Beverton-Holt-plot-1.png

11.1 KB
Loading

man/gear_params.Rd

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

man/getRates.Rd

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

man/getResourceDynamics.Rd

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

man/initialN-set.Rd

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

man/initialNOther-set.Rd

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

man/initialNResource-set.Rd

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

man/initial_effort.Rd

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

man/knife_edge.Rd

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

man/mizerRates.Rd

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

man/plotDataFrame.Rd

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

0 commit comments

Comments
 (0)