Sigmax function

group specific covariance matrices

group specific covariance matrices

From parameters of DINGO model, group specific covariance matrices are obtained

Sigmax(P = NULL, Q, Psi, x)

Arguments

  • P: a p x p matrix specifying global component
  • Q: the coefficient parameter matrix of covariance regression model using Greg.em function
  • Psi: the diagonal error variance matrix of covariance regression model using Greg.em function
  • x: a vector specifying group. This must be corresponding to the design matrix of Greg.em function

Returns

group specific precision matrix

Author(s)

Min Jin Ha mjha@mdanderson.org

Examples

library(glasso) data(gbm) x = gbm[,1] Y = as.matrix(gbm[,-1]) p = ncol(Y) # Estimating inverse covariance matrix using GLasso # S = cov(Y) w.upper = which(upper.tri(S)) rhoarray = exp(seq(log(0.001),log(1),length=100)) BIC = rep(0,length(rhoarray)) for (rh in 1:length(rhoarray)) { fit.gl1 = glasso(S,rho=rhoarray[rh]) BIC[rh] = extendedBIC(gamma=0,omegahat=fit.gl1$wi,S=S,n=nrow(Y)) } rho = rhoarray[which.min(BIC)] fit.gl2 = glasso(S,rho=rho) Omega = fit.gl2$wi # Fitting (Covariance Regression on transformed data) diag.Omega = diag(Omega) P = -Omega/diag.Omega diag(P) = 0 tY = Y mdat = apply(tY,2,mean) sdat = apply(tY,2,sd) std.tY = t((t(tY) - mdat)/sdat) smat = diag(sdat) ## rank 1 covariance regression fit.g = Greg.em(std.tY~x,R=1) ## obtain covariance matrix of Y when x=1 sigmaX1 = Sigmax(Q=fit.g$B,P=P,Psi=fit.g$A,x=c(1,1))
  • Maintainer: Caleb A. Class
  • License: GPL-2
  • Last published: 2020-07-30

Useful links