Hi all,

Why I am getting,

Error: evaluation nested too deeply: infinite recursion / options(expressions=)?

Thanks in advance!

func <- Vectorize(function(x, a, sad, trunc=0, ...) {
  result <- function(x) {
    f1 <- function(n) {
      dcom <- paste("d", deparse(substitute(sad)), sep="")
        dots <- c(as.name("n"), list(...))
                        f <- do.call(dcom, dots)
      g <- dpois(x,a*n)
      f * g
    }
    integrate(f1, 0, Inf)$value
  }
  return(result(x) / (1 - result(trunc)))
}, "x")

func(1, 0.1, exp)

______________________________________________
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide http://www.R-project.org/posting-guide.html
and provide commented, minimal, self-contained, reproducible code.

Reply via email to