R/logGaus.R

Defines functions EBIC logGaus

# Simply computes the Gaussian log likelihood given sample covariance and estimate of precision:

# Original:
# logGaus <- function(S,K,n)
# {
#   SK = S %*% K
#   tr = function(A) sum(diag(A))
#   n/2 * (log(det(K)) - tr(SK))
# }

## According to huge???
logGaus <- function(S,K,n)
{
    KS = K %*% S
    # SK = S %*% K
    tr = function(A) sum(diag(A))
    return(n/2 * (log(det(K)) - tr(KS))  )
    # return(n/2 * (log(det(K)) - tr(SK))  )
}

# Computes the EBIC:
EBIC <- function(S,K,n,gamma = 0.5,E,countDiagonal=FALSE)
{
#   browser()
  L <- logGaus(S, K, n)
  if (missing(E)){
    E <- sum(K[lower.tri(K,diag=countDiagonal)] != 0)
    # E <- sum(abs(K[lower.tri(K,diag=countDiagonal)]) > sqrt(.Machine$double.eps))
  }
  p <- nrow(K)
  
  # return EBIC:
  -2 * L + E * log(n) + 4 * E * gamma * log(p)  
}

Try the qgraph package in your browser

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

qgraph documentation built on Nov. 3, 2023, 5:07 p.m.