Nothing
disc.mle <- function(x, distr = "poisson", N = NULL, type = 1, tol = 1e-07) {
if ( distr == "poisson" ) {
res <- Rfast::poisson.mle(x)
} else if ( distr == "zip" ) {
res <- Rfast::zip.mle(x, tol = tol)
} else if ( distr == "ztp" ) {
res <- Rfast::ztp.mle(x, tol = tol)
} else if ( distr == "negbin" ) {
res <- Rfast::negbin.mle(x, type = type, tol = tol)
} else if ( distr == "binom" ) {
res <- Rfast::binom.mle(x, N = N, tol = tol)
} else if ( distr == "borel" ) {
res <- Rfast::borel.mle(x)
} else if ( distr == "geom" ) {
res <- Rfast::geom.mle(x, type = type)
} else if ( distr == "logseries" ) {
res <- Rfast::logseries.mle(x, tol = tol)
} else if ( distr == "betageom" ) {
res <- Rfast::betageom.mle(x, tol = tol)
} else if ( distr == "betabinom" ) {
res <- Rfast::betabinom.mle(x, N = N, tol = tol)
} else if ( distr == "gammapois" ) {
res <- Rfast2::gammapois.mle(x, tol = tol)
} else if ( distr == "skellam" ) {
res <- .skellam.mle(x)
} else if ( distr == "gp" ) {
res <- gp::gp.mle(x)
} else if( distr == "cc" ) {
res <- CCd::cc.mle(x)
} else if( distr == "cc0" ) {
res <- CCd::cc.mle0(x, tol = tol)
} else if ( distr == "com-pois" ) {
a <- COMPoissonReg::glm.cmp(x ~ 1)
param <- exp( a[[10]]$par )
names(param) <- c("lambda", "nu")
loglik <- a[[ 9 ]]
res <- list(param = param, loglik = loglik)
} else if ( distr == "zicom-pois" ) {
a <- COMPoissonReg::glm.cmp(x ~ 1, formula.p = ~1)
param <- exp( a[[12]]$par )
names(param) <- c("lambda", "nu", "p")
loglik <- a[[ 11 ]]
res <- list(param = param, loglik = loglik)
}
res
}
.skellam.mle <- function(x) {
n <- length(x)
sx <- sum(x)
sx2 <- sx / 2
mx <- sx / n
theta <- stats::var(x)/2 - mx/2
skel <- function(theta) {
a <- 2 * sqrt(theta^2 + theta * mx)
n * 2 * theta + sx - sx2 * log(1 + mx / theta) -
sum( log( besselI(a, x, expon.scaled = TRUE) ) ) - n * a
}
mod <- optim(theta, skel, control = list(maxit = 5000) )
param <- c( mod$par + mx, mod$par )
names(param) <- c("mu 1", "mu 2")
list(param = param, loglik = -mod$value)
}
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.