Skip to content

Commit

Permalink
Reduce resolution again to speed up examples
Browse files Browse the repository at this point in the history
  • Loading branch information
PaulRegular committed Sep 15, 2023
1 parent ffef972 commit a6a6fdd
Show file tree
Hide file tree
Showing 9 changed files with 14 additions and 14 deletions.
4 changes: 2 additions & 2 deletions CRAN-SUBMISSION
Original file line number Diff line number Diff line change
@@ -1,3 +1,3 @@
Version: 0.1.6
Date: 2023-09-15 14:08:21 UTC
SHA: 78a6ec2efc75c68c739ff6f6e7044c3e6431753d
Date: 2023-09-15 14:36:22 UTC
SHA: ffef972b998aa57344055c9e8d19428ec2bcb12d
4 changes: 2 additions & 2 deletions R/run_strat.R
Original file line number Diff line number Diff line change
Expand Up @@ -203,7 +203,7 @@ strat_means <- function(data = NULL, metric = NULL, strat_groups = NULL,
#' sim <- sim_abundance(ages = 1:3, years = 1:3,
#' R = sim_R(log_mean = log(1e+7)),
#' growth = sim_vonB(length_group = 1)) %>%
#' sim_distribution(grid = make_grid(res = c(20, 20)),
#' sim_distribution(grid = make_grid(res = c(22, 22)),
#' ays_covar = sim_ays_covar(sd = 1)) %>%
#' sim_survey(n_sims = 1, q = sim_logistic(k = 2, x0 = 3)) %>%
#' run_strat()
Expand Down Expand Up @@ -275,7 +275,7 @@ run_strat <- function(sim,
#' sim <- sim_abundance(ages = 1:3, years = 1:3,
#' R = sim_R(log_mean = log(1e+7)),
#' growth = sim_vonB(length_group = 1)) %>%
#' sim_distribution(grid = make_grid(res = c(20, 20)),
#' sim_distribution(grid = make_grid(res = c(22, 22)),
#' ays_covar = sim_ays_covar(sd = 1)) %>%
#' sim_survey(n_sims = 1, q = sim_logistic(k = 2, x0 = 3)) %>%
#' run_strat() %>%
Expand Down
2 changes: 1 addition & 1 deletion R/sim_dist.R
Original file line number Diff line number Diff line change
Expand Up @@ -326,7 +326,7 @@ sim_nlf <- function(formula = ~ alpha - ((depth - mu) ^ 2) / (2 * sigma ^ 2),
#' @examples
#'
#' sim <- sim_abundance(ages = 1:3, years = 1:3) %>%
#' sim_distribution(grid = make_grid(res = c(20, 20)),
#' sim_distribution(grid = make_grid(res = c(22, 22)),
#' ays_covar = sim_ays_covar(phi_age = 0.8,
#' phi_year = 0.1),
#' depth_par = sim_parabola(mu = 200,
Expand Down
6 changes: 3 additions & 3 deletions R/sim_survey.R
Original file line number Diff line number Diff line change
Expand Up @@ -65,7 +65,7 @@ round_sim <- function(sim) {
#' @examples
#'
#' sim <- sim_abundance(ages = 1:3, years = 1:3) %>%
#' sim_distribution(grid = make_grid(res = c(20, 20)))
#' sim_distribution(grid = make_grid(res = c(22, 22)))
#'
#' ## Multiple calls can be useful for defining a custom series of sets
#' standard_sets <- sim_sets(sim, year <= 2, set_den = 2 / 1000)
Expand All @@ -75,7 +75,7 @@ round_sim <- function(sim) {
#'
#' survey <- sim_survey(sim, custom_sets = sets)
#' \donttest{
#' plot_survey(survey, which_year = 4, which_sim = 1)
#' plot_survey(survey, which_year = 3, which_sim = 1)
#' }
#'

Expand Down Expand Up @@ -167,7 +167,7 @@ sim_sets <- function(sim, subset_cells, n_sims = 1, trawl_dim = c(1.5, 0.02),
#' @examples
#'
#' sim <- sim_abundance(ages = 1:3, years = 1:3) %>%
#' sim_distribution(grid = make_grid(res = c(20, 20))) %>%
#' sim_distribution(grid = make_grid(res = c(22, 22))) %>%
#' sim_survey(n_sims = 5, q = sim_logistic(k = 2, x0 = 3))
#' \donttest{
#' plot_survey(sim, which_year = 4, which_sim = 1)
Expand Down
2 changes: 1 addition & 1 deletion man/run_strat.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/sim_distribution.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

4 changes: 2 additions & 2 deletions man/sim_sets.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/sim_survey.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/strat_error.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

0 comments on commit a6a6fdd

Please sign in to comment.