Search code examples
rif-statementjags

JAGS post calculation and ifelse/step


I'm relatively new to JAGS and am running it through the R package jagsUI. I am building occupancy models, but want to summarize results as I go. So I have a matrix of 0s and 1s:

mat1 <- matrix(rbinom(10*10,1,.5),10,10)
y=mat1

That I want to run through the following model:

# Bundle data and summarize data bundle
str( win.data <- list(y = mat1, M = nrow(mat1), T = ncol(mat1)) )

# Specify model in BUGS language
sink("model.txt")
cat("
model {
# Priors
   psi0 ~ dunif(0, 1)
   p ~ dunif(0, 1)
for(t in 1:(T-1)){
  rho[t] ~ dunif(-1,1)
}
beta0 ~ dnorm(0, 0.1)
# Likelihood
   for (i in 1:M) {    # Loop over sites
      z[i,1] ~ dbern(psi0)         # State model

      y[i,1] ~ dbern(z[i,1]*p)
      for (j in 2:T) {    # Loop over replicate surveys
          logit(psi[i,j])<- beta0 + rho[j-1]*z[i,j-1]
          z[i,j] ~ dbern(psi[i,j])
          y[i,j] ~ dbern(z[i,j]*p)  # Observation model
       }
   }
# Derived quantities
    coln[i,j] <- ifelse(z[i,j]-z[i,j-1]==1,1,0) # colonized
    ext[i,j] <- ifelse(z[i,j-1]-z[i,j]==1,1,0) # went extinct
    tot.coln[,j] <- sum(coln[,j]) # sum of colonized each survey
    tot.ext[,j] <- sum(ext[,j]) # sum of extinctions each survey
    Nocc[,j] <-  sum(z[,j]) # total sites occupied each survey
    coln.rate[,j] <- tot.coln[,j]/Nocc[,j]
    ext.rate[,j] <- tot.ext[,j]/Nocc[,j]

}
",fill = TRUE)
sink()

# Initial values
zst <- apply(y, 1, max, na.rm=TRUE)       # Avoid data/model/inits conflict

y<- as.matrix(y)
zst<- y

inits <- function(){list(z = zst)}

# Parameters monitored
params <- c("psi0", "p", "beta0", "coln.rate", "ext.rate")

# MCMC settings
ni <- 2000   ;   nt <- 1   ;   nb <- 1000   ;   nc <- 3

# Call JAGS and summarize posteriors
library(jagsUI)
fm <- jags(win.data, inits, params, "model.txt", n.chains = nc,
           n.thin = nt, n.iter = ni, n.burnin = nb)
print(fm, dig = 3)

The model runs except for the piece after "# Derived quantities". Basically I want to calculate the rate of change from 0 to 1 and from 1 to 0 in each survey. A couple of my thoughts on why it doesn't work. 1) z[i,j] isn't really 0s and 1s. 2) the calculations shouldn't go under Derived quantities. 3) ifelse from the JAGS manual isn't doing what I think.

I also tried using the "step" function replacing the first two lines after Derived quantities with:

coln[i,j] <- step(z[i,j]-z[i,j-1]-0.5) # colonized
ext[i,j] <- step(z[i,j-1]-z[i,j]-0.5) # went extinct

But no luck there. Any ideas?


Solution

  • You are indexing i and j here without looping through them. To make this work you would need to set it up within another nested for loop. Also, your extinction calculation was incorrect.

    for(j in 2:T){
        for(i in 1:M){
        coln[i,j-1] <- ifelse(z[i,j]-z[i,j-1]==1,1,0) # colonized
        ext[i,j-1] <- ifelse(z[i,j]-z[i,j-1]==-1,1,0) # went extinct
    }
        tot.coln[j-1] <- sum(coln[,j-1]) # sum of colonized each survey
        tot.ext[j-1] <- sum(ext[,j-1]) # sum of extinctions each survey
        Nocc[j-1] <-  sum(z[,j-1]) # total sites occupied each survey
        coln.rate[j-1] <- tot.coln[j-1]/Nocc[j-1]
        ext.rate[j-1] <- tot.ext[j-1]/Nocc[j-1]
    }