Nothing
#' Confidence Intervals
#'
#' @author Ivan Jacob Agaloos Pesigan
#'
#' @return Returns a matrix of
#' estimates,
#' standard errors,
#' and
#' confidence intervals.
#'
#' @param object Object of class `betamc`.
#' @param alpha Numeric vector.
#' Significance level.
#'
#' @family Beta Monte Carlo Functions
#' @keywords betaMC ci internal
#' @noRd
.CI <- function(object,
alpha = NULL) {
stopifnot(
inherits(
object,
"betamc"
)
)
if (is.null(alpha)) {
alpha <- object$args$alpha
}
probs <- .PCProbs(alpha = alpha)
thetahatstar <- do.call(
what = "rbind",
args = object$thetahatstar
)
thetahatstar <- unname(thetahatstar)
colnames(thetahatstar) <- names(object$est)
thetahat <- object$est
ci <- vector(
mode = "list",
length = dim(thetahatstar)[2]
)
for (i in seq_len(dim(thetahatstar)[2])) {
ci[[i]] <- .PCCI(
thetahatstar = thetahatstar[, i],
thetahat = thetahat[[i]],
probs = probs
)
}
ci <- do.call(
what = "rbind",
args = ci
)
rownames(ci) <- names(thetahat)
return(
ci
)
}
Any scripts or data that you put into this service are public.
Add the following code to your website.
For more information on customizing the embed code, read Embedding Snippets.