R/move.HSMM.mllk.R

Defines functions move.HSMM.mllk

Documented in move.HSMM.mllk

#'Compute negative log likelihood of HSMM
#'
#'This function, modified from Langrock et al. (2012), computes the negative
#'log likelihood of the hidden Markov model. 
#'
#'@param parvect The vector of parameters to be estimated
#'@param obs A n x ndist matrix of data.  If ndist=1, obs must be a n x 1 matrix.
#'@param PDFs A list of PDFs for the dwell time and ndist observation distributions.
#'@param CDFs A list of CDFs for the dwell time and ndist observation distributions.
#'@param skeleton A list with the original parameter structure used to reassemble
#'parvect
#'@param inv.transforms A list of inverse transformations used to transform
#'parvect back to the original scale
#'@param nstates Number of hidden states
#'@param m1 a vector of length nstates that specifies how many states will be used to approximate each
#'state of the HSMM (see Langrock and Zuchinni 2011)
#'@param ini numeric value that specifies how the initial state distribution is calculated. 0 sets the
#'initial distribution to the stationary distribution.  If this matrix is not invertible, 1 sets
#'the initial distribution for each state within each state agreggate to 1/m(state).
#'@return The negative log likelihood of the hidden markov model.
#'@param useRcpp Logical indicating whether or not to use Rcpp.
#'@include gen.Gamma
#'@export
## function that computes the negative log-likelihood
move.HSMM.mllk <- function(parvect,obs,PDFs,CDFs,skeleton,inv.transforms,nstates,m1,ini,useRcpp=FALSE){
  n <- dim(obs)[1]
  lpn <- move.HSMM.pw2pn(inv.transforms,parvect,skeleton,nstates)
  params=lpn$params
  Gamma <- gen.Gamma(m=m1,params,PDFs,CDFs)
  if(nstates>2){
    #Remove t.p.m.
    params[[1]]=NULL
  }
  nparam=unlist(lapply(params,ncol))
  sm1=sum(m1)
  if (ini==1) {delta <- rep(1/(sm1),sm1)} # if invertibility problems
  if (ini==0) {delta <- solve(t(diag(sm1)-Gamma+1),rep(1,sm1))}
  allprobs <- matrix(rep(1,(sm1)*n),nrow=n)
  cm1=cumsum(m1)
  mstart=c(1,cm1+1)
  mstart=mstart[-length(mstart)]
  mstop=cm1
  ndists=length(PDFs)
  #make index for NAs
  use=!is.na(obs)*1
  for(i in 2:ndists){
    if(nparam[i]==2){
      #for 2 parameter distributions
      for (j in 1:nstates){
        allprobs[use[,i-1],mstart[j]:mstop[j]] <- allprobs[use[,i-1],mstart[j]:mstop[j]]*matrix(rep(PDFs[[i]](obs[use[,i-1],i-1],params[[i]][j,1],params[[i]][j,2]),m1[j]),ncol=m1[j])
      }
    }else if(nparam[i]==1){
      #for 1 parameter distributions. 
      for (j in 1:nstates){
        allprobs[use[,i-1],mstart[j]:mstop[j]] <- allprobs[use[,i-1],mstart[j]:mstop[j]]*matrix(rep(PDFs[[i]](obs[use[,i-1],i-1],params[[i]][j]),m1[j]),ncol=m1[j])
      }
    }else if(nparam[i]==3){
      #for 3 parameter distributions
      for (j in 1:nstates){
        allprobs[use[,i-1],mstart[j]:mstop[j]] <- allprobs[use[,i-1],mstart[j]:mstop[j]]*matrix(rep(PDFs[[i]](obs[use[,i-1],i-1],params[[i]][j,1],params[[i]][j,2],params[[i]][j,3]),m1[j]),ncol=m1[j])
      }
    }
  }
  foo <- delta 
  if(class(useRcpp)=="CFunc"){
    foo=matrix(foo,ncol=sm1)
    mllk=useRcpp(Gamma,allprobs,foo)
  }else{
    lscale <- 0
    for (i in 1:n){
      foo <- foo%*%Gamma*allprobs[i,]  
      sumfoo <- sum(foo) #f_t+1,t
      lscale <- lscale+log(sumfoo) #adding log likelihood contributions
      foo <- foo/sumfoo
    }
    mllk <- -lscale
  }
  mllk
}
benaug/move.HMM documentation built on Jan. 23, 2022, 4:29 a.m.