R/mle.bell.r

Defines functions mle.bell

Documented in mle.bell

#' @export
#' @import maxLik
#' @import stats
#' @importFrom miscTools stdEr

mle.bell <- function(x, theta) {

n <- length(x)

  loglik<-function(p){

    theta <- p[1]
    loglik <- sum(x)*log(p[1])+n*(1-exp(p[1]))-sum(lgamma(x + 1))+sum(log(sapply(x,bell)))

  }
  res <- suppressWarnings(maxLik(loglik,start=c(theta)))
  aux <- cbind(coef(res), miscTools::stdEr(res))
  colnames(aux) = c("MLE", "SE")

  aux1 = cbind(AIC(res))
  colnames(aux1) = c("AIC")
  list(Estimates = aux, AIC= aux1)
}

Try the countDM package in your browser

Any scripts or data that you put into this service are public.

countDM documentation built on May 31, 2023, 6:13 p.m.