Skip to content

Commit

Permalink
Use explicit int seed
Browse files Browse the repository at this point in the history
  • Loading branch information
salim-b committed Oct 19, 2023
1 parent 2c2cdbd commit 09d0e77
Show file tree
Hide file tree
Showing 6 changed files with 9 additions and 9 deletions.
2 changes: 1 addition & 1 deletion R/build-articles.R
Original file line number Diff line number Diff line change
Expand Up @@ -171,7 +171,7 @@
build_articles <- function(pkg = ".",
quiet = TRUE,
lazy = TRUE,
seed = 1014,
seed = 1014L,
override = list(),
preview = NA) {
pkg <- section_init(pkg, depth = 1L, override = override)
Expand Down
4 changes: 2 additions & 2 deletions R/build-reference.R
Original file line number Diff line number Diff line change
Expand Up @@ -153,7 +153,7 @@ build_reference <- function(pkg = ".",
lazy = TRUE,
examples = TRUE,
run_dont_run = FALSE,
seed = 1014,
seed = 1014L,
override = list(),
preview = NA,
devel = TRUE,
Expand Down Expand Up @@ -205,7 +205,7 @@ copy_figures <- function(pkg) {
}
}

examples_env <- function(pkg, seed = 1014, devel = TRUE, envir = parent.frame()) {
examples_env <- function(pkg, seed = 1014L, devel = TRUE, envir = parent.frame()) {
# Re-loading pkgdown while it's running causes weird behaviour with
# the context cache
if (isTRUE(devel) && !(pkg$package %in% c("pkgdown", "rprojroot"))) {
Expand Down
6 changes: 3 additions & 3 deletions R/build.R
Original file line number Diff line number Diff line change
Expand Up @@ -321,7 +321,7 @@
build_site <- function(pkg = ".",
examples = TRUE,
run_dont_run = FALSE,
seed = 1014,
seed = 1014L,
lazy = FALSE,
override = list(),
preview = NA,
Expand Down Expand Up @@ -375,7 +375,7 @@ build_site <- function(pkg = ".",
build_site_external <- function(pkg = ".",
examples = TRUE,
run_dont_run = FALSE,
seed = 1014,
seed = 1014L,
lazy = FALSE,
override = list(),
preview = NA,
Expand Down Expand Up @@ -415,7 +415,7 @@ build_site_external <- function(pkg = ".",
build_site_local <- function(pkg = ".",
examples = TRUE,
run_dont_run = FALSE,
seed = 1014,
seed = 1014L,
lazy = FALSE,
override = list(),
preview = NA,
Expand Down
2 changes: 1 addition & 1 deletion man/build_articles.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/build_reference.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/build_site.Rd

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

0 comments on commit 09d0e77

Please sign in to comment.