Skip to content

Commit

Permalink
pass (local) cran check
Browse files Browse the repository at this point in the history
  • Loading branch information
pearsonca committed Aug 29, 2024
1 parent 1263ca4 commit 1026cfc
Show file tree
Hide file tree
Showing 32 changed files with 675 additions and 1 deletion.
2 changes: 1 addition & 1 deletion R/builder.notR
Original file line number Diff line number Diff line change
Expand Up @@ -2,7 +2,7 @@
commandArgs(trailingOnly = TRUE) |>
readLines() |> (\(x) {
cat(
sprintf("\n#' @export\n%s <- rrejig(stats::%s)\n", x, x),
sprintf("\n#' @title Hash-Matched %s\n#' @param hash an object identifying the event related to the draw\n#' @inheritParams stats::%s\n#' @export\n%s <- rrejig(stats::%s)\n", x, x, x, x),
sep = ""
)
})()
6 changes: 6 additions & 0 deletions R/rrejig.R
Original file line number Diff line number Diff line change
Expand Up @@ -27,8 +27,14 @@ rrejig <- function(rFUN) {
return(.FUN)
}

#' @title Hash-Matched sample
#' @param hash an object identifying the event related to the draw
#' @inheritParams base::sample
#' @export
sample <- rrejig(base::sample)

#' @title Hash-Matched sample.int
#' @param hash an object identifying the event related to the draw
#' @inheritParams base::sample.int
#' @export
sample.int <- rrejig(base::sample.int)
3 changes: 3 additions & 0 deletions R/set_salt.R
Original file line number Diff line number Diff line change
Expand Up @@ -19,6 +19,9 @@ set.salt <- function(salt) {

#' @title Manage RNG state
#'
#' @param hash an object which identifies the event
#' @param .hash.salt an object which identifies the universe
#'
#' @importFrom digest digest
#' @export
set.hash <- function(hash, .hash.salt) {
Expand Down
75 changes: 75 additions & 0 deletions R/zzz_distros.R
Original file line number Diff line number Diff line change
@@ -1,75 +1,150 @@

#' @title Hash-Matched r2dtable
#' @param hash an object identifying the event related to the draw
#' @inheritParams stats::r2dtable
#' @export
r2dtable <- rrejig(stats::r2dtable)

#' @title Hash-Matched rbeta
#' @param hash an object identifying the event related to the draw
#' @inheritParams stats::rbeta
#' @export
rbeta <- rrejig(stats::rbeta)

#' @title Hash-Matched rbinom
#' @param hash an object identifying the event related to the draw
#' @inheritParams stats::rbinom
#' @export
rbinom <- rrejig(stats::rbinom)

#' @title Hash-Matched rcauchy
#' @param hash an object identifying the event related to the draw
#' @inheritParams stats::rcauchy
#' @export
rcauchy <- rrejig(stats::rcauchy)

#' @title Hash-Matched rchisq
#' @param hash an object identifying the event related to the draw
#' @inheritParams stats::rchisq
#' @export
rchisq <- rrejig(stats::rchisq)

#' @title Hash-Matched rexp
#' @param hash an object identifying the event related to the draw
#' @inheritParams stats::rexp
#' @export
rexp <- rrejig(stats::rexp)

#' @title Hash-Matched rf
#' @param hash an object identifying the event related to the draw
#' @inheritParams stats::rf
#' @export
rf <- rrejig(stats::rf)

#' @title Hash-Matched rgamma
#' @param hash an object identifying the event related to the draw
#' @inheritParams stats::rgamma
#' @export
rgamma <- rrejig(stats::rgamma)

#' @title Hash-Matched rgeom
#' @param hash an object identifying the event related to the draw
#' @inheritParams stats::rgeom
#' @export
rgeom <- rrejig(stats::rgeom)

#' @title Hash-Matched rhyper
#' @param hash an object identifying the event related to the draw
#' @inheritParams stats::rhyper
#' @export
rhyper <- rrejig(stats::rhyper)

#' @title Hash-Matched rlnorm
#' @param hash an object identifying the event related to the draw
#' @inheritParams stats::rlnorm
#' @export
rlnorm <- rrejig(stats::rlnorm)

#' @title Hash-Matched rlogis
#' @param hash an object identifying the event related to the draw
#' @inheritParams stats::rlogis
#' @export
rlogis <- rrejig(stats::rlogis)

#' @title Hash-Matched rmultinom
#' @param hash an object identifying the event related to the draw
#' @inheritParams stats::rmultinom
#' @export
rmultinom <- rrejig(stats::rmultinom)

#' @title Hash-Matched rnbinom
#' @param hash an object identifying the event related to the draw
#' @inheritParams stats::rnbinom
#' @export
rnbinom <- rrejig(stats::rnbinom)

#' @title Hash-Matched rnorm
#' @param hash an object identifying the event related to the draw
#' @inheritParams stats::rnorm
#' @export
rnorm <- rrejig(stats::rnorm)

#' @title Hash-Matched rpois
#' @param hash an object identifying the event related to the draw
#' @inheritParams stats::rpois
#' @export
rpois <- rrejig(stats::rpois)

#' @title Hash-Matched rsignrank
#' @param hash an object identifying the event related to the draw
#' @inheritParams stats::rsignrank
#' @export
rsignrank <- rrejig(stats::rsignrank)

#' @title Hash-Matched rsmirnov
#' @param hash an object identifying the event related to the draw
#' @inheritParams stats::rsmirnov
#' @export
rsmirnov <- rrejig(stats::rsmirnov)

#' @title Hash-Matched rstandard
#' @param hash an object identifying the event related to the draw
#' @inheritParams stats::rstandard
#' @export
rstandard <- rrejig(stats::rstandard)

#' @title Hash-Matched rstudent
#' @param hash an object identifying the event related to the draw
#' @inheritParams stats::rstudent
#' @export
rstudent <- rrejig(stats::rstudent)

#' @title Hash-Matched rt
#' @param hash an object identifying the event related to the draw
#' @inheritParams stats::rt
#' @export
rt <- rrejig(stats::rt)

#' @title Hash-Matched runif
#' @param hash an object identifying the event related to the draw
#' @inheritParams stats::runif
#' @export
runif <- rrejig(stats::runif)

#' @title Hash-Matched rweibull
#' @param hash an object identifying the event related to the draw
#' @inheritParams stats::rweibull
#' @export
rweibull <- rrejig(stats::rweibull)

#' @title Hash-Matched rwilcox
#' @param hash an object identifying the event related to the draw
#' @inheritParams stats::rwilcox
#' @export
rwilcox <- rrejig(stats::rwilcox)

#' @title Hash-Matched rWishart
#' @param hash an object identifying the event related to the draw
#' @inheritParams stats::rWishart
#' @export
rWishart <- rrejig(stats::rWishart)
24 changes: 24 additions & 0 deletions man/r2dtable.Rd

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

21 changes: 21 additions & 0 deletions man/rWishart.Rd

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

21 changes: 21 additions & 0 deletions man/rbeta.Rd

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

21 changes: 21 additions & 0 deletions man/rbinom.Rd

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

19 changes: 19 additions & 0 deletions man/rcauchy.Rd

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

21 changes: 21 additions & 0 deletions man/rchisq.Rd

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

19 changes: 19 additions & 0 deletions man/rexp.Rd

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

21 changes: 21 additions & 0 deletions man/rf.Rd

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

22 changes: 22 additions & 0 deletions man/rgamma.Rd

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

Loading

0 comments on commit 1026cfc

Please sign in to comment.