Skip to content

Commit

Permalink
Update generics to include ...
Browse files Browse the repository at this point in the history
  • Loading branch information
mattfidler committed Oct 27, 2023
1 parent ce220c1 commit af4ab6c
Show file tree
Hide file tree
Showing 4 changed files with 8 additions and 16 deletions.
4 changes: 2 additions & 2 deletions R/utils.R
Original file line number Diff line number Diff line change
Expand Up @@ -851,7 +851,7 @@ meanProbs <- function(x, ...) {
#' @export
meanProbs.default <- function(x, probs=seq(0, 1, 0.25), na.rm=FALSE,
names=TRUE, useT=TRUE, onlyProbs=TRUE, pred=FALSE,
n=0L) {
n=0L, ...) {
checkmate::assertNumeric(x)
checkmate::assertNumeric(probs, min.len=1, any.missing = FALSE, lower=0.0, upper=1.0)
checkmate::assertLogical(na.rm, any.missing=FALSE, len=1)
Expand Down Expand Up @@ -998,7 +998,7 @@ binomProbs.default <- function(x, probs=c(0.025, 0.05, 0.5, 0.95, 0.975), na.rm=
pred=FALSE,
piMethod=c("lim"), M=500000,
tol=.Machine$double.eps^0.25,
ciMethod=c("wilson", "wilsonCorrect", "agrestiCoull", "wald", "wc", "ac")) {
ciMethod=c("wilson", "wilsonCorrect", "agrestiCoull", "wald", "wc", "ac"), ...) {
checkmate::assertNumeric(x, min.len=1, lower=0.0, upper=1.0)
x <- as.double(x)
checkmate::assertIntegerish(n, min.len=1, lower=0, any.missing=FALSE)
Expand Down
3 changes: 2 additions & 1 deletion man/binomProbs.Rd

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

3 changes: 2 additions & 1 deletion man/meanProbs.Rd

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

14 changes: 2 additions & 12 deletions man/rxode2.Rd

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

0 comments on commit af4ab6c

Please sign in to comment.