#+PROPERTY: header-args :eval never-export #+TITLE: Statistics, figures and tables #+OPTIONS: num:nil tol:2 # -*- org-confirm-babel-evaluate: nil -*- * Final Analysis :noexport: *** Calculating **** Initializing, we use all data N=156, but 5 Volumes missing, N=151 ***** Original initialization, without excluding EF outliers #+BEGIN_SRC R :session ECTanal fd<-read.csv('/nethome/amiklos/work/ECT/Bergen/N154/fd.csv') library(ggplot2) ggplot(data=fd,aes(x=Site.1,y=madrs_hdrs_percentage_cahnge))+ geom_boxplot()+ geom_point() #ind.fd<-which(fd$madrs_hdrs_percentage_cahnge> (-5)) ind.fd<-which(!is.na(fd$Right.Amygdala.baseline.3)) code<-cbind(c('AL','DC','EM','MS','OS','RB','ZV'),c('Narr et al.','Abbott et al.','Dols et al.','Redlich et al.','Argyelan et al.','Oltedal et al.','Emsell et al.')) length(ind.fd) myroi.names<-colnames(fd)[grep("EF_",colnames(fd))][c(5:9,12:14,16:17,24:32,44:76,79:111)] myvol.names<-c() for (j in myroi.names) { myvol.names<-c(myvol.names,colnames(fd)[grep('volumechange_',colnames(fd))][grep(strsplit(j,'EF_')[[1]][2],colnames(fd)[grep('volumechange_',colnames(fd))])]) } varnames<-data.frame(myroi.names,myvol.names) #MECTA length(which(fd$ect_device.1[ind.fd]==1)) #THYMATRON length(which(fd$ect_device.1[ind.fd]==2)) ##sites per device ggplot(data=fd[ind.fd,],aes(x=Site.1,y=ect_device.1))+ geom_point() # medication #medication free length(which(fd$antidepressants.1[ind.fd]==0)) mfr<-which(fd$antidepressants.1==0) med.free<-intersect(mfr,ind.fd) under.med<-setdiff(ind.fd, med.free) #SSRI length(which(fd$antidepressants.1[ind.fd]==1)) #SNRI length(which(fd$antidepressants.1[ind.fd]==2)) #TCA length(which(fd$antidepressants.1[ind.fd]==3)) #MAOI length(which(fd$antidepressants.1[ind.fd]==4)) #MISC length(which(fd$antidepressants.1[ind.fd]==5)) ind.ch<-which(fd$antidepressants.3[ind.fd]-fd$antidepressants.1[ind.fd]!=0) cbind(fd$antidepressants.1[ind.ch],fd$antidepressants.3[ind.ch]) ggplot(data=fd[ind.fd,],aes(x=Site.1,y=antidepressants.1))+ geom_point() fd$antidepressants.3[ind.fd] summary(fd$diagnosis.1) #table for site , number age, sd, baseline, average improvement it<-which(colnames(fd)%in%c('Site.1','Age.1','madrs_hdrs_conversion.1','madrs_hdrs_percentage_cahnge')) t1<-aggregate(.~Site.1,FUN=mean,data = fd[ind.fd,it]) t2<-aggregate(.~Site.1,FUN=sd,data = fd[ind.fd,it]) t3<-table(fd[ind.fd,it[1]]) sum(t3) #tt<-cbind(t1,t2,t3)[,c(1,10,2,6,3,7,4,8)] tt<-cbind(t1,t2,t3)[,c(1,10,2,6,3,4)] colnames(tt)<-c('Site','N','Age mean','Age sd','Baseline MADRS','MADRS change') tt$Site<-code[which(code[,1]%in%tt$Site),2] tt$'MADRS change'<-100*tt$'MADRS change' write.csv(tt,'/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/N156_Site_Summary.csv') tt #+END_SRC #+RESULTS: | Narr et al. | 30 | 39.8666666666667 | 12.6810565570184 | 40.7333333333333 | 45.1245102874469 | | Abbott et al. | 33 | 64.4848484848485 | 8.92720985289221 | 31.3606060606061 | 69.4801004068472 | | Dols et al. | 16 | 73.625 | 12.4519074843977 | 29.5625 | 77.243936759454 | | Redlich et al. | 23 | 46.8695652173913 | 9.19142064311797 | 29.9565217391304 | 43.1756262706063 | | Argyelan et al. | 2 | 62.5 | 0.707106781186548 | 36.75 | 32.0321069639204 | | Oltedal et al. | 18 | 48.5 | 16.7691944455582 | 33.8333333333333 | 57.1151188612553 | | Emsell et al. | 29 | 72.6551724137931 | 7.57475064214264 | 35.0689655172414 | 79.1303978601593 | I have checked results without obvious two outliers, but no difference. #r/o EM and ZV outliers #ind.fd<-which(fd$madrs_hdrs_percentage_cahnge> (-0.25)) ***** Alternative Initializing, excluding EF outliers #+BEGIN_SRC R :session ECTanal fd<-read.csv('/nethome/amiklos/work/ECT/Bergen/N154/fd.csv') library(ggplot2) ggplot(data=fd,aes(x=Site.1,y=madrs_hdrs_percentage_cahnge))+ geom_boxplot()+ geom_point() #ind.fd<-which(fd$madrs_hdrs_percentage_cahnge> (-5)) qH<-quantile(fd$EF_Right.Hippocampus) iqr.cr<-qH[4]+(1.5*(qH[4]-qH[2])) #which(fd$EF_Right.Hippocampus (-0.25)) **** Calculating EFinTotalVolume ~ Total Volume + Age #+BEGIN_SRC R :session ECTanal #i<-1 sum<-0 wsum<-0 for (i in 1:dim(varnames)[1]) { ef<-fd[ind.fd,grep(varnames[i,1],colnames(fd))] baseline<-paste0(strsplit(as.character(varnames[i,2]),'_')[[1]][2],'.baseline.3') vol<-fd[ind.fd,grep(baseline,colnames(fd))] wsum<-wsum+(ef*vol) sum<-sum+vol } fd$EFaverage<-NA fd$EFaverage[ind.fd]<-(wsum/sum) lm.1<-lm(EFaverage ~ WholeBrain.baseline.3 + Age.1,data=fd[ind.fd,]) lm.1<-lm(EFaverage ~ WholeBrain.baseline.3,data=fd[ind.fd,]) lm.1<-lm(WholeBrain.baseline.3 ~ Age.1,data=fd[ind.fd,]) #lm.1<-lme(EFaverage~WholeBrain.baseline.3+Age.1,data=fd[ind.fd,],random = ~1|Site.1, na.action = na.omit) res<-summary(lm.1) res #+END_SRC #+RESULTS: **** Calculating \Delta Volume ~ EF + Age + ECTnumber #+BEGIN_SRC R :session ECTanal myres1v3<-matrix(NA,length(myroi.names),6) for (i in 1:dim(varnames)[1]) { ef<-fd[ind.fd,grep(varnames[i,1],colnames(fd))] dvol<-fd[ind.fd,grep(varnames[i,2],colnames(fd))] lm.1<-lm(dvol~ef+Age.1+rul_number.1,data=fd[ind.fd,]) res<-summary(lm.1) myres1v3[i,1]<-res$coefficients[2,3] myres1v3[i,2]<-res$coefficients[2,4] myres1v3[i,3]<-res$coefficients[3,3] myres1v3[i,4]<-res$coefficients[3,4] myres1v3[i,5]<-res$coefficients[4,3] myres1v3[i,6]<-res$coefficients[4,4] } kiir<-data.frame(myroi.names,myres1v3) colnames(kiir)<-c('roi','tef','pef','tAge','pAge','tECTnum','pECTnum') write.csv(kiir, '/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/N156_Vol-EF+Age+ECTnum.csv') mytable<-data.frame(myroi.names,myres1v3) fdr<-p.adjust(myres1v3[,2],method = 'fdr')#Benjamini & Hochberg 1995 FDR #by<-p.adjust(myres1v3[,2],method = 'fdr')#Benjamini & Yekutieli 2001 FDR holm<-p.adjust(myres1v3[,2],method = 'holm')#Holm 1979 very strict FWE fdr.res<-data.frame(mytable, fdr, holm) colnames(fdr.res)<-c('roi','t_EF','p_EF','t_Age','p_Age','t_ECTnum','p_ECTnum','BH^EF_FDR','Holm^EF_FWE') write.csv(fdr.res, '/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/N151_dVol-EF+Age+ECTnum_FDRcorrect.csv') #+END_SRC #+RESULTS: **** Calculating \Delta Volume ~ EF + Age + ECTnumber + Site #+BEGIN_SRC R :session ECTanal myres1v3.s<-matrix(NA,length(myroi.names),6) for (i in 1:dim(varnames)[1]) { ef<-fd[ind.fd,grep(varnames[i,1],colnames(fd))] dvol<-fd[ind.fd,grep(varnames[i,2],colnames(fd))] lm.1<-lm(dvol~ef+Age.1+rul_number.1+Site.1,data=fd[ind.fd,]) res<-summary(lm.1) myres1v3.s[i,1]<-res$coefficients[2,3] myres1v3.s[i,2]<-res$coefficients[2,4] myres1v3.s[i,3]<-res$coefficients[3,3] myres1v3.s[i,4]<-res$coefficients[3,4] myres1v3.s[i,5]<-res$coefficients[4,3] myres1v3.s[i,6]<-res$coefficients[4,4] } kiir<-data.frame(myroi.names,myres1v3.s) colnames(kiir)<-c('roi','tef','pef','tAge','pAge','tECTnum','pECTnum') write.csv(kiir, '/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/N156_Vol-EF+Age+ECTnum+Site.csv') mytable<-data.frame(myroi.names,myres1v3.s) fdr<-p.adjust(myres1v3.s[,2],method = 'fdr')#Benjamini & Hochberg 1995 FDR #by<-p.adjust(myres1v3[,2],method = 'fdr')#Benjamini & Yekutieli 2001 FDR holm<-p.adjust(myres1v3.s[,2],method = 'holm')#Holm 1979 very strict FWE fdr.res<-data.frame(mytable, fdr, holm) colnames(fdr.res)<-c('roi','t_EF','p_EF','t_Age','p_Age','t_ECTnum','p_ECTnum','BH^EF_FDR','Holm^EF_FWE') write.csv(fdr.res, '/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/N151_dVol-EF+Age+ECTnum+Site_FDRcorrect.csv') #+END_SRC #+RESULTS: **** Calculating mixed effect \Delta Volume ~ EF + Age + ECTnumber + Site #+BEGIN_SRC R :session ECTanal library(nlme) myres1v3.s<-matrix(NA,length(myroi.names),6) for (i in 1:dim(varnames)[1]) { ef<-fd[ind.fd,grep(varnames[i,1],colnames(fd))] dvol<-fd[ind.fd,grep(varnames[i,2],colnames(fd))] #lm.1<-lm(dvol~ef+Age.1+rul_number.1+Site.1,data=fd[ind.fd,]) lm.1<-lme(dvol~ef+Age.1+rul_number.1,data=fd[ind.fd,],random = ~1|Site.1, na.action = na.omit) res<-summary(lm.1) myres1v3.s[i,1]<-res$tTable[2,4] myres1v3.s[i,2]<-res$tTable[2,5] myres1v3.s[i,3]<-res$tTable[3,4] myres1v3.s[i,4]<-res$tTable[3,5] myres1v3.s[i,5]<-res$tTable[4,4] myres1v3.s[i,6]<-res$tTable[4,5] } kiir<-data.frame(myroi.names,myres1v3.s) colnames(kiir)<-c('roi','tef','pef','tAge','pAge','tECTnum','pECTnum') write.csv(kiir, '/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/Mixed_N156_Vol-EF+Age+ECTnum+Site.csv') mytable<-data.frame(myroi.names,myres1v3.s) fdr<-p.adjust(myres1v3.s[,2],method = 'fdr')#Benjamini & Hochberg 1995 FDR #by<-p.adjust(myres1v3[,2],method = 'fdr')#Benjamini & Yekutieli 2001 FDR holm<-p.adjust(myres1v3.s[,2],method = 'holm')#Holm 1979 very strict FWE fdr.res<-data.frame(mytable, fdr, holm) colnames(fdr.res)<-c('roi','t_EF','p_EF','t_Age','p_Age','t_ECTnum','p_ECTnum','BH^EF_FDR','Holm^EF_FWE') write.csv(fdr.res, '/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/Mixed_N151_dVol-EF+Age+ECTnum+Site_FDRcorrect.csv') #write.csv(fdr.res, '/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/IQR_Mixed_N151_dVol-EF+Age+ECTnum+Site_FDRcorrect.csv') #+END_SRC #+RESULTS: **** Calculating mixed effect \Delta Volume ~ EF + Age + ECTnumber + Site + medication #+BEGIN_SRC R :session ECTanal library(nlme) myres1v3.s<-matrix(NA,length(myroi.names),6) for (i in 1:dim(varnames)[1]) { fd$medication<-NA fd$medication[med.free]<-0 fd$medication[under.med]<-1 fd$medication<-factor(fd$medication) ef<-fd[ind.fd,grep(varnames[i,1],colnames(fd))] dvol<-fd[ind.fd,grep(varnames[i,2],colnames(fd))] #lm.1<-lm(dvol~ef+Age.1+rul_number.1+Site.1,data=fd[ind.fd,]) lm.1<-lme(dvol~ef+Age.1+rul_number.1,data=fd[ind.fd,],random = ~1|Site.1/medication, na.action = na.omit) res<-summary(lm.1) myres1v3.s[i,1]<-res$tTable[2,4] myres1v3.s[i,2]<-res$tTable[2,5] myres1v3.s[i,3]<-res$tTable[3,4] myres1v3.s[i,4]<-res$tTable[3,5] myres1v3.s[i,5]<-res$tTable[4,4] myres1v3.s[i,6]<-res$tTable[4,5] } kiir<-data.frame(myroi.names,myres1v3.s) colnames(kiir)<-c('roi','tef','pef','tAge','pAge','tECTnum','pECTnum') write.csv(kiir, '/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/Mixed_N156_Vol-EF+Age+ECTnum+Site+Med.csv') mytable<-data.frame(myroi.names,myres1v3.s) fdr<-p.adjust(myres1v3.s[,2],method = 'fdr')#Benjamini & Hochberg 1995 FDR #by<-p.adjust(myres1v3[,2],method = 'fdr')#Benjamini & Yekutieli 2001 FDR holm<-p.adjust(myres1v3.s[,2],method = 'holm')#Holm 1979 very strict FWE fdr.res<-data.frame(mytable, fdr, holm) colnames(fdr.res)<-c('roi','t_EF','p_EF','t_Age','p_Age','t_ECTnum','p_ECTnum','BH^EF_FDR','Holm^EF_FWE') write.csv(fdr.res, '/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/Mixed_N151_dVol-EF+Age+ECTnum+Site+Med_FDRcorrect.csv') #+END_SRC #+RESULTS: **** Calculating mixed effect \Delta Volume ~ EF + BaslineVolume + ECTnumber + Site #+BEGIN_SRC R :session ECTanal library(nlme) myres1vbv.s<-matrix(NA,length(myroi.names),6) for (i in 1:dim(varnames)[1]) { bn<-substr(varnames[i,2],14,nchar(as.character(varnames[i,2])))#cut the volumechange from the begining vn<-fd[ind.fd,grep(paste0(bn,'.baseline.3'),colnames(fd))] ef<-fd[ind.fd,grep(varnames[i,1],colnames(fd))] dvol<-fd[ind.fd,grep(varnames[i,2],colnames(fd))] #lm.1<-lm(dvol~ef+Age.1+rul_number.1+Site.1,data=fd[ind.fd,]) lm.1<-lme(dvol~ef+vn+rul_number.1,data=fd[ind.fd,],random = ~1|Site.1, na.action = na.omit) res<-summary(lm.1) myres1vbv.s[i,1]<-res$tTable[2,4] myres1vbv.s[i,2]<-res$tTable[2,5] myres1vbv.s[i,3]<-res$tTable[3,4] myres1vbv.s[i,4]<-res$tTable[3,5] myres1vbv.s[i,5]<-res$tTable[4,4] myres1vbv.s[i,6]<-res$tTable[4,5] } kiir<-data.frame(myroi.names,myres1vbv.s) colnames(kiir)<-c('roi','tef','pef','tBasVol','pBasVol','tECTnum','pECTnum') write.csv(kiir, '/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/Mixed_N156_Vol-EF+BasVol+ECTnum+Site.csv') mytable<-data.frame(myroi.names,myres1vbv.s) fdr<-p.adjust(myres1vbv.s[,2],method = 'fdr')#Benjamini & Hochberg 1995 FDR #by<-p.adjust(myres1v3[,2],method = 'fdr')#Benjamini & Yekutieli 2001 FDR holm<-p.adjust(myres1vbv.s[,2],method = 'holm')#Holm 1979 very strict FWE fdr.res<-data.frame(mytable, fdr, holm) colnames(fdr.res)<-c('roi','t_EF','p_EF','t_BasVol','p_BasVol','t_ECTnum','p_ECTnum','BH^EF_FDR','Holm^EF_FWE') write.csv(fdr.res, '/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/Mixed_N151_dVol-EF+BasVol+ECTnum+Site_FDRcorrect.csv') #write.csv(fdr.res, '/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/IQR_Mixed_N151_dVol-EF+Age+ECTnum+Site_FDRcorrect.csv') #+END_SRC #+RESULTS: **** Calculating \Delta MADRS ~ \Delta Volume + Age + ECTnum #+BEGIN_SRC R :session ECTanal myres2v3<-matrix(NA,length(myroi.names),6) for (i in 1:dim(varnames)[1]) { ef<-fd[ind.fd,grep(varnames[i,1],colnames(fd))] dvol<-fd[ind.fd,grep(varnames[i,2],colnames(fd))] lm.1<-lm(madrs_hdrs_percentage_cahnge~dvol+Age.1+rul_number.1,data=fd[ind.fd,]) #lm.1<-lm(madrs_hdrs_percentage_cahnge~ef,data=fd[ind.fd,]) res<-summary(lm.1) myres2v3[i,1]<-res$coefficients[2,3] myres2v3[i,2]<-res$coefficients[2,4] myres2v3[i,3]<-res$coefficients[3,3] myres2v3[i,4]<-res$coefficients[3,4] myres2v3[i,5]<-res$coefficients[4,3] myres2v3[i,6]<-res$coefficients[4,4] } kiir<-data.frame(myroi.names,myres2v3) colnames(kiir)<-c('roi','tvol','pvol','tAge','pAge','tECTnum','pECTnum') write.csv(kiir, '/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/N156_dMADRSperc-dVol+Age+ECTnum.csv') #does not need to do FDR (unfortunatelly) #+END_SRC #+RESULTS: We did not expect too much here given Oltedal et al. 2018. **** Calculating \Delta MADRS ~ \Delta Volume + Age + ECTnum + Site #+BEGIN_SRC R :session ECTanal myres2v3.s<-matrix(NA,length(myroi.names),6) for (i in 1:dim(varnames)[1]) { ef<-fd[ind.fd,grep(varnames[i,1],colnames(fd))] dvol<-fd[ind.fd,grep(varnames[i,2],colnames(fd))] lm.1<-lm(madrs_hdrs_percentage_cahnge~dvol+Age.1+rul_number.1+Site.1,data=fd[ind.fd,]) #lm.1<-lm(madrs_hdrs_percentage_cahnge~ef,data=fd[ind.fd,]) res<-summary(lm.1) myres2v3.s[i,1]<-res$coefficients[2,3] myres2v3.s[i,2]<-res$coefficients[2,4] myres2v3.s[i,3]<-res$coefficients[3,3] myres2v3.s[i,4]<-res$coefficients[3,4] myres2v3.s[i,5]<-res$coefficients[4,3] myres2v3.s[i,6]<-res$coefficients[4,4] } kiir<-data.frame(myroi.names,myres2v3.s) colnames(kiir)<-c('roi','tvol','pvol','tAge','pAge','tECTnum','pECTnum') write.csv(kiir, '/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/N156_dMADRSperc-dVol+Age+ECTnum+Site.csv') #does not need to do FDR (unfortunatelly) #+END_SRC #+RESULTS: We did not expect too much here given Oltedal et al. 2018. **** Calculating mixed effect \Delta MADRS ~ \Delta Volume + Age + ECTnum + Site #+BEGIN_SRC R :session ECTanal myres2v3.s<-matrix(NA,length(myroi.names),6) for (i in 1:dim(varnames)[1]) { ef<-fd[ind.fd,grep(varnames[i,1],colnames(fd))] dvol<-fd[ind.fd,grep(varnames[i,2],colnames(fd))] #lm.1<-lm(madrs_hdrs_percentage_cahnge~dvol+Age.1+rul_number.1+Site.1,data=fd[ind.fd,]) lm.1<-lme(madrs_hdrs_percentage_cahnge~dvol+Age.1+rul_number.1,data=fd[ind.fd,],random=~1|Site.1, na.action=na.omit) #lm.1<-lm(madrs_hdrs_percentage_cahnge~ef,data=fd[ind.fd,]) res<-summary(lm.1) myres2v3.s[i,1]<-res$tTable[2,4] myres2v3.s[i,2]<-res$tTable[2,5] myres2v3.s[i,3]<-res$tTable[3,4] myres2v3.s[i,4]<-res$tTable[3,5] myres2v3.s[i,5]<-res$tTable[4,4] myres2v3.s[i,6]<-res$tTable[4,5] } kiir<-data.frame(myroi.names,myres2v3.s) colnames(kiir)<-c('roi','tvol','pvol','tAge','pAge','tECTnum','pECTnum') write.csv(kiir, '/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/Mixed_N156_dMADRSperc-dVol+Age+ECTnum+Site.csv') #does not need to do FDR (unfortunatelly) #+END_SRC #+RESULTS: We did not expect too much here given Oltedal et al. 2018. **** Calculating mixed effect \Delta MADRS ~ \Delta Volume + Age + ECTnum + Site + medication #+BEGIN_SRC R :session ECTanal library(nlme) myres2v3.s<-matrix(NA,length(myroi.names),6) for (i in 1:dim(varnames)[1]) { ef<-fd[ind.fd,grep(varnames[i,1],colnames(fd))] dvol<-fd[ind.fd,grep(varnames[i,2],colnames(fd))] #lm.1<-lm(madrs_hdrs_percentage_cahnge~dvol+Age.1+rul_number.1+Site.1,data=fd[ind.fd,]) lm.1<-lme(madrs_hdrs_percentage_cahnge~dvol+Age.1+rul_number.1,data=fd[ind.fd,],random=~1|Site.1/medication, na.action=na.omit) #lm.1<-lm(madrs_hdrs_percentage_cahnge~ef,data=fd[ind.fd,]) res<-summary(lm.1) myres2v3.s[i,1]<-res$tTable[2,4] myres2v3.s[i,2]<-res$tTable[2,5] myres2v3.s[i,3]<-res$tTable[3,4] myres2v3.s[i,4]<-res$tTable[3,5] myres2v3.s[i,5]<-res$tTable[4,4] myres2v3.s[i,6]<-res$tTable[4,5] } kiir<-data.frame(myroi.names,myres2v3.s) colnames(kiir)<-c('roi','tvol','pvol','tAge','pAge','tECTnum','pECTnum') write.csv(kiir, '/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/Mixed_N156_dMADRSperc-dVol+Age+ECTnum+Site+Med.csv') #does not need to do FDR (unfortunatelly) #+END_SRC #+RESULTS: We did not expect too much here given Oltedal et al. 2018. **** Calculating mixed effect \Delta MADRS ~ \Delta Volume + BaselineVolume + ECTnum + Site #+BEGIN_SRC R :session ECTanal myres2vbv.s<-matrix(NA,length(myroi.names),6) for (i in 1:dim(varnames)[1]) { bn<-substr(varnames[i,2],14,nchar(as.character(varnames[i,2])))#cut the volumechange from the begining vn<-fd[ind.fd,grep(paste0(bn,'.baseline.3'),colnames(fd))] ef<-fd[ind.fd,grep(varnames[i,1],colnames(fd))] dvol<-fd[ind.fd,grep(varnames[i,2],colnames(fd))] #lm.1<-lm(madrs_hdrs_percentage_cahnge~dvol+Age.1+rul_number.1+Site.1,data=fd[ind.fd,]) lm.1<-lme(madrs_hdrs_percentage_cahnge~dvol+vn+rul_number.1,data=fd[ind.fd,],random=~1|Site.1, na.action=na.omit) #lm.1<-lm(madrs_hdrs_percentage_cahnge~ef,data=fd[ind.fd,]) res<-summary(lm.1) myres2vbv.s[i,1]<-res$tTable[2,4] myres2vbv.s[i,2]<-res$tTable[2,5] myres2vbv.s[i,3]<-res$tTable[3,4] myres2vbv.s[i,4]<-res$tTable[3,5] myres2vbv.s[i,5]<-res$tTable[4,4] myres2vbv.s[i,6]<-res$tTable[4,5] } kiir<-data.frame(myroi.names,myres2vbv.s) colnames(kiir)<-c('roi','tvol','pvol','tBasVol','pBasVol','tECTnum','pECTnum') write.csv(kiir, '/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/Mixed_N156_dMADRSperc-dVol+BasVol+ECTnum+Site.csv') #does not need to do FDR (unfortunatelly) #+END_SRC #+RESULTS: We did not expect too much here given Oltedal et al. 2018. **** Calculating \Delta MADRS ~ EF + Age + ECTnumber #+BEGIN_SRC R :session ECTanal myres3v3<-matrix(NA,length(myroi.names),6) for (i in 1:dim(varnames)[1]) { ef<-fd[ind.fd,grep(varnames[i,1],colnames(fd))] dvol<-fd[ind.fd,grep(varnames[i,2],colnames(fd))] lm.1<-lm(madrs_hdrs_percentage_cahnge~ef+Age.1+rul_number.1,data=fd[ind.fd,]) #lm.1<-lm(madrs_hdrs_percentage_cahnge~ef,data=fd[ind.fd,]) res<-summary(lm.1) myres3v3[i,1]<-res$coefficients[2,3] myres3v3[i,2]<-res$coefficients[2,4] myres3v3[i,3]<-res$coefficients[3,3] myres3v3[i,4]<-res$coefficients[3,4] myres3v3[i,5]<-res$coefficients[4,3] myres3v3[i,6]<-res$coefficients[4,4] } kiir<-data.frame(myroi.names,myres3v3) colnames(kiir)<-c('roi','tef','pef','tAge','pAge','tECTnum','pECTnum') write.csv(kiir, '/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/N156_dMADRS-EF+Age+ECTnum.csv') #does not need to do FDR (unfortunatelly) #+END_SRC #+RESULTS: Interestingly no results here either. I did the whole analysis with BaselineTotalBrain volume as control for confound, very similar results. (as expected since age correlates with TotBrainVolume pretty much) **** Calculating \Delta MADRS ~ EF + Age + ECTnumber + Site #+BEGIN_SRC R :session ECTanal myres3v3.s<-matrix(NA,length(myroi.names),6) for (i in 1:dim(varnames)[1]) { ef<-fd[ind.fd,grep(varnames[i,1],colnames(fd))] dvol<-fd[ind.fd,grep(varnames[i,2],colnames(fd))] lm.1<-lm(madrs_hdrs_percentage_cahnge~ef+Age.1+rul_number.1+Site.1,data=fd[ind.fd,]) #lm.1<-lm(madrs_hdrs_percentage_cahnge~ef,data=fd[ind.fd,]) res<-summary(lm.1) myres3v3.s[i,1]<-res$coefficients[2,3] myres3v3.s[i,2]<-res$coefficients[2,4] myres3v3.s[i,3]<-res$coefficients[3,3] myres3v3.s[i,4]<-res$coefficients[3,4] myres3v3.s[i,5]<-res$coefficients[4,3] myres3v3.s[i,6]<-res$coefficients[4,4] } kiir<-data.frame(myroi.names,myres3v3.s) colnames(kiir)<-c('roi','tef','pef','tAge','pAge','tECTnum','pECTnum') write.csv(kiir, '/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/N156_dMADRS-EF+Age+ECTnum+Site.csv') #does not need to do FDR (unfortunatelly) #+END_SRC #+RESULTS: Interestingly no results here either. I did the whole analysis with BaselineTotalBrain volume as control for confound, very similar results. (as expected since age correlates with TotBrainVolume pretty much) **** Calculating \Delta MADRS ~ EF + BaselineVolume + ECTnumber #+BEGIN_SRC R :session ECTanal myres3vbv<-matrix(NA,length(myroi.names),6) for (i in 1:dim(varnames)[1]) { bn<-substr(varnames[i,2],14,nchar(as.character(varnames[i,2])))#cut the volumechange from the begining vn<-fd[ind.fd,grep(paste0(bn,'.baseline.3'),colnames(fd))] ef<-fd[ind.fd,grep(varnames[i,1],colnames(fd))] dvol<-fd[ind.fd,grep(varnames[i,2],colnames(fd))] lm.1<-lm(madrs_hdrs_percentage_cahnge~ef+vn+rul_number.1,data=fd[ind.fd,]) #lm.1<-lm(madrs_hdrs_percentage_cahnge~ef,data=fd[ind.fd,]) res<-summary(lm.1) myres3vbv[i,1]<-res$coefficients[2,3] myres3vbv[i,2]<-res$coefficients[2,4] myres3vbv[i,3]<-res$coefficients[3,3] myres3vbv[i,4]<-res$coefficients[3,4] myres3vbv[i,5]<-res$coefficients[4,3] myres3vbv[i,6]<-res$coefficients[4,4] } kiir<-data.frame(myroi.names,myres3vbv) colnames(kiir)<-c('roi','tef','pef','tbasVol','pbasVol','tECTnum','pECTnum') write.csv(kiir, '/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/N156_dMADRS-EF+BaselineVolume+ECTnum.csv') #does not need to do FDR (unfortunatelly) #+END_SRC #+RESULTS: Interestingly no results here either. I did the whole analysis with BaselineTotalBrain volume as control for confound, very similar results. (as expected since age correlates with TotBrainVolume pretty much) **** Calculating mixed effect \Delta MADRS ~ EF + Age + ECTnumber + Site #+BEGIN_SRC R :session ECTanal myres3v3.s<-matrix(NA,length(myroi.names),6) for (i in 1:dim(varnames)[1]) { ef<-fd[ind.fd,grep(varnames[i,1],colnames(fd))] dvol<-fd[ind.fd,grep(varnames[i,2],colnames(fd))] #lm.1<-lm(madrs_hdrs_percentage_cahnge~ef+Age.1+rul_number.1+Site.1,data=fd[ind.fd,]) lm.1<-lme(madrs_hdrs_percentage_cahnge~ef+Age.1+rul_number.1,data=fd[ind.fd,],random = ~1|Site.1, na.action = na.omit) #lm.1<-lm(madrs_hdrs_percentage_cahnge~ef,data=fd[ind.fd,]) res<-summary(lm.1) myres3v3.s[i,1]<-res$tTable[2,4] myres3v3.s[i,2]<-res$tTable[2,5] myres3v3.s[i,3]<-res$tTable[3,4] myres3v3.s[i,4]<-res$tTable[3,5] myres3v3.s[i,5]<-res$tTable[4,4] myres3v3.s[i,6]<-res$tTable[4,5] } kiir<-data.frame(myroi.names,myres3v3.s) colnames(kiir)<-c('roi','tef','pef','tAge','pAge','tECTnum','pECTnum') write.csv(kiir, '/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/Mixed_N156_dMADRS-EF+Age+ECTnum+Site.csv') #does not need to do FDR (unfortunatelly) #+END_SRC #+RESULTS: :1 Interestingly no results here either. I did the whole analysis with BaselineTotalBrain volume as control for confound, very similar results. (as expected since age correlates with TotBrainVolume pretty much) **** Calculating mixed effect \Delta MADRS ~ EF + Age + ECTnumber + Site + medication #+BEGIN_SRC R :session ECTanal myres3v3.s<-matrix(NA,length(myroi.names),6) for (i in 1:dim(varnames)[1]) { ef<-fd[ind.fd,grep(varnames[i,1],colnames(fd))] dvol<-fd[ind.fd,grep(varnames[i,2],colnames(fd))] #lm.1<-lm(madrs_hdrs_percentage_cahnge~ef+Age.1+rul_number.1+Site.1,data=fd[ind.fd,]) lm.1<-lme(madrs_hdrs_percentage_cahnge~ef+Age.1+rul_number.1,data=fd[ind.fd,],random = ~1|Site.1/medication, na.action = na.omit) #lm.1<-lm(madrs_hdrs_percentage_cahnge~ef,data=fd[ind.fd,]) res<-summary(lm.1) myres3v3.s[i,1]<-res$tTable[2,4] myres3v3.s[i,2]<-res$tTable[2,5] myres3v3.s[i,3]<-res$tTable[3,4] myres3v3.s[i,4]<-res$tTable[3,5] myres3v3.s[i,5]<-res$tTable[4,4] myres3v3.s[i,6]<-res$tTable[4,5] } kiir<-data.frame(myroi.names,myres3v3.s) colnames(kiir)<-c('roi','tef','pef','tAge','pAge','tECTnum','pECTnum') write.csv(kiir, '/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/Mixed_N156_dMADRS-EF+Age+ECTnum+Site+Med.csv') #does not need to do FDR (unfortunatelly) #+END_SRC #+RESULTS: :1 Interestingly no results here either. I did the whole analysis with BaselineTotalBrain volume as control for confound, very similar results. (as expected since age correlates with TotBrainVolume pretty much) **** Calculating mixed effect \Delta MADRS ~ EF + BaselineVolume + ECTnumber + Site #+BEGIN_SRC R :session ECTanal myres3vbv.s<-matrix(NA,length(myroi.names),6) for (i in 1:dim(varnames)[1]) { bn<-substr(varnames[i,2],14,nchar(as.character(varnames[i,2])))#cut the volumechange from the begining vn<-fd[ind.fd,grep(paste0(bn,'.baseline.3'),colnames(fd))] ef<-fd[ind.fd,grep(varnames[i,1],colnames(fd))] dvol<-fd[ind.fd,grep(varnames[i,2],colnames(fd))] #lm.1<-lm(madrs_hdrs_percentage_cahnge~ef+Age.1+rul_number.1+Site.1,data=fd[ind.fd,]) lm.1<-lme(madrs_hdrs_percentage_cahnge~ef+vn+rul_number.1,data=fd[ind.fd,],random = ~1|Site.1, na.action = na.omit) #lm.1<-lm(madrs_hdrs_percentage_cahnge~ef,data=fd[ind.fd,]) res<-summary(lm.1) myres3vbv.s[i,1]<-res$tTable[2,4] myres3vbv.s[i,2]<-res$tTable[2,5] myres3vbv.s[i,3]<-res$tTable[3,4] myres3vbv.s[i,4]<-res$tTable[3,5] myres3vbv.s[i,5]<-res$tTable[4,4] myres3vbv.s[i,6]<-res$tTable[4,5] } kiir<-data.frame(myroi.names,myres3vbv.s) colnames(kiir)<-c('roi','tef','pef','tBasVol','pBasVol','tECTnum','pECTnum') write.csv(kiir, '/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/Mixed_N156_dMADRS-EF+BasVol+ECTnum+Site.csv') #does not need to do FDR (unfortunatelly) #+END_SRC #+RESULTS: :1 No change in the results here. (as expected since age correlates strongly with baseline BrainVolume, see next) **** Calculating mixed effect Baselinevolume ~ Age + Site #+BEGIN_SRC R :session ECTanal myresagevbv.s<-matrix(NA,length(myroi.names),2) for (i in 1:dim(varnames)[1]) { bn<-substr(varnames[i,2],14,nchar(as.character(varnames[i,2])))#cut the volumechange from the begining vn<-fd[ind.fd,grep(paste0(bn,'.baseline.3'),colnames(fd))] ef<-fd[ind.fd,grep(varnames[i,1],colnames(fd))] dvol<-fd[ind.fd,grep(varnames[i,2],colnames(fd))] #lm.1<-lm(madrs_hdrs_percentage_cahnge~ef+Age.1+rul_number.1+Site.1,data=fd[ind.fd,]) lm.1<-lme(vn~Age.1,data=fd[ind.fd,],random = ~1|Site.1, na.action = na.omit) #lm.1<-lm(madrs_hdrs_percentage_cahnge~ef,data=fd[ind.fd,]) res<-summary(lm.1) myresagevbv.s[i,1]<-res$tTable[2,4] myresagevbv.s[i,2]<-res$tTable[2,5] #myresagevbv.s[i,3]<-res$tTable[3,4] #myresagevbv.s[i,4]<-res$tTable[3,5] #myresagevbv.s[i,5]<-res$tTable[4,4] #myresagevbv.s[i,6]<-res$tTable[4,5] } kiir<-data.frame(myroi.names,myresagevbv.s) colnames(kiir)<-c('roi','tage','page') write.csv(kiir, '/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/Mixed_N156_BaselineVolumevsAge.csv') #does not need to do FDR (unfortunatelly) #+END_SRC #+RESULTS: Interestingly no results here either. I did the whole analysis with BaselineTotalBrain volume as control for confound, very similar results. (as expected since age correlates with TotBrainVolume pretty much) **** Calculating \Delta MADRS ~ EF #+BEGIN_SRC R :session ECTanal nc.myres3v3<-matrix(NA,length(myroi.names),2) for (i in 1:dim(varnames)[1]) { ef<-fd[ind.fd,grep(varnames[i,1],colnames(fd))] dvol<-fd[ind.fd,grep(varnames[i,2],colnames(fd))] lm.1<-lm(madrs_hdrs_percentage_cahnge~ef+rul_number.1+Site.1,data=fd[ind.fd,]) #lm.1<-lm(madrs_hdrs_percentage_cahnge~ef,data=fd[ind.fd,]) res<-summary(lm.1) nc.myres3v3[i,1]<-res$coefficients[2,3] nc.myres3v3[i,2]<-res$coefficients[2,4] #nc.myres3v3[i,3]<-res$coefficients[3,3] #nc.myres3v3[i,4]<-res$coefficients[3,4] #nc.myres3v3[i,5]<-res$coefficients[4,3] #nc.myres3v3[i,6]<-res$coefficients[4,4] } kiir<-data.frame(myroi.names,nc.myres3v3) colnames(kiir)<-c('roi','tef','pef') write.csv(kiir, '/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/N156_dMADRS-EF.csv') mytable<-data.frame(myroi.names,nc.myres3v3) fdr<-p.adjust(nc.myres3v3[,2],method = 'fdr')#Benjamini & Hochberg 1995 FDR #by<-p.adjust(myres1v3[,2],method = 'fdr')#Benjamini & Yekutieli 2001 FDR holm<-p.adjust(nc.myres3v3[,2],method = 'holm')#Holm 1979 very strict FWE fdr.res<-data.frame(mytable, fdr, holm) colnames(fdr.res)<-c('roi','t_EF','p_EF','BH^EF_FDR','Holm^EF_FWE') write.csv(fdr.res, '/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/N156_dMADRS-EFwFDR.csv') #+END_SRC #+RESULTS: Interestingly no results here either. I did the whole analysis with BaselineTotalBrain volume as control for confound, very similar results. (as expected since age correlates with TotBrainVolume pretty much) **** Calculating \Delta MADRS ~ EF * \Delta Volume + Age + ECTnumber + Site #+BEGIN_SRC R :session ECTanal myres3v3.si<-matrix(NA,length(myroi.names),6) for (i in 1:dim(varnames)[1]) { ef<-fd[ind.fd,grep(varnames[i,1],colnames(fd))] dvol<-fd[ind.fd,grep(varnames[i,2],colnames(fd))] lm.1<-lm(madrs_hdrs_percentage_cahnge~ef*dvol+Age.1+rul_number.1+Site.1,data=fd[ind.fd,]) #lm.1<-lm(madrs_hdrs_percentage_cahnge~ef,data=fd[ind.fd,]) res<-summary(lm.1) myres3v3.si[i,1]<-res$coefficients[2,3] myres3v3.si[i,2]<-res$coefficients[2,4] myres3v3.si[i,3]<-res$coefficients[3,3] myres3v3.si[i,4]<-res$coefficients[3,4] myres3v3.si[i,5]<-res$coefficients[12,3] myres3v3.si[i,6]<-res$coefficients[12,4] } kiir<-data.frame(myroi.names,myres3v3.si) colnames(kiir)<-c('roi','tef','pef','tdVol','pdVol','tINT','pINT') write.csv(kiir, '/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/N156_dMADRS-EFmuldVOL+Age+ECTnum+Site.csv') #does not need to do FDR (unfortunatelly) #+END_SRC #+RESULTS: Interestingly no results here either. I did the whole analysis with BaselineTotalBrain volume as control for confound, very similar results. (as expected since age correlates with TotBrainVolume pretty much) **** Calculating mixed effect \Delta MADRS ~ EF * \Delta Volume + Age + ECTnumber + Site #+BEGIN_SRC R :session ECTanal myres3v3.si<-matrix(NA,length(myroi.names),6) for (i in 1:dim(varnames)[1]) { ef<-fd[ind.fd,grep(varnames[i,1],colnames(fd))] dvol<-fd[ind.fd,grep(varnames[i,2],colnames(fd))] #lm.1<-lm(madrs_hdrs_percentage_cahnge~ef*dvol+Age.1+rul_number.1+Site.1,data=fd[ind.fd,]) lm.1<-lme(madrs_hdrs_percentage_cahnge~ef*dvol+Age.1+rul_number.1,data=fd[ind.fd,], random=~1|Site.1, na.action=na.omit) #lm.1<-lm(madrs_hdrs_percentage_cahnge~ef,data=fd[ind.fd,]) res<-summary(lm.1) myres3v3.si[i,1]<-res$tTable[2,4] myres3v3.si[i,2]<-res$tTable[2,5] myres3v3.si[i,3]<-res$tTable[3,4] myres3v3.si[i,4]<-res$tTable[3,5] myres3v3.si[i,5]<-res$tTable[6,4] myres3v3.si[i,6]<-res$tTable[6,5] } kiir<-data.frame(myroi.names,myres3v3.si) colnames(kiir)<-c('roi','tef','pef','tdVol','pdVol','tINT','pINT') write.csv(kiir, '/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/Mixed_N156_dMADRS-EFmuldVOL+Age+ECTnum+Site.csv') #does not need to do FDR (unfortunatelly) #+END_SRC #+RESULTS: Interestingly no results here either. I did the whole analysis with BaselineTotalBrain volume as control for confound, very similar results. (as expected since age correlates with TotBrainVolume pretty much) **** Calculating volumetric changes: one sample t-test #+BEGIN_SRC R :session ECTanal #volumetric changes #one sample t-test myres4v3<-matrix(NA,length(myroi.names),4) for (i in 1:dim(varnames)[1]) { ef<-fd[ind.fd,grep(varnames[i,1],colnames(fd))] dvol<-fd[ind.fd,grep(varnames[i,2],colnames(fd))] lm.1<-lm(madrs_hdrs_percentage_cahnge~ef+Age.1+rul_number.1,data=fd[ind.fd,]) #lm.1<-lm(madrs_hdrs_percentage_cahnge~ef,data=fd[ind.fd,]) res<-t.test(dvol) myres4v3[i,1]<-res$statistic myres4v3[i,2]<-res$p.value myres4v3[i,3]<-res$estimate myres4v3[i,4]<-res$estimate/sd(dvol,na.rm=TRUE) } kiir<-data.frame(myroi.names,myres4v3,p.adjust(myres4v3[,2],method = 'fdr')) colnames(kiir)<-c('roi','t','p','mean','d','BH_FDR') write.csv(kiir, '/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/N156_dVOL_one_sample_t.csv') #+END_SRC #+RESULTS: **** Calculating pairwise volumetric changes between R and L and Figure between R and L #+BEGIN_SRC R :session ECTanal myres5v3<-matrix(NA,floor(length(myroi.names)/2),6) ind.to.go.through<-c(1:5,7:10,20:52) library(stringr) m<-0 for (i in ind.to.go.through) { m<-m+1 if (length(grep('_Left',myroi.names[i]))==1) { rside<-str_replace(myroi.names[i],'_Left','_Right') } else if (length(grep('.lh.',myroi.names[i]))==1) { rside<-str_replace(myroi.names[i],'.lh.','.rh.') } j<-which(myroi.names==rside) dvol.r<-fd[ind.fd,grep(varnames[j,2],colnames(fd))] dvol.l<-fd[ind.fd,grep(varnames[i,2],colnames(fd))] res<-t.test(dvol.r,dvol.l,paired = TRUE) res.l<-t.test(dvol.l) res.r<-t.test(dvol.r) myres5v3[m,1]<-res$statistic myres5v3[m,2]<-res$p.value myres5v3[m,3]<-res$estimate myres5v3[m,4]<-res$estimate/sd(dvol.r-dvol.l,na.rm=TRUE) myres5v3[m,5]<-res.l$estimate/sd(dvol.l,na.rm=TRUE) myres5v3[m,6]<-res.r$estimate/sd(dvol.r,na.rm=TRUE) } kiir<-data.frame(myroi.names[ind.to.go.through],myres5v3,p.adjust(myres5v3[,2],method = 'fdr')) colnames(kiir)<-c('roi','t','p','mean','d','d_l','d_r','BH_FDR') write.csv(kiir, '/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/N156_dVOL_paired_sample_t_R_L.csv') long.kiir<-(reshape(kiir, idvar='roi', varying=list(6:7), v.names='dside',timevar='side',direction = 'long')) #ones<-which(long.kiir$side==1) #long.kiir$side<-1 #long.kiir$side[ones]<-2 fig.volchange<-ggplot(long.kiir, aes(x=factor(side),y=dside))+ geom_boxplot(fill=c('orange','blue'))+ geom_point(size=5)+ geom_line(aes(group=roi), color='gray30')+ scale_x_discrete(name='Hemispheres',labels=c('L','R'))+ ylab('Volume change (d)')+ theme(axis.text = element_text(size=22),axis.title = element_text(size = 28, face = "bold")) # + # geom_text(aes(label=roi)) #pdf('/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/Regions_VolChange_Effect_Size.pdf', width=12,height=7) png('/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/Regions_VolChange_Effect_Size.png', width= 960, height = 960) fig.volchange dev.off() #+END_SRC #+RESULTS: : 1 **** Calculating pairwise EF difference between R and L and Figure correlating between laterality indices #+BEGIN_SRC R :session ECTanal myres6v3<-matrix(NA,floor(length(myroi.names)/2),6) ind.to.go.through<-c(1:5,7:10,20:52) library(stringr) m<-0 for (i in ind.to.go.through) { m<-m+1 if (length(grep('_Left',myroi.names[i]))==1) { rside<-str_replace(myroi.names[i],'_Left','_Right') } else if (length(grep('.lh.',myroi.names[i]))==1) { rside<-str_replace(myroi.names[i],'.lh.','.rh.') } j<-which(myroi.names==rside) dvol.r<-fd[ind.fd,grep(varnames[j,1],colnames(fd))] dvol.l<-fd[ind.fd,grep(varnames[i,1],colnames(fd))] res<-t.test(dvol.r,dvol.l,paired = TRUE) res.l<-t.test(dvol.l) res.r<-t.test(dvol.r) myres6v3[m,1]<-res$statistic myres6v3[m,2]<-res$p.value myres6v3[m,3]<-res$estimate myres6v3[m,4]<-res$estimate/sd(dvol.r-dvol.l,na.rm=TRUE) } kiir<-data.frame(myroi.names[ind.to.go.through],myres6v3,p.adjust(myres6v3[,2],method = 'fdr')) colnames(kiir)<-c('roi','t','p','mean','d','BH_FDR') write.csv(kiir, '/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/N156_EF_paired_sample_t_R_L.csv') efvol<-data.frame(myroi.names[ind.to.go.through], myres5v3[,1:4],myres6v3[,1:4]) colnames(efvol)<-c('roi','tvol','pvol','meanvol','dvol','tef','pef','meanef','def') fig.wo.label<-ggplot(efvol,aes(x=def,y=dvol))+ stat_smooth(method='lm')+ geom_point(size=5)+ xlab('EF laterality index (d)')+ ylab(Delta~'Volume laterality index (d)')+ theme(axis.text = element_text(size=22),axis.title = element_text(size=22, face = "bold")) ,#+ # geom_text(aes(label=roi)) #pdf('/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/Regions_EFvVOL.pdf', width=12,height=7) png('/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/Regions_EFvVOL.png', width=1262,height=480) fig.wo.label dev.off() # fig.w.label summary(lm(dvol~def,data=efvol)) result.cor.EFVOL_R_L<-cor.test(efvol$def,efvol$dvol) #+END_SRC #+RESULTS: : /nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation **** Calculating and writing out nii.gz images for showing 42 pairs of ROI representation of data #+BEGIN_SRC R :session ECTanal library(oro.nifti) library(neurobase) atlas<-readnii('/nethome/amiklos/ATLASES/OASIS-TRT-20_jointfusion_DKT31_CMA_labels_in_MNI152_v2.nii.gz') atlas.2d<-matrix(atlas,1,byrow=T) lut<-read.table('/usr/local/opt/freesurfer5.3/FreeSurferColorLUT.txt') colnames(lut)<-c('ind','roi') lat.im.2d<-matrix(0, 2,dim(atlas.2d)[2]) for (i in 1:dim(efvol)[1])#Left-Cerebellum-Exterior (instead of cortex) { name<-str_replace(str_replace_all(efvol$roi[i], '\\.','-'),'EF_','') if (name=='Left-Cerebellum-Cortex' | name=='Right-Cerebellum-Cortex') { name<-str_replace(name,'Cortex','Exterior') } ind<-which(lut$roi==name) num<-lut$ind[ind] indover<-which(atlas.2d[1,]==num) lat.im.2d[1,indover]<-efvol$def[i] lat.im.2d[2,indover]<-efvol$dvol[i] } lat.dEF=atlas lat.dEF[]<-array(lat.im.2d[1,],dim(atlas)) writenii(nim = lat.dEF, '/nethome/amiklos/work/ECT/Bergen/N156_LATER_INDEX_dEF_regions.nii') lat.dVOL=atlas lat.dVOL[]<-array(lat.im.2d[2,],dim(atlas)) writenii(nim = lat.dVOL, '/nethome/amiklos/work/ECT/Bergen/N156_LATER_INDEX_dVOL_regions.nii') #+END_SRC **** Calculating simple correlation between meanEF and d \Delta Volume across regions #+BEGIN_SRC R :session ECTanal myres8v3<-matrix(NA,length(myroi.names),4) #ind.to.go.through<-c(1:5,7:10,20:52) library(stringr) m<-0 for (i in 1:length(myroi.names)) { ef<-fd[ind.fd,grep(varnames[i,1],colnames(fd))] dvol<-fd[ind.fd,grep(varnames[i,2],colnames(fd))] r.ef<-t.test(ef) r.dvol<-t.test(dvol) myres8v3[i,1]<-r.ef$estimate myres8v3[i,2]<-r.dvol$estimate myres8v3[i,3]<-sd(ef,na.rm=T) myres8v3[i,4]<-sd(dvol,na.rm=T) } kiir<-data.frame(myroi.names,myres8v3) colnames(kiir)<-c('roi','mean_ef','mean_dvol','sd_ef','sd_dvol') kiir$side<-1 kiir$side[ind.to.go.through]<-2 plotEF_vs_change<-ggplot(kiir,aes(x=mean_ef,y=mean_dvol/sd_dvol))+ #ggplot(kiir,aes(x=mean_ef,y=mean_dvol))+ stat_smooth(method='lm')+ geom_point(aes(colour=factor(side)),size=5)+ scale_color_manual(labels=c('R','L'),values=c('blue','orange'))+ labs(colour='SIDE')+ xlab('Mean average EF')+ ylab('Volume change (d)')+ theme(axis.text = element_text(size=22), axis.title = element_text(size = 28, face = "bold")) #facet_grid(.~side) ,#+ # geom_text(aes(label=roi)) #pdf('/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/Regions_ALL_meanEFvsdvol.pdf', width=12,height=7) png('/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/Regions_ALL_meanEFvsdvol.png', width=960,height=960) plotEF_vs_change dev.off() cor.test(kiir$mean_dvol,kiir$mean_ef) result.cor.meanEFdvol<-cor.test(kiir$mean_dvol/kiir$sd_dvol,kiir$mean_ef) #+END_SRC #+RESULTS: **** Calculating and writing out nii images across 85 ROIs #+BEGIN_SRC R :session ECTanal library(oro.nifti) library(neurobase) atlas<-readnii('/nethome/amiklos/ATLASES/OASIS-TRT-20_jointfusion_DKT31_CMA_labels_in_MNI152_v2.nii.gz') atlas.2d<-matrix(atlas,1,byrow=T) lut<-read.table('/usr/local/opt/freesurfer5.3/FreeSurferColorLUT.txt') colnames(lut)<-c('ind','roi') res.im.2d<-matrix(0, 3,dim(atlas.2d)[2]) m<-0 for (i in myroi.names)#Left-Cerebellum-Exterior (instead of cortex) { m<-m+1 name<-str_replace(str_replace_all(i, '\\.','-'),'EF_','') if (name=='Left-Cerebellum-Cortex' | name=='Right-Cerebellum-Cortex') { name<-str_replace(name,'Cortex','Exterior') } ind<-which(lut$roi==name) num<-lut$ind[ind] indover<-which(atlas.2d[1,]==num) res.im.2d[1,indover]<-kiir$mean_ef[m] res.im.2d[2,indover]<-kiir$mean_dvol[m]/kiir$sd_dvol[m] res.im.2d[3,indover]<-kiir$mean_dvol[m] } meanEF=atlas meanEF[]<-array(res.im.2d[1,],dim(atlas)) writenii(nim = meanEF, '/nethome/amiklos/work/ECT/Bergen/N156_meanEF_regions.nii') dVOL=atlas dVOL[]<-array(res.im.2d[2,],dim(atlas)) writenii(nim = dVOL, '/nethome/amiklos/work/ECT/Bergen/N156_effectsize_volumechange_regions.nii') meanVOL=atlas meanVOL[]<-array(res.im.2d[3,],dim(atlas)) writenii(nim = meanEF, '/nethome/amiklos/work/ECT/Bergen/N156_meanVOLch_regions.nii') #+END_SRC *** Create Figures **** Figures with ROIs ***** Volume and EF comparision figure, plus adding correlations and boxplot BIG #+BEGIN_SRC sh cd /nethome/amiklos/work/ECT/Bergen overlay 1 0 /usr/local/fsl/data/standard/MNI152_T1_1mm_brain.nii.gz -A N156_effectsize_volumechange_regions.nii.gz 0.01 1.7678 test.nii.gz #slicer N156_effectsize_volumechange_regions.nii.gz -l /usr/share/fsl/5.0/etc/luts/rendersea.lut -i -1.7678 1.7678 -x 0.3 sla.png -x 0.35 slb.png -x 0.5 kozep.png -x 0.60 slc.png -x 0.65 sld.png -y 0.35 sle.png -y 0.45 slf.png -y 0.55 slg.png -y 0.65 slh.png -z 0.32 sli.png -z 0.4 slj.png -z 0.55 slk.png -z 0.65 sll.png slicer test.nii.gz -l /usr/share/fsl/5.0/etc/luts/renderhot.lut -x 0.3 sla.png -x 0.35 slb.png -x 0.5 kozep.png -x 0.60 slc.png -x 0.65 sld.png -y 0.35 sle.png -y 0.45 slf.png -y 0.55 slg.png -y 0.65 slh.png -z 0.32 sli.png -z 0.4 slj.png -z 0.55 slk.png -z 0.65 sll.png pngappend sla.png + slb.png + kozep.png + slc.png + sld.png + sle.png + slf.png + slg.png + slh.png + sli.png + slj.png + slk.png + sll.png + hot_scale.png N156_effectsize_volume2standard.png overlay 1 0 /usr/local/fsl/data/standard/MNI152_T1_1mm_brain.nii.gz -A N156_meanEF_regions.nii.gz 1 189.62 EFoverlay.nii.gz #slicer N156_meanEF_regions.nii.gz -l /usr/share/fsl/5.0/etc/luts/rendersea.lut -i -189.62 189.62 -x 0.3 sla.png -x 0.35 slb.png -x 0.5 kozep.png -x 0.60 slc.png -x 0.65 sld.png -y 0.35 sle.png -y 0.45 slf.png -y 0.55 slg.png -y 0.65 slh.png -z 0.32 sli.png -z 0.4 slj.png -z 0.55 slk.png -z 0.65 sll.png slicer EFoverlay.nii.gz -l /usr/share/fsl/5.0/etc/luts/renderhot.lut -x 0.3 sla.png -x 0.35 slb.png -x 0.5 kozep.png -x 0.60 slc.png -x 0.65 sld.png -y 0.35 sle.png -y 0.45 slf.png -y 0.55 slg.png -y 0.65 slh.png -z 0.32 sli.png -z 0.4 slj.png -z 0.55 slk.png -z 0.65 sll.png pngappend sla.png + slb.png + kozep.png + slc.png + sld.png + sle.png + slf.png + slg.png + slh.png + sli.png + slj.png + slk.png + sll.png + hot_scale.png N156_meanEF_volume2standard.png pngappend N156_meanEF_volume2standard.png - N156_effectsize_volume2standard.png N156_meanEF_vs_dVolume.png convert N156_meanEF_vs_dVolume.png -fill white -opaque black WHITE-N156_meanEF_vs_dVolume.png convert -font helvetica -fill black -pointsize 16 -gravity center -draw "text -1200,10 'x = 35 ' text -990,10 'x = 26 ' text -770,10 'x = -1 ' text -550,10 'x = -19' text -330,10 'x = -28' text -125,10 'y = -50' text 60,10 'y = -28' text 245,10 'y = -6' text 420,10 'y = 16' text 605,10 'z = -14' text 785,10 'z = 1' text 970,10 'z = 28' text 1150,10 'z = 46' text 1246,-30 '0' text 1246,-170 '190' text 1246,185 '0.0' text 1246,40 '1.8'" WHITE-N156_meanEF_vs_dVolume.png TXT-WHITE-N156_meanEF_vs_dVolume.png # montage -geometry 1103x1203+100+0 /nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/Regions_VolChange_Effect_Size.pdf /nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/Regions_ALL_meanEFvsdvol.pdf /nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/Regions_Vol.png montage -geometry 1103x1203+100+0 /nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/Regions_VolChange_Effect_Size.png /nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/Regions_ALL_meanEFvsdvol.png /nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/Regions_Vol.png # pngappend /nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/Regions_VolChange_Effect_Size.png + /nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/Regions_ALL_meanEFvsdvol.png /nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/Regions_Vol.png pngappend TXT-WHITE-N156_meanEF_vs_dVolume.png - /nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/Regions_Vol.png Figure_ROI_based_volume_change.png #+END_SRC #+RESULTS: ***** Volume and EF comparision figure, plus adding correlations and boxplot SMALL #+BEGIN_SRC sh cd /nethome/amiklos/work/ECT/Bergen overlay 1 0 /usr/local/fsl/data/standard/MNI152_T1_1mm_brain.nii.gz -A N156_effectsize_volumechange_regions.nii.gz 0.01 1.7678 test.nii.gz #slicer N156_effectsize_volumechange_regions.nii.gz -l /usr/share/fsl/5.0/etc/luts/rendersea.lut -i -1.7678 1.7678 -x 0.3 sla.png -x 0.35 slb.png -x 0.5 kozep.png -x 0.60 slc.png -x 0.65 sld.png -y 0.35 sle.png -y 0.45 slf.png -y 0.55 slg.png -y 0.65 slh.png -z 0.32 sli.png -z 0.4 slj.png -z 0.55 slk.png -z 0.65 sll.png slicer test.nii.gz -l /usr/share/fsl/5.0/etc/luts/renderhot.lut -x 0.3 sla.png -x 0.35 slb.png -x 0.5 kozep.png -x 0.60 slc.png -x 0.65 sld.png -y 0.35 sle.png -y 0.45 slf.png -y 0.55 slg.png -y 0.65 slh.png -z 0.32 sli.png -z 0.4 slj.png -z 0.55 slk.png -z 0.65 sll.png pngappend slb.png + kozep.png + slc.png + slf.png + slg.png + slh.png + sli.png + slj.png + slk.png + hot_scale.png N156_effectsize_volume2standard.png overlay 1 0 /usr/local/fsl/data/standard/MNI152_T1_1mm_brain.nii.gz -A N156_meanEF_regions.nii.gz 1 189.62 EFoverlay.nii.gz #slicer N156_meanEF_regions.nii.gz -l /usr/share/fsl/5.0/etc/luts/rendersea.lut -i -189.62 189.62 -x 0.3 sla.png -x 0.35 slb.png -x 0.5 kozep.png -x 0.60 slc.png -x 0.65 sld.png -y 0.35 sle.png -y 0.45 slf.png -y 0.55 slg.png -y 0.65 slh.png -z 0.32 sli.png -z 0.4 slj.png -z 0.55 slk.png -z 0.65 sll.png slicer EFoverlay.nii.gz -l /usr/share/fsl/5.0/etc/luts/renderhot.lut -x 0.3 sla.png -x 0.35 slb.png -x 0.5 kozep.png -x 0.60 slc.png -x 0.65 sld.png -y 0.35 sle.png -y 0.45 slf.png -y 0.55 slg.png -y 0.65 slh.png -z 0.32 sli.png -z 0.4 slj.png -z 0.55 slk.png -z 0.65 sll.png pngappend slb.png + kozep.png + slc.png + slf.png + slg.png + slh.png + sli.png + slj.png + slk.png + hot_scale.png N156_meanEF_volume2standard.png pngappend N156_meanEF_volume2standard.png - N156_effectsize_volume2standard.png N156_meanEF_vs_dVolume.png convert N156_meanEF_vs_dVolume.png -fill white -opaque black WHITE-N156_meanEF_vs_dVolume.png convert -font helvetica -fill black -pointsize 16 -gravity center -draw "text -790,10 'x = 26 ' text -565,10 'x = -1 ' text -360,10 'x = -19' text -155,10 'y = -28' text 30,10 'y = -6' text 215,10 'y = 16' text 385,10 'z = -14' text 572,10 'z = 1' text 755,10 'z = 28' text 850,-30 '0' text 850,-170 '190' text 850,185 '0.0' text 850,40 '1.8' text 870,-200 '(V/m)' text 870,10 'd' text -840,-190 'Electrical Field' text -840,35 'Volume change'" WHITE-N156_meanEF_vs_dVolume.png small-TXT-WHITE-N156_meanEF_vs_dVolume.png # montage -geometry 1103x1203+100+0 /nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/Regions_VolChange_Effect_Size.pdf /nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/Regions_ALL_meanEFvsdvol.pdf /nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/Regions_Vol.png montage -geometry 703x903+100+0 /nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/Regions_VolChange_Effect_Size.png /nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/Regions_ALL_meanEFvsdvol.png /nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/Regions_Vol.png # pngappend /nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/Regions_VolChange_Effect_Size.png + /nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/Regions_ALL_meanEFvsdvol.png /nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/Regions_Vol.png pngappend small-TXT-WHITE-N156_meanEF_vs_dVolume.png - /nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/Regions_Vol.png Figure_small_ROI_based_volume_change.png #+END_SRC #+RESULTS: ***** Laterality Index Figures #+BEGIN_SRC sh cd /nethome/amiklos/work/ECT/Bergen #overlay 1 0 /usr/local/fsl/data/standard/MNI152_T1_1mm_brain.nii.gz -A N156_LATER_INDEX_dEF_regions.nii.gz 0.01 5.5621 dEF_LAT_INDEX_overlay.nii.gz fslroi N156_LATER_INDEX_dEF_regions.nii.gz half_lat_EF.nii.gz 91 91 0 218 0 182 0 1 overlay 1 0 half_brain.nii.gz -A half_lat_EF.nii.gz 1 5.5621 dEF_LAT_INDEX_overlay.nii.gz #slicer N156_LATER_INDEX_dEF_regions.nii.gz -l /usr/share/fsl/5.0/etc/luts/rendersea.lut -i -5.5621 5.5621 -x 0.3 sla.png -x 0.35 slb.png -x 0.5 kozep.png -x 0.60 slc.png -x 0.65 sld.png -y 0.35 sle.png -y 0.45 slf.png -y 0.55 slg.png -y 0.65 slh.png -z 0.32 sli.png -z 0.4 slj.png -z 0.55 slk.png -z 0.65 sll.png slicer dEF_LAT_INDEX_overlay.nii.gz -l /usr/share/fsl/5.0/etc/luts/renderhot.lut -x 0.3 sla.png -x 0.35 slb.png -x 0.05 kozep.png -x 0.5 slc.png -x 0.65 sld.png -y 0.35 sle.png -y 0.45 slf.png -y 0.55 slg.png -y 0.65 slh.png -z 0.32 sli.png -z 0.4 slj.png -z 0.55 slk.png -z 0.65 sll.png convert kozep.png -crop 198x218+7+0 crop_kozep.png convert slc.png -crop 148x218+35+0 crop_slc.png convert sld.png -crop 128x218+45+0 crop_sld.png pngappend crop_kozep.png + crop_slc.png + crop_sld.png + sle.png + slf.png + slg.png + slh.png + sli.png + slj.png + slk.png + sll.png + hot_scale.png N156_LATERINDEX_dEF_volume2standard.png #overlay 1 0 /usr/local/fsl/data/standard/MNI152_T1_1mm_brain.nii.gz -A N156_LATER_INDEX_dVOL_regions.nii.gz 0.001 0.8 dVOL_LAT_INDEX_overlay.nii.gz fslroi N156_LATER_INDEX_dVOL_regions.nii.gz half_lat_dVOL.nii.gz 91 91 0 218 0 182 0 1 fslmaths half_lat_dVOL.nii.gz -abs abs_half_lat_dVOL #in this way very low negative values are mapped into the low values it is easier to visualize overlay 1 0 half_brain.nii.gz -A abs_half_lat_dVOL.nii.gz 0.001 0.8 dVOL_LAT_INDEX_overlay.nii.gz #slicer N156_LATER_INDEX_dVOL_regions.nii.gz -l /usr/share/fsl/5.0/etc/luts/rendersea.lut -i -0.8 0.8 -x 0.3 sla.png -x 0.35 slb.png -x 0.5 kozep.png -x 0.60 slc.png -x 0.65 sld.png -y 0.35 sle.png -y 0.45 slf.png -y 0.55 slg.png -y 0.65 slh.png -z 0.32 sli.png -z 0.4 slj.png -z 0.55 slk.png -z 0.65 sll.png slicer dVOL_LAT_INDEX_overlay.nii.gz -l /usr/share/fsl/5.0/etc/luts/renderhot.lut -x 0.3 sla.png -x 0.35 slb.png -x 0.05 kozep.png -x 0.5 slc.png -x 0.65 sld.png -y 0.35 sle.png -y 0.45 slf.png -y 0.55 slg.png -y 0.65 slh.png -z 0.32 sli.png -z 0.4 slj.png -z 0.55 slk.png -z 0.65 sll.png convert kozep.png -crop 198x218+7+0 crop_kozep.png convert slc.png -crop 148x218+35+0 crop_slc.png convert sld.png -crop 128x218+45+0 crop_sld.png pngappend crop_kozep.png + crop_slc.png + crop_sld.png + sle.png + slf.png + slg.png + slh.png + sli.png + slj.png + slk.png + sll.png + hot_scale.png N156_LATERINDEX_dVOL_volume2standard.png pngappend N156_LATERINDEX_dEF_volume2standard.png - N156_LATERINDEX_dVOL_volume2standard.png N156_LATERINDEX_dEF_versus_dVOL.png convert N156_LATERINDEX_dEF_versus_dVOL.png -fill white -opaque black WHITE-N156_LATERINDEX_dEF_versus_dVOL.png convert -font helvetica -fill black -pointsize 16 -gravity center -draw "text -540,10 'x = -6 ' text -360,10 'x = -47' text -230,10 'x = -60' text -125,10 'y = -50' text -30,10 'y = -28' text 60,10 'y = -6' text 145,10 'y = 16' text 230,10 'z = -14' text 325,10 'z = 1' text 420,10 'z = 28' text 510,10 'z = 46' text 575,-30 '1.0' text 575,-170 '5.6' text 575,185 '0.0' text 575,40 '0.8' text 602,-190 'd' text 602,20 'd'" WHITE-N156_LATERINDEX_dEF_versus_dVOL.png TXT-WHITE-N156_LATERINDEX_dEF_versus_dVOL.png pngappend TXT-WHITE-N156_LATERINDEX_dEF_versus_dVOL.png - /nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/Regions_EFvVOL.png Figure_LatInd_42ROI.png #+END_SRC #+RESULTS: **** Figures for individual variability ***** Calculating the individual relationships in Hippocampus #+BEGIN_SRC R :session ECTanal # missing hippocampus data in 4 patients imputed here with mean, missing from # table provided by Leif pat<-1:151 ind.m<-which(is.na(fd$volumechange_Left.Hippocampus[pat])) fd$volumechange_im_Left.Hippocampus<-fd$volumechange_Left.Hippocampus fd$volumechange_im_Left.Hippocampus[pat][ind.m]<-mean(fd$volumechange_Left.Hippocampus[pat],na.rm = T) fd$volumechange_im_Right.Hippocampus<-fd$volumechange_Right.Hippocampus fd$volumechange_im_Right.Hippocampus[pat][ind.m]<-mean(fd$volumechange_Right.Hippocampus[pat],na.rm = T) plotdata<-data.frame(fd$EF_Left.Hippocampus,fd$EF_Right.Hippocampus,fd$volumechange_im_Left.Hippocampus, fd$volumechange_im_Right.Hippocampus,fd$SubjID) plotdata.long<-reshape(plotdata,direction = "long", idvar = "fd.SubjID", varying=list(c(1,2),c(3,4))) plotA<-ggplot(plotdata.long,aes(x=fd.EF_Left.Hippocampus,y=fd.volumechange_im_Left.Hippocampus*100, colour=factor(time)))+ stat_smooth(method='lm')+ geom_point()+ labs(colour='Side')+ xlab('Electrical Field (V/m)')+ ylab('Volume change (%)')+ scale_color_manual(labels=c('L','R'),values = c('orange','blue')) plotA plotB<-ggplot(plotdata.long,aes(x=factor(time),y=fd.volumechange_im_Left.Hippocampus*100))+ geom_boxplot(fill=c('orange','blue'))+ geom_point()+ geom_line(aes(group = fd.SubjID), colour='gray')+ scale_x_discrete(name='Hemispheres',labels=c('L','R'))+ ylab('Volume change (%)') plotB require(gridExtra) #pdf('/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/v2-EF_v_Hippocampus.pdf', width=12,height=7) png('/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/v2-EF_v_Hippocampus.png', width=820,height=480) grid.arrange(plotA,plotB,ncol=2, widths=c(3,1)) dev.off() result.cor.hippocampus<-list() result.cor.hippocampus[[1]]<-cor.test(plotdata.long$fd.EF_Left.Hippocampus,plotdata.long$fd.volumechange_im_Left.Hippocampus) result.cor.hippocampus[[2]]<-cor.test(fd$EF_Left.Hippocampus, fd$volumechange_im_Left.Hippocampus) result.cor.hippocampus[[3]]<-cor.test(fd$EF_Right.Hippocampus, fd$volumechange_im_Right.Hippocampus) result.cor.hippocampus[[4]]<-t.test(fd$volumechange_im_Right.Hippocampus, fd$volumechange_im_Left.Hippocampus, paired = T) #+END_SRC #+RESULTS: ***** Calculating the individual relationships in Amygdala #+BEGIN_SRC R :session ECTanal plotdata<-data.frame(fd$EF_Left.Amygdala,fd$EF_Right.Amygdala,fd$volumechange_Left.Amygdala, fd$volumechange_Right.Amygdala,fd$SubjID) plotdata.long<-reshape(plotdata,direction = "long", idvar = "fd.SubjID", varying=list(c(1,2),c(3,4))) plotA<-ggplot(plotdata.long,aes(x=fd.EF_Left.Amygdala,y=fd.volumechange_Left.Amygdala*100, colour=factor(time)))+ stat_smooth(method='lm')+ geom_point()+ labs(colour='Side')+ xlab('Electrical Field (V/m)')+ ylab('Volume change (%)')+ scale_color_manual(labels=c('L','R'),values = c('orange','blue')) plotA plotB<-ggplot(plotdata.long,aes(x=factor(time),y=fd.volumechange_Left.Amygdala*100))+ geom_boxplot(fill=c('orange','blue'))+ geom_point()+ geom_line(aes(group = fd.SubjID), colour='gray')+ scale_x_discrete(name='Hemispheres',labels=c('L','R'))+ ylab('Volume change (%)') plotB require(gridExtra) #pdf('/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/v2-EF_v_Amygdala.pdf', width=12,height=7) png('/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/v2-EF_v_Amygdala.png', width=820,height=480) grid.arrange(plotA,plotB,ncol=2, widths=c(3,1)) dev.off() result.cor.amygdala<-list() result.cor.amygdala[[1]]<-cor.test(plotdata.long$fd.EF_Left.Amygdala,plotdata.long$fd.volumechange_Left.Amygdala) result.cor.amygdala[[2]]<-cor.test(fd$EF_Left.Amygdala, fd$volumechange_Left.Amygdala) result.cor.amygdala[[3]]<-cor.test(fd$EF_Right.Amygdala, fd$volumechange_Right.Amygdala) result.cor.amygdala[[4]]<-t.test(fd$volumechange_Right.Amygdala, fd$volumechange_Left.Amygdala, paired = T) #+END_SRC #+RESULTS: ***** Calculating the individual specificity of the EF across different EF patterns #+BEGIN_SRC R :session ECTanal myres.p<-matrix(NA,length(myroi.names),length(myroi.names)) for (j in 1:dim(varnames)[1]) { #perm.varnames<-permute(varnames[,1]) for (i in 1:dim(varnames)[1]) { ef<-fd[ind.fd,grep(varnames[j,1],colnames(fd))] dvol<-fd[ind.fd,grep(varnames[i,2],colnames(fd))] lm.1<-lm(dvol~ef+Age.1+rul_number.1+Site.1,data=fd[ind.fd,]) #lm.1<-lm(dvol~ef,data=fd[ind.fd,]) res<-summary(lm.1) myres.p[i,j]<-res$coefficients[2,3] #myres.p[i,2]<-res$coefficients[2,4] } print(j) } perm.res<-data.frame(myroi.names,t(myres.p)) #EF fix and dVOL is changing #perm.res<-data.frame(myroi.names,myres.p) #dVOL is fixed and EF is changing #colnames(fdr.res)<-c('myroi.names','t','p','q') RES<-merge(fdr.res,perm.res,by.x='roi',by.y='myroi.names') long.RES<-reshape(RES,direction = 'long',idvar = 'roi', varying = list(10:dim(RES)[2]),v.names = 'perm.t',timevar = 'permnum') library(ggplot2) ind<-which(long.RES$'BH^EF_FDR'<0.01) #blues<-data.frame(long.RES[ind,]$roi[which(long.RES$permnum[ind]%in%mtl)],long.RES[ind,]$perm.t[which(long.RES$permnum[ind]%in%mtl)]) #colnames(blues)<-c('roi','value') #long.RES2<-merge(long.RES,blues,by='roi') fig.spec<-ggplot(data=long.RES[ind,],aes(x=roi,y=perm.t))+ geom_boxplot(outlier.shape = NA)+ geom_jitter(width = 0.1)+ geom_point(aes(y=t_EF),col = 'red', size = 5)+ theme(axis.text.x=element_text(angle=45,hjust=1))+ scale_x_discrete(labels=c('','',''))+ xlab('')+ ylab(expression(EF~'~'~Delta*Vol[permutating]~(t[EF]))) perm.res<-data.frame(myroi.names,myres.p) #dVOL is fixed and EF is changing RES<-merge(fdr.res,perm.res,by.x='roi',by.y='myroi.names') long.RES2<-reshape(RES,direction = 'long',idvar = 'roi', varying = list(10:dim(RES)[2]),v.names = 'perm.t',timevar = 'permnum') ind<-which(long.RES2$'BH^EF_FDR'<0.01) fig.spec.2<-ggplot(data=long.RES2[ind,],aes(x=roi,y=perm.t))+ geom_boxplot(outlier.shape = NA)+ geom_jitter(width = 0.1)+ geom_point(aes(y=t_EF),col = 'red', size = 5)+ theme(axis.text.x=element_text(angle=45,hjust=1))+ scale_x_discrete(labels=c(expression(Amygdala[LEFT]),expression(Hippocampus[LEFT]),expression(Amygdala[RIGHT])))+ xlab('')+ ylab(expression(EF[permutating]~'~'~Delta*Vol~(t[EF]))) fig.spec.2 long.RES$permtype<-1 long.RES2$permtype<-2 long.RESmerge<-rbind(long.RES,long.RES2) dim(long.RESmerge) ind<-which(long.RESmerge$roi=='EF_Left.Hippocampus') fig.Hipo<-ggplot(data=long.RESmerge[ind,],aes(x=factor(permtype),y=perm.t))+ geom_boxplot(outlier.shape = NA)+ geom_jitter(width = 0.1)+ geom_point(aes(y=t_EF),col = 'red', size = 5)+ theme(axis.text.x=element_text(angle=45,hjust=1))+ scale_x_discrete(labels=c(expression(Delta*Vol[permutating]~'~'~EF),expression(Delta*Vol~'~'~EF[permutating])))+ xlab('')+ ylab(expression(Effect~sizes~(t[EF]))) # ggtitle('Permutations to test specificity of results in Hippocampus') pdf('/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/Manuscript/V6_TO_GEMRIC_RESP_TO_ELIFE/Figures/Figure-3-figure-supplement.pdf', width=6,height=7) fig.Hipo dev.off() ind<-which(long.RESmerge$roi=='EF_Left.Amygdala') fig.Amy<-ggplot(data=long.RESmerge[ind,],aes(x=factor(permtype),y=perm.t))+ geom_boxplot(outlier.shape = NA)+ geom_jitter(width = 0.1)+ geom_point(aes(y=t_EF),col = 'red', size = 5)+ theme(axis.text.x=element_text(angle=45,hjust=1))+ scale_x_discrete(labels=c(expression(Delta*Vol[permutating]~'~'~EF),expression(Delta*Vol~'~'~EF[permutating])))+ xlab('')+ ylab(expression(Effect~sizes~(t[EF]))) # ggtitle('Permutations to test specificity of results in Amygdala') pdf('/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/Manuscript/V6_TO_GEMRIC_RESP_TO_ELIFE/Figures/Figure-4-figure-supplement.pdf', width=6,height=7) fig.Amy dev.off() #+END_SRC * Demographic Data and Statistics :noexport: ** Sample Size #+BEGIN_SRC R :session ECTanal :exports none :results values drawer mean.age<-mean(fd$Age.1[ind.fd]) sd.age<-sd(fd$Age.1[ind.fd]) N <-length(which(!is.na(fd$volumechange_Right.Amygdala))) fem<-length(which(fd$Sex.1[ind.fd]=='F')) Nres = paste0('#+MACRO: N ',N) meanres = paste0('#+MACRO: ma ',round(mean.age,1)) sdres = paste0('#+MACRO: sa ',round(sd.age,1)) femres = paste0('#+MACRO: fem ',fem) paste0(Nres,'\n', meanres, '\n', sdres, '\n', femres) #mean.age #+END_SRC #+RESULTS: :RESULTS: #+MACRO: N 151 #+MACRO: ma 57.5 #+MACRO: sa 17.1 #+MACRO: fem 92 :END: We analyzed N = {{{N}}}({{{fem}}}F); Age: {{{ma}}} +/- {{{sa}}}. ** Clinical Outcome *** Basic relationships #+BEGIN_SRC R :session ECTanal :exports none :results values drawer madrschange<-mean(fd$madrs_hdrs_percentage_cahnge[ind.fd]) sdmadrschange<-sd(fd$madrs_hdrs_percentage_cahnge[ind.fd]) madrsbaseline<-mean(fd$madrs_hdrs_conversion.1[ind.fd]) rangemadrsbaseline<-range(fd$madrs_hdrs_conversion.1[ind.fd]) madrs3<-mean(fd$madrs_hdrs_conversion.3[ind.fd]) rangemadrs3<-range(fd$madrs_hdrs_conversion.3[ind.fd]) line1 = paste0('#+MACRO: MADRSbas ',round(madrsbaseline,1)) line2 = paste0('#+MACRO: rb1 ',rangemadrsbaseline[1]) line3 = paste0('#+MACRO: rb2 ',rangemadrsbaseline[2]) line4 = paste0('#+MACRO: MADRS3 ',round(madrs3,1)) line5 = paste0('#+MACRO: r31 ',rangemadrs3[1]) line6 = paste0('#+MACRO: r32 ',rangemadrs3[2]) line7 = paste0('#+MACRO: mch ',round(madrschange*100,1)) line8 = paste0('#+MACRO: sdmch ',round(sdmadrschange*100,1)) paste0(line1,'\n', line2,'\n', line3,'\n', line4,'\n', line5,'\n', line6,'\n', line7,'\n', line8) #mean.age #+END_SRC #+RESULTS: :RESULTS: #+MACRO: MADRSbas 33.9 #+MACRO: rb1 14 #+MACRO: rb2 54 #+MACRO: MADRS3 12.9 #+MACRO: r31 0 #+MACRO: r32 51 #+MACRO: mch 60.9 #+MACRO: sdmch 33.9 :END: The mean of baseline MADRS was {{{MADRSbas}}} (range: {{{rb1}}}-{{{rb2}}}). At the end of the course of ECT MADRS was {{{MADRS3}}} (range: {{{r31}}}-{{{r32}}}). The average improvement was {{{mch}}} +/- {{{sdmch}}}%. *** Confounds **** Age and clinical response #+BEGIN_SRC R :session ECTanal :exports none :results values drawer res<-cor.test(fd$madrs_hdrs_percentage_cahnge[1:151],fd$Age.1[1:151]) line1 = paste0('#+MACRO: c1 ',round(res$statistic,2)) line2 = paste0('#+MACRO: c2 ',res$parameter) line3 = paste0('#+MACRO: c3 ',round(res$estimate,2)) line4 = paste0('#+MACRO: c4 ',round(res$p.value,3)) paste0(line1, '\n', line2, '\n', line3 , '\n', line4) #+END_SRC #+RESULTS: :RESULTS: #+MACRO: c1 5.75 #+MACRO: c2 149 #+MACRO: c3 0.43 #+MACRO: c4 0 :END: Age was correlating with clincal response (t = {{{c1}}}, df = {{{c2}}}, r = {{{c3}}}, p = {{{c4}}}. **** Age and Total Brain Volume #+BEGIN_SRC R :session ECTanal :exports none :results values drawer res<-cor.test(fd$WholeBrain.baseline.3,fd$Age.1) line1 = paste0('#+MACRO: tot1 ',round(res$statistic,2)) line2 = paste0('#+MACRO: tot2 ',res$parameter) line3 = paste0('#+MACRO: tot3 ',round(res$estimate,2)) line4 = paste0('#+MACRO: tot4 ',round(res$p.value,3)) paste0(line1, '\n', line2, '\n', line3 , '\n', line4) #+END_SRC #+RESULTS: :RESULTS: #+MACRO: tot1 -7.32 #+MACRO: tot2 149 #+MACRO: tot3 -0.51 #+MACRO: tot4 0 :END: Age was correlating with total brain volume (t = {{{tot1}}}, df = {{{tot2}}}, r = {{{tot3}}}, p = {{{tot4}}}. ** Correlation statistics *** Correlation between EF and Volume across regions #+BEGIN_SRC R :session ECTanal :exports none :results values drawer res<-result.cor.meanEFdvol line1 = paste0('#+MACRO: r ',round(res$estimate,2) ) line2 = paste0('#+MACRO: p ',round(res$p.value,4) ) line3 = paste0('#+MACRO: df ',res$parameter ) line4 = paste0('#+MACRO: t ',round(res$statistic,2) ) paste0(line1,'\n', line2,'\n', line3,'\n', line4) #+END_SRC #+RESULTS: :RESULTS: #+MACRO: r 0.38 #+MACRO: p 3e-04 #+MACRO: df 83 #+MACRO: t 3.77 :END: The correlation between mean EF and effect size of volume change: r = {{{r}}}; p = {{{p}}}; df = {{{df}}}; t = {{{t}}}. *** Correlation between EF and Volume across laterality indices #+BEGIN_SRC R :session ECTanal :exports none :results values drawer res<-result.cor.EFVOL_R_L line1 = paste0('#+MACRO: r_1 ',round(res$estimate,2) ) line2 = paste0('#+MACRO: p_1 ',round(res$p.value,4) ) line3 = paste0('#+MACRO: df_1 ',res$parameter ) line4 = paste0('#+MACRO: t_1 ',round(res$statistic,2) ) paste0(line1,'\n', line2,'\n', line3,'\n', line4) #+END_SRC #+RESULTS: :RESULTS: #+MACRO: r_1 0.32 #+MACRO: p_1 0.0397 #+MACRO: df_1 40 #+MACRO: t_1 2.13 :END: The correlation between EF and volume change laterality indices: r = {{{r_1}}}; p = {{{p_1}}}; df = {{{df_1}}}; t = {{{t_1}}}. *** Correlation between EF and Volume in Hippocampus #+BEGIN_SRC R :session ECTanal :results output raw :exports results library(ascii) library(stringr) res<-result.cor.hippocampus tres<-matrix(NA, 4,4) for (i in 1:4) { tres[i,1]<-res[[i]]$statistic tres[i,2]<-res[[i]]$parameter tres[i,3]<-res[[i]]$p.value tres[i,4]<-res[[i]]$estimate } tres<-data.frame(tres) colnames(tres)<-c('t','df','p','estimate (r or mean difference)') rownames(tres)<-c('all','left', 'right', 'paired-t-test') tres.asc<-ascii(tres, colnames=colnames(tres),digits=4, caption="The relationship between EF and volume change in the hippocampus") print(tres.asc,type="org") #+END_SRC #+RESULTS: #+NAME: table-hippocampus #+CAPTION: The relationship between EF and volume change in the hippocampus | | t | df | p | estimate (r or mean difference) | |---------------+--------+----------+--------+---------------------------------| | all | 5.9700 | 300.0000 | 0.0000 | 0.3259 | | left | 4.5322 | 149.0000 | 0.0000 | 0.3481 | | right | 1.5857 | 149.0000 | 0.1149 | 0.1288 | | paired-t-test | 7.7557 | 150.0000 | 0.0000 | 0.0112 | *** Correlation between EF and Volume in Amygdala #+BEGIN_SRC R :session ECTanal :results output raw :exports results library(ascii) library(stringr) res<-result.cor.amygdala tres<-matrix(NA, 4,4) for (i in 1:4) { tres[i,1]<-res[[i]]$statistic tres[i,2]<-res[[i]]$parameter tres[i,3]<-res[[i]]$p.value tres[i,4]<-res[[i]]$estimate } tres<-data.frame(tres) colnames(tres)<-c('t','df','p','estimate (r or mean difference)') rownames(tres)<-c('all','left', 'right', 'paired-t-test') tres.asc<-ascii(tres, colnames=colnames(tres),digits=4, caption="The relationship between EF and volume change in the amygdala") print(tres.asc,type="org") #+END_SRC #+RESULTS: #+NAME: table-amygdala #+CAPTION: The relationship between EF and volume change in the amygdala | | t | df | p | estimate (r or mean difference) | |---------------+---------+----------+--------+---------------------------------| | all | 11.3538 | 300.0000 | 0.0000 | 0.5482 | | left | 4.0121 | 149.0000 | 0.0001 | 0.3122 | | right | 4.0207 | 149.0000 | 0.0001 | 0.3129 | | paired-t-test | 13.5849 | 150.0000 | 0.0000 | 0.0287 | * Figures #+CAPTION: Illustration of the methods. We have analyzed longitudinal structural MRI data from 151 individuals. We have calculated the volume change and the magnitude of electrical field in 85 regions across the human cortex and subcortical structures. #+NAME: fig:METHODS [[./Figures/Figure_Method.png]] #+CAPTION: Volume change across 85 brain regions. Upper panel first row: mean EF across 85 brain regions; second row: the effect size of volume changes between baseline and at the end of the course of ECT across 85 regions. Lower panel, left: As expected, effect sizes of right unilateral stimulations were consistently higher on the right side than on the left side. Lower panel, right: The scatter plot indicates strong correlation between regional EF a regional volume change (r = {{{r}}}; p = {{{p}}}; df = {{{df}}}; t = {{{t}}}. #+NAME: fig:VOL-CHANGE_85ROI [[./Figures/Figure_small_ROI_based_volume_change.png]] #+CAPTION: Laterality Indices of EF (upper) and Volume change (lower): effect size of the paired wise difference across regions. Lower panel indicates the correlation among the laterality indices of EF and volume changes (r = {{{r_1}}}; p = {{{p_1}}}; df = {{{df_1}}}; t = {{{t_1}}}). The correlation indicates that the more the EF lateralized, the more the corresponding volume change as well. #+NAME: fig:LAT-IND_42ROI [[./Figures/Figure_LatInd_42ROI.png]] #+CAPTION: Individual specific relationship beteween EF and volume change in the hippocampus. The left panel indicates that there is a strong dose dependent relationship between EF and volume change in the hippocampus (t = src_R[:eval q :var t=table-hippocampus[2,1]]{t}, df = src_R[:eval q :var df=table-hippocampus[2,2]]{df}, r = src_R[:eval q :var r=table-hippocampus[2,4]]{r}, p = src_R[:eval q :var mp=table-hippocampus[2,3]]{mp} ). The left side (orange dots) has a very robust relationship (t = src_R[:eval q :var t=table-hippocampus[3,1]]{t}, df = src_R[:eval q :var df=table-hippocampus[3,2]]{df}, r = src_R[:eval q :var r=table-hippocampus[3,4]]{r}, p = src_R[:eval q :var mp=table-hippocampus[3,3]]{mp}) , and event though this relationship on the right side is not significant (probably due to ceiling effect) (t = src_R[:eval q :var t=table-hippocampus[4,1]]{t}, df = src_R[:eval q :var df=table-hippocampus[4,2]]{df}, r = src_R[:eval q :var r=table-hippocampus[4,4]]{r}, p = src_R[:eval q :var mp=table-hippocampus[4,3]]{mp}) it scales nicely with the left sided values. The right panel shows the volume changes in the corresponding individuals in both hemispheres (t = src_R[:eval q :var t=table-hippocampus[5,1]]{t}, df = src_R[:eval q :var df=table-hippocampus[5,2]]{df}, mean difference = src_R[:eval q :var r=table-hippocampus[5,4]]{r}, p = src_R[:eval q :var mp=table-hippocampus[5,3]]{mp} . #+NAME: fig:EFvVOLinHIPPOCAMPUS [[./Figures/v2-EF_v_Hippocampus.png]] #+CAPTION: Individual specific relationship beteween EF and volume change in the amygdala. The left panel indicates that there is a strong dose dependent relationship between EF and volume change in the amygdala (t = src_R[:eval q :var t=table-amygdala[2,1]]{t}, df = src_R[:eval q :var df=table-amygdala[2,2]]{df}, r = src_R[:eval q :var r=table-amygdala[2,4]]{r}, p = src_R[:eval q :var mp=table-amygdala[2,3]]{mp} ). Both the left (orange dots) and right (blue dots) side has a very robust relationship (t = src_R[:eval q :var t=table-amygdala[3,1]]{t}, df = src_R[:eval q :var df=table-amygdala[3,2]]{df}, r = src_R[:eval q :var r=table-amygdala[3,4]]{r}, p = src_R[:eval q :var mp=table-amygdala[3,3]]{mp}) and (t = src_R[:eval q :var t=table-amygdala[4,1]]{t}, df = src_R[:eval q :var df=table-amygdala[4,2]]{df}, r = src_R[:eval q :var r=table-amygdala[4,4]]{r}, p = src_R[:eval q :var mp=table-amygdala[4,3]]{mp}) respectively. The right panel shows the volume changes in the corresponding individuals in both hemispheres (t = src_R[:eval q :var t=table-amygdala[5,1]]{t}, df = src_R[:eval q :var df=table-amygdala[5,2]]{df}, mean difference = src_R[:eval q :var r=table-amygdala[5,4]]{r}, p = src_R[:eval q :var mp=table-amygdala[5,3]]{mp} . #+NAME: fig:EFvVOLinAmygdala [[./Figures/v2-EF_v_Amygdala.png]] * Supplementary Figures #+CAPTION: EF and Volume specificity. To test the specificity of our measures in the bilateral amygdala and the left hippocampus (FDR corrected findings) we permutated the labels across the 85 ROIs. First in the volume changes (left panel) and then in the EF values (right panel) and calculated correlations between the EF and volume change of these regions respectively. This way we received 85 different values, where one of them was the "correct" correlation, indicated with red dots. The correlations between the EF and corresponding volume outperformed the other correlations (were in the top 5 percentile) from non-matching pairs in most of the cases, indicating that our findings were not merely a general correlation with some average values across regions, further strengthening the casual link between EF and volume change. #+NAME: fig:EF-VOL-spec-3ROI [[./Figures/EF-Volume-Specificity.png]] * Supplementary Tables ** Supplementary Table 1A #+BEGIN_SRC R :results output raw :exports results library(ascii) library(stringr) mt<-read.csv('/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/N156_Site_Summary.csv')[,c(2:7)] colnames(mt)[c(3,4,5,6)]<-c('age (mean)','age (sd)', 'baseline MADRS', '\\\\Delta MADRS (%)') #mt$roi<-str_replace(mt$roi,'EF','\\\\Delta VOL') mt.asc<-ascii(mt[,c(2:6)], colnames=colnames(mt[,c(2:6)]),digits=2, caption="Site Summary") # mt.asc<-ascii(mt, colnames=colnames(mt),digits=2, caption="Site Summary") print(mt.asc,type="org") #+END_SRC #+RESULTS: #+CAPTION: Site Summary | Site | N | age (mean) | age (sd) | baseline MADRS | \\Delta MADRS (%) | |------+----+------------+----------+----------------+-------------------| | 1 | 30 | 39.87 | 12.68 | 40.73 | 45.12 | | 2 | 33 | 64.48 | 8.93 | 31.36 | 69.48 | | 3 | 16 | 73.62 | 12.45 | 29.56 | 77.24 | | 4 | 23 | 46.87 | 9.19 | 29.96 | 43.18 | | 5 | 2 | 62.50 | 0.71 | 36.75 | 32.03 | | 6 | 18 | 48.50 | 16.77 | 33.83 | 57.12 | | 7 | 29 | 72.66 | 7.57 | 35.07 | 79.13 | ** Supplementary Table 1B #+CAPTION: MRI Summary | Site | TESLA | TR (ms) | TE (ms) | Flip Angle | Voxel-size (mm) | |------+-------+---------+-----------+------------+-----------------| | 1 | 3 | 2530 | 1.74-7.32 | 7 | 1.3x1.0x1.0 | | 2 | 3 | 2530 | 1.64-9.08 | 7 | 1.0x1.0x1.0 | | 3 | 3 | 7.84 | 3.02 | 12 | 0.94x0.94x1.0 | | 4 | 3 | 7.4 | 3.4 | 9 | 0.5x0.5x0.5 | | 5 | 3 | 7.83 | 3.02 | 8 | 0.94x0.94x1.0 | | 6 | 3 | 6.7 | 2.9 | 8 | 1.0x1.0x1.0 | | 7 | 3 | 9600 | 4.6 | 8 | 0.98x0.98x1.2 | ** Supplementary Table 2 #+BEGIN_SRC R :results output raw :exports results library(ascii) library(stringr) mt<-read.csv('/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/N156_dVOL_one_sample_t.csv')[,c(2:7)] mt$roi<-str_replace(mt$roi,'EF','\\\\Delta VOL') mt.asc<-ascii(mt, colnames=colnames(mt),digits=4, caption="Volume changes") print(mt.asc,type="org") #+END_SRC #+RESULTS: #+CAPTION: Volume changes | | X | roi | t | p | mean | d | BH_FDR | |----+---------+--------------------------------------------+---------+--------+--------+--------+--------| | 1 | 1.0000 | \Delta VOL_Left.Cerebellum.Cortex | 0.5245 | 0.6007 | 0.0006 | 0.0427 | 0.6007 | | 2 | 2.0000 | \Delta VOL_Left.Thalamus.Proper | 10.5829 | 0.0000 | 0.0100 | 0.8612 | 0.0000 | | 3 | 3.0000 | \Delta VOL_Left.Caudate | 6.7938 | 0.0000 | 0.0118 | 0.5529 | 0.0000 | | 4 | 4.0000 | \Delta VOL_Left.Putamen | 4.9404 | 0.0000 | 0.0088 | 0.4020 | 0.0000 | | 5 | 5.0000 | \Delta VOL_Left.Pallidum | 8.7126 | 0.0000 | 0.0089 | 0.7090 | 0.0000 | | 6 | 6.0000 | \Delta VOL_Brain.Stem | 1.9608 | 0.0518 | 0.0016 | 0.1596 | 0.0530 | | 7 | 7.0000 | \Delta VOL_Left.Hippocampus | 9.0893 | 0.0000 | 0.0157 | 0.7497 | 0.0000 | | 8 | 8.0000 | \Delta VOL_Left.Amygdala | 12.7007 | 0.0000 | 0.0231 | 1.0336 | 0.0000 | | 9 | 9.0000 | \Delta VOL_Left.Accumbens.area | 5.9768 | 0.0000 | 0.0112 | 0.4864 | 0.0000 | | 10 | 10.0000 | \Delta VOL_Left.VentralDC | 5.3281 | 0.0000 | 0.0043 | 0.4336 | 0.0000 | | 11 | 11.0000 | \Delta VOL_Right.Cerebellum.Cortex | 0.5627 | 0.5745 | 0.0006 | 0.0458 | 0.5813 | | 12 | 12.0000 | \Delta VOL_Right.Thalamus.Proper | 15.0997 | 0.0000 | 0.0137 | 1.2288 | 0.0000 | | 13 | 13.0000 | \Delta VOL_Right.Caudate | 9.4496 | 0.0000 | 0.0138 | 0.7690 | 0.0000 | | 14 | 14.0000 | \Delta VOL_Right.Putamen | 12.1218 | 0.0000 | 0.0136 | 0.9865 | 0.0000 | | 15 | 15.0000 | \Delta VOL_Right.Pallidum | 13.5065 | 0.0000 | 0.0125 | 1.0991 | 0.0000 | | 16 | 16.0000 | \Delta VOL_Right.Hippocampus | 16.3659 | 0.0000 | 0.0270 | 1.3498 | 0.0000 | | 17 | 17.0000 | \Delta VOL_Right.Amygdala | 21.7232 | 0.0000 | 0.0518 | 1.7678 | 0.0000 | | 18 | 18.0000 | \Delta VOL_Right.Accumbens.area | 12.0922 | 0.0000 | 0.0214 | 0.9840 | 0.0000 | | 19 | 19.0000 | \Delta VOL_Right.VentralDC | 7.7591 | 0.0000 | 0.0059 | 0.6314 | 0.0000 | | 20 | 20.0000 | \Delta VOL_ctx.lh.bankssts | 7.6089 | 0.0000 | 0.0113 | 0.6192 | 0.0000 | | 21 | 21.0000 | \Delta VOL_ctx.lh.caudalanteriorcingulate | 11.2581 | 0.0000 | 0.0191 | 0.9162 | 0.0000 | | 22 | 22.0000 | \Delta VOL_ctx.lh.caudalmiddlefrontal | 8.2731 | 0.0000 | 0.0104 | 0.6733 | 0.0000 | | 23 | 23.0000 | \Delta VOL_ctx.lh.cuneus | 5.9459 | 0.0000 | 0.0055 | 0.4839 | 0.0000 | | 24 | 24.0000 | \Delta VOL_ctx.lh.entorhinal | 7.5440 | 0.0000 | 0.0186 | 0.6139 | 0.0000 | | 25 | 25.0000 | \Delta VOL_ctx.lh.fusiform | 9.5890 | 0.0000 | 0.0115 | 0.7803 | 0.0000 | | 26 | 26.0000 | \Delta VOL_ctx.lh.inferiorparietal | 8.6539 | 0.0000 | 0.0120 | 0.7042 | 0.0000 | | 27 | 27.0000 | \Delta VOL_ctx.lh.inferiortemporal | 8.2009 | 0.0000 | 0.0130 | 0.6674 | 0.0000 | | 28 | 28.0000 | \Delta VOL_ctx.lh.isthmuscingulate | 3.2406 | 0.0015 | 0.0037 | 0.2637 | 0.0016 | | 29 | 29.0000 | \Delta VOL_ctx.lh.lateraloccipital | 7.4697 | 0.0000 | 0.0086 | 0.6079 | 0.0000 | | 30 | 30.0000 | \Delta VOL_ctx.lh.lateralorbitofrontal | 3.6184 | 0.0004 | 0.0048 | 0.2945 | 0.0004 | | 31 | 31.0000 | \Delta VOL_ctx.lh.lingual | 6.4193 | 0.0000 | 0.0053 | 0.5224 | 0.0000 | | 32 | 32.0000 | \Delta VOL_ctx.lh.medialorbitofrontal | 3.3268 | 0.0011 | 0.0047 | 0.2707 | 0.0012 | | 33 | 33.0000 | \Delta VOL_ctx.lh.middletemporal | 5.3903 | 0.0000 | 0.0098 | 0.4387 | 0.0000 | | 34 | 34.0000 | \Delta VOL_ctx.lh.parahippocampal | 9.0527 | 0.0000 | 0.0143 | 0.7367 | 0.0000 | | 35 | 35.0000 | \Delta VOL_ctx.lh.paracentral | 9.9337 | 0.0000 | 0.0120 | 0.8084 | 0.0000 | | 36 | 36.0000 | \Delta VOL_ctx.lh.parsopercularis | 9.9665 | 0.0000 | 0.0123 | 0.8111 | 0.0000 | | 37 | 37.0000 | \Delta VOL_ctx.lh.parsorbitalis | 2.6751 | 0.0083 | 0.0048 | 0.2177 | 0.0087 | | 38 | 38.0000 | \Delta VOL_ctx.lh.parstriangularis | 6.5027 | 0.0000 | 0.0091 | 0.5292 | 0.0000 | | 39 | 39.0000 | \Delta VOL_ctx.lh.pericalcarine | 5.7835 | 0.0000 | 0.0053 | 0.4707 | 0.0000 | | 40 | 40.0000 | \Delta VOL_ctx.lh.postcentral | 6.7211 | 0.0000 | 0.0064 | 0.5470 | 0.0000 | | 41 | 41.0000 | \Delta VOL_ctx.lh.posteriorcingulate | 6.7536 | 0.0000 | 0.0078 | 0.5496 | 0.0000 | | 42 | 42.0000 | \Delta VOL_ctx.lh.precentral | 9.5193 | 0.0000 | 0.0098 | 0.7747 | 0.0000 | | 43 | 43.0000 | \Delta VOL_ctx.lh.precuneus | 7.0412 | 0.0000 | 0.0069 | 0.5730 | 0.0000 | | 44 | 44.0000 | \Delta VOL_ctx.lh.rostralanteriorcingulate | 5.9032 | 0.0000 | 0.0098 | 0.4804 | 0.0000 | | 45 | 45.0000 | \Delta VOL_ctx.lh.rostralmiddlefrontal | 5.0290 | 0.0000 | 0.0063 | 0.4093 | 0.0000 | | 46 | 46.0000 | \Delta VOL_ctx.lh.superiorfrontal | 8.5848 | 0.0000 | 0.0111 | 0.6986 | 0.0000 | | 47 | 47.0000 | \Delta VOL_ctx.lh.superiorparietal | 8.4914 | 0.0000 | 0.0090 | 0.6910 | 0.0000 | | 48 | 48.0000 | \Delta VOL_ctx.lh.superiortemporal | 5.8041 | 0.0000 | 0.0084 | 0.4723 | 0.0000 | | 49 | 49.0000 | \Delta VOL_ctx.lh.supramarginal | 9.4186 | 0.0000 | 0.0126 | 0.7665 | 0.0000 | | 50 | 50.0000 | \Delta VOL_ctx.lh.frontalpole | 2.3865 | 0.0183 | 0.0070 | 0.1942 | 0.0189 | | 51 | 51.0000 | \Delta VOL_ctx.lh.temporalpole | 8.2492 | 0.0000 | 0.0222 | 0.6713 | 0.0000 | | 52 | 52.0000 | \Delta VOL_ctx.lh.transversetemporal | 4.3494 | 0.0000 | 0.0068 | 0.3540 | 0.0000 | | 53 | 53.0000 | \Delta VOL_ctx.rh.bankssts | 11.6196 | 0.0000 | 0.0158 | 0.9456 | 0.0000 | | 54 | 54.0000 | \Delta VOL_ctx.rh.caudalanteriorcingulate | 14.1234 | 0.0000 | 0.0199 | 1.1493 | 0.0000 | | 55 | 55.0000 | \Delta VOL_ctx.rh.caudalmiddlefrontal | 9.3625 | 0.0000 | 0.0115 | 0.7619 | 0.0000 | | 56 | 56.0000 | \Delta VOL_ctx.rh.cuneus | 8.2941 | 0.0000 | 0.0073 | 0.6750 | 0.0000 | | 57 | 57.0000 | \Delta VOL_ctx.rh.entorhinal | 13.2836 | 0.0000 | 0.0330 | 1.0810 | 0.0000 | | 58 | 58.0000 | \Delta VOL_ctx.rh.fusiform | 14.6356 | 0.0000 | 0.0187 | 1.1910 | 0.0000 | | 59 | 59.0000 | \Delta VOL_ctx.rh.inferiorparietal | 9.7739 | 0.0000 | 0.0130 | 0.7954 | 0.0000 | | 60 | 60.0000 | \Delta VOL_ctx.rh.inferiortemporal | 14.2156 | 0.0000 | 0.0193 | 1.1568 | 0.0000 | | 61 | 61.0000 | \Delta VOL_ctx.rh.isthmuscingulate | 4.1816 | 0.0000 | 0.0040 | 0.3403 | 0.0001 | | 62 | 62.0000 | \Delta VOL_ctx.rh.lateraloccipital | 8.2511 | 0.0000 | 0.0103 | 0.6715 | 0.0000 | | 63 | 63.0000 | \Delta VOL_ctx.rh.lateralorbitofrontal | 6.4489 | 0.0000 | 0.0103 | 0.5248 | 0.0000 | | 64 | 64.0000 | \Delta VOL_ctx.rh.lingual | 9.1881 | 0.0000 | 0.0075 | 0.7477 | 0.0000 | | 65 | 65.0000 | \Delta VOL_ctx.rh.medialorbitofrontal | 7.5171 | 0.0000 | 0.0115 | 0.6117 | 0.0000 | | 66 | 66.0000 | \Delta VOL_ctx.rh.middletemporal | 11.6007 | 0.0000 | 0.0159 | 0.9440 | 0.0000 | | 67 | 67.0000 | \Delta VOL_ctx.rh.parahippocampal | 12.4883 | 0.0000 | 0.0215 | 1.0197 | 0.0000 | | 68 | 68.0000 | \Delta VOL_ctx.rh.paracentral | 11.6424 | 0.0000 | 0.0132 | 0.9474 | 0.0000 | | 69 | 69.0000 | \Delta VOL_ctx.rh.parsopercularis | 9.2831 | 0.0000 | 0.0122 | 0.7555 | 0.0000 | | 70 | 70.0000 | \Delta VOL_ctx.rh.parsorbitalis | 4.8321 | 0.0000 | 0.0090 | 0.3932 | 0.0000 | | 71 | 71.0000 | \Delta VOL_ctx.rh.parstriangularis | 9.7651 | 0.0000 | 0.0124 | 0.7947 | 0.0000 | | 72 | 72.0000 | \Delta VOL_ctx.rh.pericalcarine | 7.9260 | 0.0000 | 0.0068 | 0.6450 | 0.0000 | | 73 | 73.0000 | \Delta VOL_ctx.rh.postcentral | 7.9663 | 0.0000 | 0.0081 | 0.6483 | 0.0000 | | 74 | 74.0000 | \Delta VOL_ctx.rh.posteriorcingulate | 8.4401 | 0.0000 | 0.0094 | 0.6868 | 0.0000 | | 75 | 75.0000 | \Delta VOL_ctx.rh.precentral | 9.5727 | 0.0000 | 0.0105 | 0.7790 | 0.0000 | | 76 | 76.0000 | \Delta VOL_ctx.rh.precuneus | 9.0177 | 0.0000 | 0.0082 | 0.7339 | 0.0000 | | 77 | 77.0000 | \Delta VOL_ctx.rh.rostralanteriorcingulate | 12.6172 | 0.0000 | 0.0184 | 1.0268 | 0.0000 | | 78 | 78.0000 | \Delta VOL_ctx.rh.rostralmiddlefrontal | 7.1486 | 0.0000 | 0.0092 | 0.5817 | 0.0000 | | 79 | 79.0000 | \Delta VOL_ctx.rh.superiorfrontal | 9.3432 | 0.0000 | 0.0118 | 0.7603 | 0.0000 | | 80 | 80.0000 | \Delta VOL_ctx.rh.superiorparietal | 7.1766 | 0.0000 | 0.0086 | 0.5840 | 0.0000 | | 81 | 81.0000 | \Delta VOL_ctx.rh.superiortemporal | 15.6352 | 0.0000 | 0.0216 | 1.2724 | 0.0000 | | 82 | 82.0000 | \Delta VOL_ctx.rh.supramarginal | 12.4385 | 0.0000 | 0.0153 | 1.0122 | 0.0000 | | 83 | 83.0000 | \Delta VOL_ctx.rh.frontalpole | 3.5531 | 0.0005 | 0.0089 | 0.2891 | 0.0006 | | 84 | 84.0000 | \Delta VOL_ctx.rh.temporalpole | 15.0638 | 0.0000 | 0.0442 | 1.2259 | 0.0000 | | 85 | 85.0000 | \Delta VOL_ctx.rh.transversetemporal | 9.8355 | 0.0000 | 0.0159 | 0.8004 | 0.0000 | ** Supplementary Table 3 #+BEGIN_SRC R :results output raw :exports results library(ascii) library(stringr) mt<-read.csv('/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/N156_dVOL_paired_sample_t_R_L.csv')[,c(2:6,9)] mt$roi<-str_replace(mt$roi,'EF','\\\\Delta VOL^{R-L}') mt.asc<-ascii(mt, colnames=colnames(mt),digits=4, caption="Pairwise difference in volume change between R and L side") print(mt.asc,type="org") #+END_SRC #+RESULTS: #+CAPTION: Pairwise difference in volume change between R and L side | | roi | t | p | mean | d | BH_FDR | |----+--------------------------------------------------+---------+--------+---------+---------+--------| | 1 | \Delta VOL^{R-L}_Left.Cerebellum.Cortex | 0.0143 | 0.9886 | 0.0000 | 0.0012 | 0.9886 | | 2 | \Delta VOL^{R-L}_Left.Thalamus.Proper | 5.3964 | 0.0000 | 0.0038 | 0.4392 | 0.0000 | | 3 | \Delta VOL^{R-L}_Left.Caudate | 1.3345 | 0.1841 | 0.0020 | 0.1086 | 0.2479 | | 4 | \Delta VOL^{R-L}_Left.Putamen | 2.9475 | 0.0037 | 0.0048 | 0.2399 | 0.0082 | | 5 | \Delta VOL^{R-L}_Left.Pallidum | 4.1348 | 0.0001 | 0.0036 | 0.3365 | 0.0002 | | 6 | \Delta VOL^{R-L}_Left.Hippocampus | 7.5495 | 0.0000 | 0.0112 | 0.6227 | 0.0000 | | 7 | \Delta VOL^{R-L}_Left.Amygdala | 13.5849 | 0.0000 | 0.0287 | 1.1055 | 0.0000 | | 8 | \Delta VOL^{R-L}_Left.Accumbens.area | 4.9434 | 0.0000 | 0.0102 | 0.4023 | 0.0000 | | 9 | \Delta VOL^{R-L}_Left.VentralDC | 2.0243 | 0.0447 | 0.0015 | 0.1647 | 0.0722 | | 10 | \Delta VOL^{R-L}_ctx.lh.bankssts | 3.0130 | 0.0030 | 0.0045 | 0.2452 | 0.0071 | | 11 | \Delta VOL^{R-L}_ctx.lh.caudalanteriorcingulate | 0.6360 | 0.5257 | 0.0009 | 0.0518 | 0.5811 | | 12 | \Delta VOL^{R-L}_ctx.lh.caudalmiddlefrontal | 0.9711 | 0.3331 | 0.0011 | 0.0790 | 0.4239 | | 13 | \Delta VOL^{R-L}_ctx.lh.cuneus | 2.4545 | 0.0153 | 0.0018 | 0.1997 | 0.0305 | | 14 | \Delta VOL^{R-L}_ctx.lh.entorhinal | 5.8721 | 0.0000 | 0.0144 | 0.4779 | 0.0000 | | 15 | \Delta VOL^{R-L}_ctx.lh.fusiform | 6.5958 | 0.0000 | 0.0073 | 0.5368 | 0.0000 | | 16 | \Delta VOL^{R-L}_ctx.lh.inferiorparietal | 0.7300 | 0.4665 | 0.0009 | 0.0594 | 0.5296 | | 17 | \Delta VOL^{R-L}_ctx.lh.inferiortemporal | 4.0768 | 0.0001 | 0.0063 | 0.3318 | 0.0002 | | 18 | \Delta VOL^{R-L}_ctx.lh.isthmuscingulate | 0.3073 | 0.7590 | 0.0003 | 0.0250 | 0.7970 | | 19 | \Delta VOL^{R-L}_ctx.lh.lateraloccipital | 1.8303 | 0.0692 | 0.0017 | 0.1489 | 0.1076 | | 20 | \Delta VOL^{R-L}_ctx.lh.lateralorbitofrontal | 4.4129 | 0.0000 | 0.0055 | 0.3591 | 0.0001 | | 21 | \Delta VOL^{R-L}_ctx.lh.lingual | 3.4261 | 0.0008 | 0.0022 | 0.2788 | 0.0020 | | 22 | \Delta VOL^{R-L}_ctx.lh.medialorbitofrontal | 5.6916 | 0.0000 | 0.0068 | 0.4632 | 0.0000 | | 23 | \Delta VOL^{R-L}_ctx.lh.middletemporal | 3.4250 | 0.0008 | 0.0061 | 0.2787 | 0.0020 | | 24 | \Delta VOL^{R-L}_ctx.lh.parahippocampal | 5.2481 | 0.0000 | 0.0073 | 0.4285 | 0.0000 | | 25 | \Delta VOL^{R-L}_ctx.lh.paracentral | 1.3198 | 0.1889 | 0.0012 | 0.1074 | 0.2479 | | 26 | \Delta VOL^{R-L}_ctx.lh.parsopercularis | -0.0817 | 0.9350 | -0.0001 | -0.0067 | 0.9578 | | 27 | \Delta VOL^{R-L}_ctx.lh.parsorbitalis | 2.2705 | 0.0246 | 0.0042 | 0.1848 | 0.0449 | | 28 | \Delta VOL^{R-L}_ctx.lh.parstriangularis | 2.3062 | 0.0225 | 0.0032 | 0.1877 | 0.0429 | | 29 | \Delta VOL^{R-L}_ctx.lh.pericalcarine | 2.1849 | 0.0304 | 0.0015 | 0.1778 | 0.0533 | | 30 | \Delta VOL^{R-L}_ctx.lh.postcentral | 1.6675 | 0.0975 | 0.0017 | 0.1357 | 0.1365 | | 31 | \Delta VOL^{R-L}_ctx.lh.posteriorcingulate | 1.7943 | 0.0748 | 0.0015 | 0.1460 | 0.1103 | | 32 | \Delta VOL^{R-L}_ctx.lh.precentral | 0.7771 | 0.4383 | 0.0007 | 0.0632 | 0.5116 | | 33 | \Delta VOL^{R-L}_ctx.lh.precuneus | 1.7855 | 0.0762 | 0.0013 | 0.1453 | 0.1103 | | 34 | \Delta VOL^{R-L}_ctx.lh.rostralanteriorcingulate | 5.3843 | 0.0000 | 0.0086 | 0.4382 | 0.0000 | | 35 | \Delta VOL^{R-L}_ctx.lh.rostralmiddlefrontal | 2.7045 | 0.0076 | 0.0028 | 0.2201 | 0.0160 | | 36 | \Delta VOL^{R-L}_ctx.lh.superiorfrontal | 0.9084 | 0.3651 | 0.0007 | 0.0739 | 0.4511 | | 37 | \Delta VOL^{R-L}_ctx.lh.superiorparietal | -0.5389 | 0.5907 | -0.0004 | -0.0439 | 0.6362 | | 38 | \Delta VOL^{R-L}_ctx.lh.superiortemporal | 8.6326 | 0.0000 | 0.0132 | 0.7025 | 0.0000 | | 39 | \Delta VOL^{R-L}_ctx.lh.supramarginal | 2.1185 | 0.0358 | 0.0027 | 0.1724 | 0.0601 | | 40 | \Delta VOL^{R-L}_ctx.lh.frontalpole | 0.7768 | 0.4385 | 0.0019 | 0.0632 | 0.5116 | | 41 | \Delta VOL^{R-L}_ctx.lh.temporalpole | 6.6295 | 0.0000 | 0.0220 | 0.5395 | 0.0000 | | 42 | \Delta VOL^{R-L}_ctx.lh.transversetemporal | 5.8831 | 0.0000 | 0.0090 | 0.4788 | 0.0000 | | | | | | | | | ** Supplementary Table 4-without site :noexport: #+BEGIN_SRC R :results output raw :exports results library(ascii) library(stringr) mt<-read.csv('/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/N151_dVol-EF+Age+ECTnum_FDRcorrect.csv')[,c(2:5,7,9)] mt$roi<-str_replace(mt$roi,'EF','\\\\Delta VOL') colnames(mt)[6]<-'BH^EF_FDR' mt.asc<-ascii(mt, colnames=colnames(mt),digits=4, caption="The relationship between volume changes and EF across individuals (EF ~ \\Delta Vol + Age + ECTnum)") print(mt.asc,type="org") #+END_SRC #+RESULTS: #+CAPTION: The relationship between volume changes and EF across individuals ( \Delta Vol ~ EF + Age + ECTnum) | | roi | t_EF | p_EF | t_Age | t_ECTnum | BH^EF_FDR | |----+--------------------------------------------+---------+--------+---------+----------+-----------| | 1 | \Delta VOL_Left.Cerebellum.Cortex | 0.1756 | 0.8609 | 1.0464 | 2.1542 | 0.9263 | | 2 | \Delta VOL_Left.Thalamus.Proper | 0.2321 | 0.8168 | 0.8260 | 2.8326 | 0.8901 | | 3 | \Delta VOL_Left.Caudate | 0.7559 | 0.4509 | -0.5022 | 2.7269 | 0.6633 | | 4 | \Delta VOL_Left.Putamen | 0.5772 | 0.5647 | -0.3482 | 1.6085 | 0.7272 | | 5 | \Delta VOL_Left.Pallidum | 0.0921 | 0.9268 | 0.9235 | 1.4042 | 0.9491 | | 6 | \Delta VOL_Brain.Stem | 1.4237 | 0.1566 | 1.0471 | 1.3755 | 0.4035 | | 7 | \Delta VOL_Left.Hippocampus | 4.7191 | 0.0000 | -3.0149 | 3.4190 | 0.0005 | | 8 | \Delta VOL_Left.Amygdala | 3.8939 | 0.0001 | -0.3270 | 1.9282 | 0.0042 | | 9 | \Delta VOL_Left.Accumbens.area | 2.0238 | 0.0448 | -3.4456 | 1.7246 | 0.1899 | | 10 | \Delta VOL_Left.VentralDC | 0.0743 | 0.9409 | 0.5726 | 2.1980 | 0.9521 | | 11 | \Delta VOL_Right.Cerebellum.Cortex | -0.5564 | 0.5788 | 0.0677 | 1.3212 | 0.7343 | | 12 | \Delta VOL_Right.Thalamus.Proper | 0.1067 | 0.9152 | 1.8513 | 3.5792 | 0.9487 | | 13 | \Delta VOL_Right.Caudate | 1.2498 | 0.2134 | 1.5926 | 1.6008 | 0.4650 | | 14 | \Delta VOL_Right.Putamen | 1.1885 | 0.2366 | 0.0379 | 1.7233 | 0.4706 | | 15 | \Delta VOL_Right.Pallidum | 0.9091 | 0.3648 | 2.6442 | 2.9325 | 0.6218 | | 16 | \Delta VOL_Right.Hippocampus | 2.0043 | 0.0469 | -1.0697 | 3.2904 | 0.1899 | | 17 | \Delta VOL_Right.Amygdala | 4.0799 | 0.0001 | 2.1354 | 4.1192 | 0.0031 | | 18 | \Delta VOL_Right.Accumbens.area | 2.5525 | 0.0117 | -0.2108 | 3.6614 | 0.0966 | | 19 | \Delta VOL_Right.VentralDC | 0.2958 | 0.7678 | 0.6986 | 0.7433 | 0.8536 | | 20 | \Delta VOL_ctx.lh.bankssts | 1.2061 | 0.2297 | 2.0608 | 2.7927 | 0.4706 | | 21 | \Delta VOL_ctx.lh.caudalanteriorcingulate | 1.5301 | 0.1281 | 1.8123 | 1.9654 | 0.3827 | | 22 | \Delta VOL_ctx.lh.caudalmiddlefrontal | -1.4424 | 0.1513 | 1.7638 | 1.8303 | 0.4035 | | 23 | \Delta VOL_ctx.lh.cuneus | 0.9983 | 0.3198 | 0.1877 | 2.0399 | 0.5663 | | 24 | \Delta VOL_ctx.lh.entorhinal | 3.2229 | 0.0016 | -1.2447 | 1.6659 | 0.0332 | | 25 | \Delta VOL_ctx.lh.fusiform | 2.9607 | 0.0036 | 1.0298 | 2.1238 | 0.0609 | | 26 | \Delta VOL_ctx.lh.inferiorparietal | 1.7507 | 0.0821 | 3.2476 | 2.3424 | 0.2907 | | 27 | \Delta VOL_ctx.lh.inferiortemporal | 2.5683 | 0.0112 | 2.0731 | 1.9766 | 0.0966 | | 28 | \Delta VOL_ctx.lh.isthmuscingulate | 0.1456 | 0.8844 | 0.5500 | 2.9338 | 0.9300 | | 29 | \Delta VOL_ctx.lh.lateraloccipital | 1.3650 | 0.1743 | 2.3120 | 1.1617 | 0.4315 | | 30 | \Delta VOL_ctx.lh.lateralorbitofrontal | 1.4274 | 0.1556 | -0.0081 | 1.5758 | 0.4035 | | 31 | \Delta VOL_ctx.lh.lingual | 0.2886 | 0.7733 | 0.9764 | 2.4836 | 0.8536 | | 32 | \Delta VOL_ctx.lh.medialorbitofrontal | 1.0744 | 0.2844 | -0.1246 | 1.1852 | 0.5246 | | 33 | \Delta VOL_ctx.lh.middletemporal | 2.2463 | 0.0262 | 1.2792 | 2.2418 | 0.1483 | | 34 | \Delta VOL_ctx.lh.parahippocampal | 1.5197 | 0.1307 | 1.2153 | 2.7839 | 0.3827 | | 35 | \Delta VOL_ctx.lh.paracentral | -1.6080 | 0.1100 | 1.8077 | 4.0461 | 0.3595 | | 36 | \Delta VOL_ctx.lh.parsopercularis | -0.7867 | 0.4327 | 1.0377 | 1.8485 | 0.6633 | | 37 | \Delta VOL_ctx.lh.parsorbitalis | 0.7866 | 0.4328 | -0.5581 | 0.9230 | 0.6633 | | 38 | \Delta VOL_ctx.lh.parstriangularis | 0.7271 | 0.4683 | -0.3211 | 2.7730 | 0.6747 | | 39 | \Delta VOL_ctx.lh.pericalcarine | 0.4473 | 0.6553 | 0.1144 | 1.8018 | 0.7737 | | 40 | \Delta VOL_ctx.lh.postcentral | 1.1846 | 0.2381 | -1.3567 | 2.6260 | 0.4706 | | 41 | \Delta VOL_ctx.lh.posteriorcingulate | -0.2974 | 0.7666 | 1.8490 | 3.2422 | 0.8536 | | 42 | \Delta VOL_ctx.lh.precentral | -0.4343 | 0.6647 | 1.0114 | 2.2386 | 0.7740 | | 43 | \Delta VOL_ctx.lh.precuneus | -0.6681 | 0.5051 | 1.7698 | 3.6531 | 0.7038 | | 44 | \Delta VOL_ctx.lh.rostralanteriorcingulate | 1.3355 | 0.1838 | -0.4330 | 0.5597 | 0.4315 | | 45 | \Delta VOL_ctx.lh.rostralmiddlefrontal | -0.6456 | 0.5196 | -1.1592 | 1.2149 | 0.7123 | | 46 | \Delta VOL_ctx.lh.superiorfrontal | -0.7530 | 0.4526 | 1.3697 | 1.7221 | 0.6633 | | 47 | \Delta VOL_ctx.lh.superiorparietal | -0.8943 | 0.3726 | 3.0604 | 3.3431 | 0.6218 | | 48 | \Delta VOL_ctx.lh.superiortemporal | 2.4341 | 0.0161 | -0.9346 | 1.6118 | 0.1142 | | 49 | \Delta VOL_ctx.lh.supramarginal | 0.6062 | 0.5453 | 1.7149 | 2.3978 | 0.7272 | | 50 | \Delta VOL_ctx.lh.frontalpole | -0.3142 | 0.7538 | 0.3078 | 0.5047 | 0.8536 | | 51 | \Delta VOL_ctx.lh.temporalpole | 2.5288 | 0.0125 | -0.0731 | 1.3167 | 0.0966 | | 52 | \Delta VOL_ctx.lh.transversetemporal | 0.4916 | 0.6237 | -0.1242 | 2.2582 | 0.7467 | | 53 | \Delta VOL_ctx.rh.bankssts | 0.5163 | 0.6065 | 3.7489 | 2.9357 | 0.7467 | | 54 | \Delta VOL_ctx.rh.caudalanteriorcingulate | -0.5832 | 0.5607 | 3.7966 | 2.5652 | 0.7272 | | 55 | \Delta VOL_ctx.rh.caudalmiddlefrontal | -2.1288 | 0.0349 | 3.7973 | 2.2639 | 0.1650 | | 56 | \Delta VOL_ctx.rh.cuneus | 0.4958 | 0.6208 | 1.5703 | 2.3637 | 0.7467 | | 57 | \Delta VOL_ctx.rh.entorhinal | 1.5027 | 0.1351 | 0.8497 | 2.7893 | 0.3827 | | 58 | \Delta VOL_ctx.rh.fusiform | 1.5232 | 0.1299 | 3.0726 | 4.7018 | 0.3827 | | 59 | \Delta VOL_ctx.rh.inferiorparietal | -2.1634 | 0.0321 | 4.4789 | 0.4878 | 0.1650 | | 60 | \Delta VOL_ctx.rh.inferiortemporal | 0.7744 | 0.4399 | 3.4222 | 3.1417 | 0.6633 | | 61 | \Delta VOL_ctx.rh.isthmuscingulate | 0.1433 | 0.8862 | 1.2205 | 1.3723 | 0.9300 | | 62 | \Delta VOL_ctx.rh.lateraloccipital | 1.3081 | 0.1929 | 2.0248 | 1.2966 | 0.4315 | | 63 | \Delta VOL_ctx.rh.lateralorbitofrontal | 0.5372 | 0.5919 | 0.3479 | 2.9289 | 0.7399 | | 64 | \Delta VOL_ctx.rh.lingual | 0.8383 | 0.4032 | 0.8111 | 3.1622 | 0.6466 | | 65 | \Delta VOL_ctx.rh.medialorbitofrontal | 0.8396 | 0.4025 | 1.9647 | 2.4872 | 0.6466 | | 66 | \Delta VOL_ctx.rh.middletemporal | 0.0035 | 0.9972 | 4.4103 | 3.1633 | 0.9972 | | 67 | \Delta VOL_ctx.rh.parahippocampal | 2.1391 | 0.0341 | 1.5490 | 3.5064 | 0.1650 | | 68 | \Delta VOL_ctx.rh.paracentral | -2.8137 | 0.0056 | 3.8171 | 2.3520 | 0.0789 | | 69 | \Delta VOL_ctx.rh.parsopercularis | -2.6602 | 0.0087 | 3.6841 | 2.9648 | 0.0966 | | 70 | \Delta VOL_ctx.rh.parsorbitalis | 1.0618 | 0.2900 | -0.5147 | 2.4706 | 0.5246 | | 71 | \Delta VOL_ctx.rh.parstriangularis | -1.0748 | 0.2842 | 1.7916 | 2.6677 | 0.5246 | | 72 | \Delta VOL_ctx.rh.pericalcarine | 1.6576 | 0.0995 | 0.6262 | 2.2825 | 0.3384 | | 73 | \Delta VOL_ctx.rh.postcentral | -1.3179 | 0.1896 | 1.6212 | 2.8229 | 0.4315 | | 74 | \Delta VOL_ctx.rh.posteriorcingulate | -1.1543 | 0.2502 | 3.5184 | 1.4907 | 0.4834 | | 75 | \Delta VOL_ctx.rh.precentral | -1.9054 | 0.0587 | 2.4047 | 3.3737 | 0.2191 | | 76 | \Delta VOL_ctx.rh.precuneus | -1.2099 | 0.2283 | 3.1519 | 2.3670 | 0.4706 | | 77 | \Delta VOL_ctx.rh.rostralanteriorcingulate | 2.2581 | 0.0254 | 2.7043 | 2.2909 | 0.1483 | | 78 | \Delta VOL_ctx.rh.rostralmiddlefrontal | -2.6061 | 0.0101 | 0.9748 | 2.2586 | 0.0966 | | 79 | \Delta VOL_ctx.rh.superiorfrontal | -2.3635 | 0.0194 | 2.6759 | 3.0793 | 0.1269 | | 80 | \Delta VOL_ctx.rh.superiorparietal | -2.0988 | 0.0375 | 2.5670 | 1.9770 | 0.1680 | | 81 | \Delta VOL_ctx.rh.superiortemporal | 0.6906 | 0.4909 | 3.3716 | 4.0534 | 0.6954 | | 82 | \Delta VOL_ctx.rh.supramarginal | -1.9008 | 0.0593 | 4.8481 | 2.8117 | 0.2191 | | 83 | \Delta VOL_ctx.rh.frontalpole | 0.8934 | 0.3731 | 0.3230 | 1.9506 | 0.6218 | | 84 | \Delta VOL_ctx.rh.temporalpole | 0.5802 | 0.5626 | 1.9373 | 3.9473 | 0.7272 | | 85 | \Delta VOL_ctx.rh.transversetemporal | 1.3252 | 0.1872 | 3.6402 | 3.1050 | 0.4315 | ** Supplementary Table 5-without site :noexport: #+BEGIN_SRC R :results output raw :exports results library(ascii) library(stringr) mt<-read.csv('/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/N156_dMADRSperc-dVol+Age+ECTnum.csv')[,c(2:5,7)] mt$roi<-str_replace(mt$roi,'EF','\\\\Delta MADRS ~ \\\\Delta VOL') colnames(mt)[c(2:5)]<-c('t_VOL','p_VOL','t_Age','t_ECTnum') mt.asc<-ascii(mt, colnames=colnames(mt),digits=4, caption="The relationship clinical response and volume changes across individuals (\\Delta MADRS ~ \\Delta Vol + Age + ECTnum)") print(mt.asc,type="org") #+END_SRC #+RESULTS: #+CAPTION: The relationship clinical response and volume changes across individuals ( \Delta MADRS ~ \Delta Vol + Age + ECTnum) | | roi | t_VOL | p_VOL | t_Age | t_ECTnum | |----+-----------------------------------------------------------+---------+--------+--------+----------| | 1 | \Delta MADRS ~ \Delta VOL_Left.Cerebellum.Cortex | -0.4996 | 0.6181 | 5.6129 | -2.8409 | | 2 | \Delta MADRS ~ \Delta VOL_Left.Thalamus.Proper | 0.6014 | 0.5485 | 5.5399 | -3.0339 | | 3 | \Delta MADRS ~ \Delta VOL_Left.Caudate | -0.9727 | 0.3323 | 5.5351 | -2.6916 | | 4 | \Delta MADRS ~ \Delta VOL_Left.Putamen | 0.1944 | 0.8462 | 5.5897 | -2.9713 | | 5 | \Delta MADRS ~ \Delta VOL_Left.Pallidum | -0.6016 | 0.5483 | 5.6222 | -2.8859 | | 6 | \Delta MADRS ~ \Delta VOL_Brain.Stem | 0.0780 | 0.9380 | 5.5551 | -2.9623 | | 7 | \Delta MADRS ~ \Delta VOL_Left.Hippocampus | 0.2436 | 0.8079 | 5.3838 | -2.7114 | | 8 | \Delta MADRS ~ \Delta VOL_Left.Amygdala | 0.0822 | 0.9346 | 5.5736 | -2.9514 | | 9 | \Delta MADRS ~ \Delta VOL_Left.Accumbens.area | -1.1617 | 0.2472 | 5.1099 | -2.7724 | | 10 | \Delta MADRS ~ \Delta VOL_Left.VentralDC | -0.2002 | 0.8416 | 5.5898 | -2.8887 | | 11 | \Delta MADRS ~ \Delta VOL_Right.Cerebellum.Cortex | -0.0366 | 0.9708 | 5.5858 | -2.9504 | | 12 | \Delta MADRS ~ \Delta VOL_Right.Thalamus.Proper | 1.4615 | 0.1460 | 5.3363 | -3.2850 | | 13 | \Delta MADRS ~ \Delta VOL_Right.Caudate | -0.0246 | 0.9804 | 5.5218 | -2.9425 | | 14 | \Delta MADRS ~ \Delta VOL_Right.Putamen | -1.0967 | 0.2746 | 5.6266 | -2.8020 | | 15 | \Delta MADRS ~ \Delta VOL_Right.Pallidum | 0.1767 | 0.8600 | 5.4055 | -2.9293 | | 16 | \Delta MADRS ~ \Delta VOL_Right.Hippocampus | -0.7164 | 0.4749 | 5.4632 | -2.4620 | | 17 | \Delta MADRS ~ \Delta VOL_Right.Amygdala | 1.5094 | 0.1333 | 5.1476 | -3.3036 | | 18 | \Delta MADRS ~ \Delta VOL_Right.Accumbens.area | 0.0774 | 0.9384 | 5.5702 | -2.8683 | | 19 | \Delta MADRS ~ \Delta VOL_Right.VentralDC | -0.3931 | 0.6948 | 5.6024 | -2.9437 | | 20 | \Delta MADRS ~ \Delta VOL_ctx.lh.bankssts | -0.7238 | 0.4703 | 5.6411 | -2.7428 | | 21 | \Delta MADRS ~ \Delta VOL_ctx.lh.caudalanteriorcingulate | 1.2169 | 0.2256 | 5.3627 | -3.1468 | | 22 | \Delta MADRS ~ \Delta VOL_ctx.lh.caudalmiddlefrontal | 0.0928 | 0.9262 | 5.5154 | -2.9549 | | 23 | \Delta MADRS ~ \Delta VOL_ctx.lh.cuneus | 0.6429 | 0.5213 | 5.5821 | -3.0413 | | 24 | \Delta MADRS ~ \Delta VOL_ctx.lh.entorhinal | 0.4162 | 0.6779 | 5.6001 | -3.0022 | | 25 | \Delta MADRS ~ \Delta VOL_ctx.lh.fusiform | 1.6961 | 0.0920 | 5.3670 | -3.2505 | | 26 | \Delta MADRS ~ \Delta VOL_ctx.lh.inferiorparietal | 0.1364 | 0.8917 | 5.3652 | -2.9423 | | 27 | \Delta MADRS ~ \Delta VOL_ctx.lh.inferiortemporal | 0.2425 | 0.8088 | 5.4837 | -2.9730 | | 28 | \Delta MADRS ~ \Delta VOL_ctx.lh.isthmuscingulate | 0.2110 | 0.8332 | 5.5711 | -2.9383 | | 29 | \Delta MADRS ~ \Delta VOL_ctx.lh.lateraloccipital | 0.7252 | 0.4695 | 5.3551 | -3.0336 | | 30 | \Delta MADRS ~ \Delta VOL_ctx.lh.lateralorbitofrontal | -0.5301 | 0.5969 | 5.5877 | -2.8830 | | 31 | \Delta MADRS ~ \Delta VOL_ctx.lh.lingual | 1.2153 | 0.2262 | 5.4860 | -3.1695 | | 32 | \Delta MADRS ~ \Delta VOL_ctx.lh.medialorbitofrontal | -0.3501 | 0.7268 | 5.5881 | -2.9271 | | 33 | \Delta MADRS ~ \Delta VOL_ctx.lh.middletemporal | -0.6038 | 0.5469 | 5.6240 | -2.8140 | | 34 | \Delta MADRS ~ \Delta VOL_ctx.lh.parahippocampal | 1.5379 | 0.1262 | 5.3899 | -3.2626 | | 35 | \Delta MADRS ~ \Delta VOL_ctx.lh.paracentral | 0.3763 | 0.7072 | 5.4862 | -2.9448 | | 36 | \Delta MADRS ~ \Delta VOL_ctx.lh.parsopercularis | -0.4156 | 0.6783 | 5.6035 | -2.8779 | | 37 | \Delta MADRS ~ \Delta VOL_ctx.lh.parsorbitalis | -1.0305 | 0.3045 | 5.5172 | -2.8969 | | 38 | \Delta MADRS ~ \Delta VOL_ctx.lh.parstriangularis | -1.2208 | 0.2241 | 5.5629 | -2.6377 | | 39 | \Delta MADRS ~ \Delta VOL_ctx.lh.pericalcarine | 0.7751 | 0.4395 | 5.5888 | -3.0587 | | 40 | \Delta MADRS ~ \Delta VOL_ctx.lh.postcentral | -1.0000 | 0.3190 | 5.4727 | -2.6996 | | 41 | \Delta MADRS ~ \Delta VOL_ctx.lh.posteriorcingulate | 0.5498 | 0.5833 | 5.4460 | -3.0158 | | 42 | \Delta MADRS ~ \Delta VOL_ctx.lh.precentral | -0.0495 | 0.9606 | 5.5712 | -2.9143 | | 43 | \Delta MADRS ~ \Delta VOL_ctx.lh.precuneus | 0.3625 | 0.7175 | 5.4787 | -2.9521 | | 44 | \Delta MADRS ~ \Delta VOL_ctx.lh.rostralanteriorcingulate | -0.1290 | 0.8975 | 5.5730 | -2.9618 | | 45 | \Delta MADRS ~ \Delta VOL_ctx.lh.rostralmiddlefrontal | -1.9406 | 0.0542 | 5.4669 | -2.8022 | | 46 | \Delta MADRS ~ \Delta VOL_ctx.lh.superiorfrontal | -0.3027 | 0.7626 | 5.5862 | -2.9033 | | 47 | \Delta MADRS ~ \Delta VOL_ctx.lh.superiorparietal | -0.0438 | 0.9651 | 5.4356 | -2.8571 | | 48 | \Delta MADRS ~ \Delta VOL_ctx.lh.superiortemporal | -0.3779 | 0.7061 | 5.5151 | -2.8940 | | 49 | \Delta MADRS ~ \Delta VOL_ctx.lh.supramarginal | 0.1638 | 0.8701 | 5.5116 | -2.9469 | | 50 | \Delta MADRS ~ \Delta VOL_ctx.lh.frontalpole | -1.0660 | 0.2882 | 5.6368 | -2.9350 | | 51 | \Delta MADRS ~ \Delta VOL_ctx.lh.temporalpole | -0.0468 | 0.9627 | 5.5854 | -2.9437 | | 52 | \Delta MADRS ~ \Delta VOL_ctx.lh.transversetemporal | 0.2540 | 0.7999 | 5.5916 | -2.9687 | | 53 | \Delta MADRS ~ \Delta VOL_ctx.rh.bankssts | 0.9053 | 0.3668 | 5.0801 | -3.1088 | | 54 | \Delta MADRS ~ \Delta VOL_ctx.rh.caudalanteriorcingulate | 0.3475 | 0.7287 | 5.2346 | -2.9811 | | 55 | \Delta MADRS ~ \Delta VOL_ctx.rh.caudalmiddlefrontal | -1.0823 | 0.2809 | 5.6919 | -2.7464 | | 56 | \Delta MADRS ~ \Delta VOL_ctx.rh.cuneus | 1.8884 | 0.0609 | 5.3569 | -3.3128 | | 57 | \Delta MADRS ~ \Delta VOL_ctx.rh.entorhinal | 0.0560 | 0.9554 | 5.5400 | -2.9105 | | 58 | \Delta MADRS ~ \Delta VOL_ctx.rh.fusiform | 1.8334 | 0.0688 | 4.8882 | -3.4592 | | 59 | \Delta MADRS ~ \Delta VOL_ctx.rh.inferiorparietal | 0.5439 | 0.5873 | 5.0947 | -2.9941 | | 60 | \Delta MADRS ~ \Delta VOL_ctx.rh.inferiortemporal | 1.3208 | 0.1886 | 5.0209 | -3.2240 | | 61 | \Delta MADRS ~ \Delta VOL_ctx.rh.isthmuscingulate | -0.3354 | 0.7378 | 5.5933 | -2.9160 | | 62 | \Delta MADRS ~ \Delta VOL_ctx.rh.lateraloccipital | 0.8522 | 0.3955 | 5.3702 | -3.0514 | | 63 | \Delta MADRS ~ \Delta VOL_ctx.rh.lateralorbitofrontal | -0.3644 | 0.7161 | 5.5981 | -2.8076 | | 64 | \Delta MADRS ~ \Delta VOL_ctx.rh.lingual | 1.4913 | 0.1380 | 5.4989 | -3.2735 | | 65 | \Delta MADRS ~ \Delta VOL_ctx.rh.medialorbitofrontal | -0.7994 | 0.4253 | 5.6489 | -2.7635 | | 66 | \Delta MADRS ~ \Delta VOL_ctx.rh.middletemporal | -0.2340 | 0.8153 | 5.3303 | -2.8169 | | 67 | \Delta MADRS ~ \Delta VOL_ctx.rh.parahippocampal | 0.9612 | 0.3380 | 5.3354 | -3.1011 | | 68 | \Delta MADRS ~ \Delta VOL_ctx.rh.paracentral | -0.1723 | 0.8635 | 5.4405 | -2.8938 | | 69 | \Delta MADRS ~ \Delta VOL_ctx.rh.parsopercularis | -1.2194 | 0.2246 | 5.7367 | -2.6122 | | 70 | \Delta MADRS ~ \Delta VOL_ctx.rh.parsorbitalis | -0.4771 | 0.6340 | 5.5286 | -2.8337 | | 71 | \Delta MADRS ~ \Delta VOL_ctx.rh.parstriangularis | -0.9698 | 0.3338 | 5.6854 | -2.7035 | | 72 | \Delta MADRS ~ \Delta VOL_ctx.rh.pericalcarine | 0.6953 | 0.4880 | 5.5519 | -3.0529 | | 73 | \Delta MADRS ~ \Delta VOL_ctx.rh.postcentral | -0.8104 | 0.4190 | 5.6535 | -2.7233 | | 74 | \Delta MADRS ~ \Delta VOL_ctx.rh.posteriorcingulate | 0.2733 | 0.7850 | 5.3170 | -2.9835 | | 75 | \Delta MADRS ~ \Delta VOL_ctx.rh.precentral | -0.5814 | 0.5619 | 5.6124 | -2.7227 | | 76 | \Delta MADRS ~ \Delta VOL_ctx.rh.precuneus | 0.9170 | 0.3607 | 5.2108 | -3.0999 | | 77 | \Delta MADRS ~ \Delta VOL_ctx.rh.rostralanteriorcingulate | -0.2783 | 0.7812 | 5.5346 | -2.8761 | | 78 | \Delta MADRS ~ \Delta VOL_ctx.rh.rostralmiddlefrontal | -1.9601 | 0.0519 | 5.7845 | -2.6038 | | 79 | \Delta MADRS ~ \Delta VOL_ctx.rh.superiorfrontal | -0.5633 | 0.5741 | 5.5987 | -2.7686 | | 80 | \Delta MADRS ~ \Delta VOL_ctx.rh.superiorparietal | -0.0981 | 0.9220 | 5.5139 | -2.9201 | | 81 | \Delta MADRS ~ \Delta VOL_ctx.rh.superiortemporal | 0.2295 | 0.8188 | 5.2989 | -2.8918 | | 82 | \Delta MADRS ~ \Delta VOL_ctx.rh.supramarginal | 0.5443 | 0.5871 | 5.0334 | -3.0211 | | 83 | \Delta MADRS ~ \Delta VOL_ctx.rh.frontalpole | -0.6669 | 0.5059 | 5.6124 | -2.8353 | | 84 | \Delta MADRS ~ \Delta VOL_ctx.rh.temporalpole | -0.1912 | 0.8486 | 5.5429 | -2.7693 | | 85 | \Delta MADRS ~ \Delta VOL_ctx.rh.transversetemporal | 1.1493 | 0.2523 | 5.0365 | -3.1736 | ** Supplementary Table 6-without site :noexport: #+BEGIN_SRC R :results output raw :exports results library(ascii) library(stringr) mt<-read.csv('/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/N156_dMADRS-EF+Age+ECTnum.csv')[,c(2:5,7)] mt$roi<-str_replace(mt$roi,'EF','\\\\Delta MADRS ~ EF') colnames(mt)[c(2:5)]<-c('t_EF','p_EF','t_Age','t_ECTnum') mt.asc<-ascii(mt, colnames=colnames(mt),digits=4, caption="The relationship clinical response and EF across individuals (\\Delta MADRS ~ EF + Age + ECTnum)") print(mt.asc,type="org") #+END_SRC #+RESULTS: #+CAPTION: The relationship clinical response and EF across individuals ( \Delta MADRS ~ EF + Age + ECTnum) | | roi | t_EF | p_EF | t_Age | t_ECTnum | |----+---------------------------------------------------+---------+--------+--------+----------| | 1 | \Delta MADRS ~ EF_Left.Cerebellum.Cortex | 1.0729 | 0.2850 | 5.5852 | -3.0251 | | 2 | \Delta MADRS ~ EF_Left.Thalamus.Proper | 0.6484 | 0.5177 | 5.7915 | -3.0335 | | 3 | \Delta MADRS ~ EF_Left.Caudate | 0.2465 | 0.8056 | 5.5950 | -2.9996 | | 4 | \Delta MADRS ~ EF_Left.Putamen | 0.6476 | 0.5182 | 5.7118 | -3.0296 | | 5 | \Delta MADRS ~ EF_Left.Pallidum | 0.9034 | 0.3678 | 5.8375 | -3.0492 | | 6 | \Delta MADRS ~ EF_Brain.Stem | 0.6785 | 0.4985 | 5.7291 | -2.9881 | | 7 | \Delta MADRS ~ EF_Left.Hippocampus | 0.9586 | 0.3393 | 5.8164 | -2.9869 | | 8 | \Delta MADRS ~ EF_Left.Amygdala | 0.8356 | 0.4047 | 5.8187 | -2.9965 | | 9 | \Delta MADRS ~ EF_Left.Accumbens.area | 0.8397 | 0.4024 | 5.7151 | -3.0606 | | 10 | \Delta MADRS ~ EF_Left.VentralDC | 0.5836 | 0.5603 | 5.7794 | -2.9930 | | 11 | \Delta MADRS ~ EF_Right.Cerebellum.Cortex | 0.7419 | 0.4593 | 5.6385 | -3.0142 | | 12 | \Delta MADRS ~ EF_Right.Thalamus.Proper | 0.3664 | 0.7146 | 5.6664 | -3.0061 | | 13 | \Delta MADRS ~ EF_Right.Caudate | 0.4501 | 0.6533 | 5.4892 | -2.9882 | | 14 | \Delta MADRS ~ EF_Right.Putamen | 0.3775 | 0.7063 | 5.6330 | -2.9785 | | 15 | \Delta MADRS ~ EF_Right.Pallidum | 0.2980 | 0.7661 | 5.6591 | -2.9947 | | 16 | \Delta MADRS ~ EF_Right.Hippocampus | 0.4067 | 0.6848 | 5.4613 | -2.9633 | | 17 | \Delta MADRS ~ EF_Right.Amygdala | 0.2329 | 0.8162 | 5.5963 | -2.9639 | | 18 | \Delta MADRS ~ EF_Right.Accumbens.area | 0.1935 | 0.8468 | 5.2760 | -2.9919 | | 19 | \Delta MADRS ~ EF_Right.VentralDC | 0.3970 | 0.6919 | 5.6119 | -2.9872 | | 20 | \Delta MADRS ~ EF_ctx.lh.bankssts | 0.7720 | 0.4413 | 5.7797 | -3.0017 | | 21 | \Delta MADRS ~ EF_ctx.lh.caudalanteriorcingulate | 0.7321 | 0.4652 | 5.7306 | -3.0369 | | 22 | \Delta MADRS ~ EF_ctx.lh.caudalmiddlefrontal | 1.6230 | 0.1067 | 5.8155 | -3.1217 | | 23 | \Delta MADRS ~ EF_ctx.lh.cuneus | 1.0493 | 0.2957 | 5.7715 | -3.0233 | | 24 | \Delta MADRS ~ EF_ctx.lh.entorhinal | 0.7417 | 0.4594 | 5.4240 | -3.0486 | | 25 | \Delta MADRS ~ EF_ctx.lh.fusiform | 0.6001 | 0.5493 | 5.5530 | -3.0177 | | 26 | \Delta MADRS ~ EF_ctx.lh.inferiorparietal | 1.2025 | 0.2310 | 5.7973 | -3.0616 | | 27 | \Delta MADRS ~ EF_ctx.lh.inferiortemporal | 0.5688 | 0.5703 | 5.7855 | -3.0102 | | 28 | \Delta MADRS ~ EF_ctx.lh.isthmuscingulate | 1.1930 | 0.2347 | 5.7288 | -3.0257 | | 29 | \Delta MADRS ~ EF_ctx.lh.lateraloccipital | 0.6223 | 0.5347 | 5.7496 | -3.0184 | | 30 | \Delta MADRS ~ EF_ctx.lh.lateralorbitofrontal | 1.1319 | 0.2594 | 5.8352 | -3.0111 | | 31 | \Delta MADRS ~ EF_ctx.lh.lingual | -0.1113 | 0.9115 | 5.6612 | -2.9889 | | 32 | \Delta MADRS ~ EF_ctx.lh.medialorbitofrontal | 1.0558 | 0.2928 | 5.6124 | -2.9627 | | 33 | \Delta MADRS ~ EF_ctx.lh.middletemporal | 1.1909 | 0.2355 | 5.8796 | -3.0608 | | 34 | \Delta MADRS ~ EF_ctx.lh.parahippocampal | 0.8290 | 0.4084 | 5.4999 | -3.0089 | | 35 | \Delta MADRS ~ EF_ctx.lh.paracentral | 1.4369 | 0.1528 | 5.6396 | -3.0939 | | 36 | \Delta MADRS ~ EF_ctx.lh.parsopercularis | 0.7525 | 0.4529 | 5.8115 | -3.0192 | | 37 | \Delta MADRS ~ EF_ctx.lh.parsorbitalis | -0.1052 | 0.9163 | 5.3577 | -2.9898 | | 38 | \Delta MADRS ~ EF_ctx.lh.parstriangularis | 0.5548 | 0.5798 | 5.7534 | -3.0134 | | 39 | \Delta MADRS ~ EF_ctx.lh.pericalcarine | -0.1934 | 0.8469 | 5.7530 | -2.9951 | | 40 | \Delta MADRS ~ EF_ctx.lh.postcentral | 1.4783 | 0.1414 | 5.6536 | -3.0672 | | 41 | \Delta MADRS ~ EF_ctx.lh.posteriorcingulate | 1.5740 | 0.1176 | 5.1223 | -3.0018 | | 42 | \Delta MADRS ~ EF_ctx.lh.precentral | 1.3073 | 0.1931 | 5.7384 | -3.0825 | | 43 | \Delta MADRS ~ EF_ctx.lh.precuneus | 1.4822 | 0.1403 | 5.7691 | -3.0507 | | 44 | \Delta MADRS ~ EF_ctx.lh.rostralanteriorcingulate | 0.6225 | 0.5346 | 5.7910 | -3.0211 | | 45 | \Delta MADRS ~ EF_ctx.lh.rostralmiddlefrontal | 0.8971 | 0.3711 | 5.8320 | -3.0199 | | 46 | \Delta MADRS ~ EF_ctx.lh.superiorfrontal | 1.5729 | 0.1178 | 5.8125 | -3.1158 | | 47 | \Delta MADRS ~ EF_ctx.lh.superiorparietal | 1.7453 | 0.0830 | 5.5964 | -3.1344 | | 48 | \Delta MADRS ~ EF_ctx.lh.superiortemporal | 1.1149 | 0.2666 | 5.8816 | -3.0631 | | 49 | \Delta MADRS ~ EF_ctx.lh.supramarginal | 0.8554 | 0.3937 | 5.8192 | -3.0263 | | 50 | \Delta MADRS ~ EF_ctx.lh.frontalpole | 1.5741 | 0.1175 | 5.9783 | -2.9716 | | 51 | \Delta MADRS ~ EF_ctx.lh.temporalpole | -0.0541 | 0.9570 | 5.7171 | -2.9690 | | 52 | \Delta MADRS ~ EF_ctx.lh.transversetemporal | 0.8746 | 0.3831 | 5.7225 | -3.0105 | | 53 | \Delta MADRS ~ EF_ctx.rh.bankssts | 0.0358 | 0.9715 | 5.7456 | -2.9767 | | 54 | \Delta MADRS ~ EF_ctx.rh.caudalanteriorcingulate | 1.1546 | 0.2501 | 5.6791 | -3.0717 | | 55 | \Delta MADRS ~ EF_ctx.rh.caudalmiddlefrontal | 0.7365 | 0.4626 | 5.4944 | -2.9996 | | 56 | \Delta MADRS ~ EF_ctx.rh.cuneus | 0.9656 | 0.3358 | 5.7107 | -2.9951 | | 57 | \Delta MADRS ~ EF_ctx.rh.entorhinal | 0.1481 | 0.8824 | 5.3220 | -2.9840 | | 58 | \Delta MADRS ~ EF_ctx.rh.fusiform | -0.1324 | 0.8949 | 5.5497 | -2.9913 | | 59 | \Delta MADRS ~ EF_ctx.rh.inferiorparietal | 0.2125 | 0.8320 | 5.7156 | -2.9832 | | 60 | \Delta MADRS ~ EF_ctx.rh.inferiortemporal | -0.1287 | 0.8978 | 5.7122 | -2.9925 | | 61 | \Delta MADRS ~ EF_ctx.rh.isthmuscingulate | 1.0125 | 0.3129 | 5.7276 | -3.0182 | | 62 | \Delta MADRS ~ EF_ctx.rh.lateraloccipital | 1.1869 | 0.2371 | 5.6885 | -2.9804 | | 63 | \Delta MADRS ~ EF_ctx.rh.lateralorbitofrontal | -0.0720 | 0.9427 | 5.6659 | -2.9819 | | 64 | \Delta MADRS ~ EF_ctx.rh.lingual | 0.2481 | 0.8044 | 5.6854 | -2.9924 | | 65 | \Delta MADRS ~ EF_ctx.rh.medialorbitofrontal | 0.7507 | 0.4540 | 5.2981 | -2.9262 | | 66 | \Delta MADRS ~ EF_ctx.rh.middletemporal | -0.4185 | 0.6762 | 5.7628 | -3.0011 | | 67 | \Delta MADRS ~ EF_ctx.rh.parahippocampal | -0.3274 | 0.7438 | 5.6426 | -2.9710 | | 68 | \Delta MADRS ~ EF_ctx.rh.paracentral | 1.3671 | 0.1736 | 5.3945 | -3.0419 | | 69 | \Delta MADRS ~ EF_ctx.rh.parsopercularis | 0.0922 | 0.9266 | 5.6926 | -2.9814 | | 70 | \Delta MADRS ~ EF_ctx.rh.parsorbitalis | -1.6612 | 0.0987 | 4.6306 | -3.3107 | | 71 | \Delta MADRS ~ EF_ctx.rh.parstriangularis | -0.0758 | 0.9396 | 5.7513 | -2.9906 | | 72 | \Delta MADRS ~ EF_ctx.rh.pericalcarine | 0.7413 | 0.4596 | 5.7712 | -2.9733 | | 73 | \Delta MADRS ~ EF_ctx.rh.postcentral | 0.7071 | 0.4806 | 5.4197 | -3.0031 | | 74 | \Delta MADRS ~ EF_ctx.rh.posteriorcingulate | 1.6772 | 0.0956 | 5.1599 | -2.9853 | | 75 | \Delta MADRS ~ EF_ctx.rh.precentral | 0.2024 | 0.8398 | 5.5333 | -2.9932 | | 76 | \Delta MADRS ~ EF_ctx.rh.precuneus | 1.2978 | 0.1963 | 5.6428 | -3.0119 | | 77 | \Delta MADRS ~ EF_ctx.rh.rostralanteriorcingulate | 0.6457 | 0.5195 | 5.7952 | -2.9757 | | 78 | \Delta MADRS ~ EF_ctx.rh.rostralmiddlefrontal | 0.0908 | 0.9278 | 5.7433 | -2.9877 | | 79 | \Delta MADRS ~ EF_ctx.rh.superiorfrontal | 1.3369 | 0.1833 | 5.5063 | -3.1044 | | 80 | \Delta MADRS ~ EF_ctx.rh.superiorparietal | 0.9599 | 0.3386 | 5.4972 | -3.0002 | | 81 | \Delta MADRS ~ EF_ctx.rh.superiortemporal | 0.2291 | 0.8191 | 5.6132 | -2.9802 | | 82 | \Delta MADRS ~ EF_ctx.rh.supramarginal | 0.2104 | 0.8337 | 5.6825 | -2.9834 | | 83 | \Delta MADRS ~ EF_ctx.rh.frontalpole | 1.6092 | 0.1096 | 5.6976 | -2.9869 | | 84 | \Delta MADRS ~ EF_ctx.rh.temporalpole | -0.4614 | 0.6451 | 5.7726 | -3.0123 | | 85 | \Delta MADRS ~ EF_ctx.rh.transversetemporal | 0.4311 | 0.6670 | 5.7279 | -2.9418 | | | | | | | | ** Supplementary Table 4-classic :noexport: #+BEGIN_SRC R :results output raw :exports results library(ascii) library(stringr) mt<-read.csv('/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/N151_dVol-EF+Age+ECTnum+Site_FDRcorrect.csv')[,c(2:5,7,9)] mt$roi<-str_replace(mt$roi,'EF','\\\\Delta VOL') colnames(mt)[6]<-'BH^EF_FDR' mt.asc<-ascii(mt, colnames=colnames(mt),digits=4, caption="The relationship between volume changes and EF across individuals (EF ~ \\Delta Vol + Age + ECTnum)") print(mt.asc,type="org") #+END_SRC #+RESULTS: #+CAPTION: The relationship between volume changes and EF across individuals (\Delta Vol ~ EF + Age + ECTnum + Site) | | roi | t_EF | p_EF | t_Age | t_ECTnum | BH^EF_FDR | |----+--------------------------------------------+---------+--------+---------+----------+-----------| | 1 | \Delta VOL_Left.Cerebellum.Cortex | -0.7077 | 0.4803 | -0.8606 | 1.9517 | 0.6635 | | 2 | \Delta VOL_Left.Thalamus.Proper | -0.0482 | 0.9616 | -0.9813 | 2.9489 | 0.9901 | | 3 | \Delta VOL_Left.Caudate | 0.5360 | 0.5928 | -1.2656 | 2.5623 | 0.7413 | | 4 | \Delta VOL_Left.Putamen | 0.5448 | 0.5867 | -0.6440 | 1.1996 | 0.7413 | | 5 | \Delta VOL_Left.Pallidum | 0.0240 | 0.9809 | -0.2801 | 1.3564 | 0.9901 | | 6 | \Delta VOL_Brain.Stem | 1.1193 | 0.2649 | 0.7287 | 1.3294 | 0.5028 | | 7 | \Delta VOL_Left.Hippocampus | 4.2691 | 0.0000 | -2.5224 | 3.1914 | 0.0031 | | 8 | \Delta VOL_Left.Amygdala | 3.8842 | 0.0002 | -1.5712 | 2.1318 | 0.0067 | | 9 | \Delta VOL_Left.Accumbens.area | 1.6782 | 0.0955 | -2.9473 | 1.8286 | 0.3284 | | 10 | \Delta VOL_Left.VentralDC | 0.1894 | 0.8501 | -0.4260 | 2.3792 | 0.9146 | | 11 | \Delta VOL_Right.Cerebellum.Cortex | -0.9420 | 0.3478 | -0.7401 | 1.4021 | 0.5686 | | 12 | \Delta VOL_Right.Thalamus.Proper | 0.5230 | 0.6018 | -0.0407 | 4.3008 | 0.7413 | | 13 | \Delta VOL_Right.Caudate | 1.1512 | 0.2516 | 0.4839 | 1.4988 | 0.5028 | | 14 | \Delta VOL_Right.Putamen | 1.0244 | 0.3074 | -0.6953 | 1.4664 | 0.5410 | | 15 | \Delta VOL_Right.Pallidum | 0.4756 | 0.6351 | 0.0747 | 2.9584 | 0.7711 | | 16 | \Delta VOL_Right.Hippocampus | 1.3008 | 0.1955 | -1.4707 | 3.3075 | 0.4617 | | 17 | \Delta VOL_Right.Amygdala | 2.7926 | 0.0060 | -1.0910 | 4.2600 | 0.0562 | | 18 | \Delta VOL_Right.Accumbens.area | 1.6358 | 0.1041 | -1.2504 | 3.3451 | 0.3404 | | 19 | \Delta VOL_Right.VentralDC | 0.4550 | 0.6498 | 0.3636 | 0.8634 | 0.7779 | | 20 | \Delta VOL_ctx.lh.bankssts | 1.1025 | 0.2721 | -1.0035 | 2.6363 | 0.5028 | | 21 | \Delta VOL_ctx.lh.caudalanteriorcingulate | 1.3452 | 0.1807 | -1.8649 | 2.3493 | 0.4518 | | 22 | \Delta VOL_ctx.lh.caudalmiddlefrontal | -1.9393 | 0.0545 | -1.0865 | 2.0847 | 0.2251 | | 23 | \Delta VOL_ctx.lh.cuneus | 0.8976 | 0.3709 | -0.7227 | 2.0824 | 0.5769 | | 24 | \Delta VOL_ctx.lh.entorhinal | 3.0111 | 0.0031 | -0.4146 | 0.9977 | 0.0404 | | 25 | \Delta VOL_ctx.lh.fusiform | 2.9742 | 0.0035 | -0.6510 | 2.1491 | 0.0404 | | 26 | \Delta VOL_ctx.lh.inferiorparietal | 1.5027 | 0.1352 | 0.3126 | 2.3680 | 0.3829 | | 27 | \Delta VOL_ctx.lh.inferiortemporal | 2.6533 | 0.0089 | 0.0577 | 1.9325 | 0.0629 | | 28 | \Delta VOL_ctx.lh.isthmuscingulate | -0.5276 | 0.5986 | -1.0431 | 2.9988 | 0.7413 | | 29 | \Delta VOL_ctx.lh.lateraloccipital | 1.0108 | 0.3138 | -0.5696 | 1.4052 | 0.5410 | | 30 | \Delta VOL_ctx.lh.lateralorbitofrontal | 1.1216 | 0.2639 | -0.7869 | 1.8807 | 0.5028 | | 31 | \Delta VOL_ctx.lh.lingual | -0.2389 | 0.8115 | -1.1174 | 2.5914 | 0.8920 | | 32 | \Delta VOL_ctx.lh.medialorbitofrontal | 1.2416 | 0.2165 | -0.7330 | 1.7153 | 0.4876 | | 33 | \Delta VOL_ctx.lh.middletemporal | 1.9300 | 0.0556 | -0.9504 | 2.2897 | 0.2251 | | 34 | \Delta VOL_ctx.lh.parahippocampal | 1.0017 | 0.3182 | -1.0607 | 2.8588 | 0.5410 | | 35 | \Delta VOL_ctx.lh.paracentral | -2.0256 | 0.0447 | -0.2084 | 4.0846 | 0.1999 | | 36 | \Delta VOL_ctx.lh.parsopercularis | -0.6296 | 0.5300 | -1.5330 | 2.0540 | 0.7039 | | 37 | \Delta VOL_ctx.lh.parsorbitalis | 0.8684 | 0.3867 | -2.0409 | 1.2607 | 0.5769 | | 38 | \Delta VOL_ctx.lh.parstriangularis | 0.8792 | 0.3808 | -1.8880 | 2.9707 | 0.5769 | | 39 | \Delta VOL_ctx.lh.pericalcarine | 0.2824 | 0.7781 | -0.6554 | 2.0973 | 0.8705 | | 40 | \Delta VOL_ctx.lh.postcentral | 0.7540 | 0.4521 | -2.0106 | 2.4845 | 0.6441 | | 41 | \Delta VOL_ctx.lh.posteriorcingulate | -0.8680 | 0.3869 | -1.3788 | 3.4481 | 0.5769 | | 42 | \Delta VOL_ctx.lh.precentral | -0.5529 | 0.5812 | -1.7390 | 2.6143 | 0.7413 | | 43 | \Delta VOL_ctx.lh.precuneus | -1.5318 | 0.1278 | -0.8444 | 3.7619 | 0.3746 | | 44 | \Delta VOL_ctx.lh.rostralanteriorcingulate | 1.1861 | 0.2376 | -1.7461 | 1.0218 | 0.5028 | | 45 | \Delta VOL_ctx.lh.rostralmiddlefrontal | -0.7018 | 0.4839 | -2.1366 | 1.2991 | 0.6635 | | 46 | \Delta VOL_ctx.lh.superiorfrontal | -1.1124 | 0.2679 | -1.2162 | 2.3706 | 0.5028 | | 47 | \Delta VOL_ctx.lh.superiorparietal | -1.6728 | 0.0966 | 0.0639 | 3.4273 | 0.3284 | | 48 | \Delta VOL_ctx.lh.superiortemporal | 2.1407 | 0.0340 | -2.5610 | 1.7311 | 0.1701 | | 49 | \Delta VOL_ctx.lh.supramarginal | 0.6435 | 0.5209 | -0.7216 | 2.1650 | 0.7029 | | 50 | \Delta VOL_ctx.lh.frontalpole | -0.0377 | 0.9700 | -1.3964 | 0.5703 | 0.9901 | | 51 | \Delta VOL_ctx.lh.temporalpole | 2.0261 | 0.0446 | -0.7673 | 1.2379 | 0.1999 | | 52 | \Delta VOL_ctx.lh.transversetemporal | 0.2299 | 0.8185 | -1.5907 | 2.0586 | 0.8920 | | 53 | \Delta VOL_ctx.rh.bankssts | 0.0124 | 0.9901 | 1.5361 | 3.1792 | 0.9901 | | 54 | \Delta VOL_ctx.rh.caudalanteriorcingulate | -1.5670 | 0.1194 | 0.5990 | 2.4298 | 0.3746 | | 55 | \Delta VOL_ctx.rh.caudalmiddlefrontal | -3.1057 | 0.0023 | 0.6166 | 2.9498 | 0.0404 | | 56 | \Delta VOL_ctx.rh.cuneus | -0.0792 | 0.9370 | -1.7783 | 2.5751 | 0.9880 | | 57 | \Delta VOL_ctx.rh.entorhinal | 1.1198 | 0.2647 | 0.9036 | 2.0935 | 0.5028 | | 58 | \Delta VOL_ctx.rh.fusiform | 1.4742 | 0.1427 | 0.3326 | 4.8662 | 0.3912 | | 59 | \Delta VOL_ctx.rh.inferiorparietal | -2.9427 | 0.0038 | 1.0381 | 0.9701 | 0.0404 | | 60 | \Delta VOL_ctx.rh.inferiortemporal | 0.8291 | 0.4084 | 1.2971 | 3.5573 | 0.5986 | | 61 | \Delta VOL_ctx.rh.isthmuscingulate | 0.0735 | 0.9415 | 0.0088 | 1.1998 | 0.9880 | | 62 | \Delta VOL_ctx.rh.lateraloccipital | 0.9594 | 0.3390 | -0.4039 | 1.8600 | 0.5650 | | 63 | \Delta VOL_ctx.rh.lateralorbitofrontal | 0.2931 | 0.7699 | -0.3566 | 2.6316 | 0.8705 | | 64 | \Delta VOL_ctx.rh.lingual | -0.2821 | 0.7783 | -2.5305 | 3.6953 | 0.8705 | | 65 | \Delta VOL_ctx.rh.medialorbitofrontal | 0.4189 | 0.6759 | 0.7129 | 2.1749 | 0.7980 | | 66 | \Delta VOL_ctx.rh.middletemporal | -0.9236 | 0.3573 | 1.4818 | 3.9421 | 0.5730 | | 67 | \Delta VOL_ctx.rh.parahippocampal | 1.2374 | 0.2180 | -0.0103 | 3.1028 | 0.4876 | | 68 | \Delta VOL_ctx.rh.paracentral | -3.5214 | 0.0006 | 1.2896 | 2.3747 | 0.0164 | | 69 | \Delta VOL_ctx.rh.parsopercularis | -2.3008 | 0.0229 | 1.4839 | 3.0822 | 0.1296 | | 70 | \Delta VOL_ctx.rh.parsorbitalis | 1.1180 | 0.2655 | -0.5014 | 2.1083 | 0.5028 | | 71 | \Delta VOL_ctx.rh.parstriangularis | -1.4002 | 0.1636 | 0.1202 | 2.8436 | 0.4215 | | 72 | \Delta VOL_ctx.rh.pericalcarine | 1.3230 | 0.1880 | -0.9155 | 2.3399 | 0.4565 | | 73 | \Delta VOL_ctx.rh.postcentral | -1.8932 | 0.0604 | 0.7199 | 3.3344 | 0.2333 | | 74 | \Delta VOL_ctx.rh.posteriorcingulate | -1.5384 | 0.1262 | 0.6708 | 1.7477 | 0.3746 | | 75 | \Delta VOL_ctx.rh.precentral | -2.5415 | 0.0121 | 0.0520 | 3.9487 | 0.0743 | | 76 | \Delta VOL_ctx.rh.precuneus | -1.8647 | 0.0643 | -0.6056 | 2.7407 | 0.2376 | | 77 | \Delta VOL_ctx.rh.rostralanteriorcingulate | 2.1630 | 0.0322 | 0.3800 | 2.5260 | 0.1701 | | 78 | \Delta VOL_ctx.rh.rostralmiddlefrontal | -2.6584 | 0.0088 | -0.0802 | 2.2835 | 0.0629 | | 79 | \Delta VOL_ctx.rh.superiorfrontal | -3.0466 | 0.0028 | 0.2680 | 3.4240 | 0.0404 | | 80 | \Delta VOL_ctx.rh.superiorparietal | -2.7514 | 0.0067 | -0.0851 | 2.3533 | 0.0571 | | 81 | \Delta VOL_ctx.rh.superiortemporal | 0.3809 | 0.7038 | 0.7922 | 4.5852 | 0.8195 | | 82 | \Delta VOL_ctx.rh.supramarginal | -2.5378 | 0.0122 | 1.8745 | 3.2292 | 0.0743 | | 83 | \Delta VOL_ctx.rh.frontalpole | 1.4509 | 0.1490 | -1.0257 | 2.0228 | 0.3959 | | 84 | \Delta VOL_ctx.rh.temporalpole | 0.7497 | 0.4547 | -0.3936 | 3.6825 | 0.6441 | | 85 | \Delta VOL_ctx.rh.transversetemporal | 1.0726 | 0.2853 | -0.0468 | 3.4598 | 0.5159 | | | | | | | | | ** Supplementary Table 5-classic :noexport: #+BEGIN_SRC R :results output raw :exports results library(ascii) library(stringr) mt<-read.csv('/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/N156_dMADRSperc-dVol+Age+ECTnum+Site.csv')[,c(2:5,7)] mt$roi<-str_replace(mt$roi,'EF','\\\\Delta MADRS ~ \\\\Delta VOL') colnames(mt)[c(2:5)]<-c('t_VOL','p_VOL','t_Age','t_ECTnum') mt.asc<-ascii(mt, colnames=colnames(mt),digits=4, caption="The relationship clinical response and volume changes across individuals (\\Delta MADRS ~ \\Delta Vol + Age + ECTnum + Site)") print(mt.asc,type="org") #+END_SRC #+RESULTS: #+CAPTION: The relationship clinical response and volume changes across individuals (\Delta MADRS ~ \Delta Vol + Age + ECTnum + Site) | | roi | t_VOL | p_VOL | t_Age | t_ECTnum | |----+-----------------------------------------------------------+---------+--------+--------+----------| | 1 | \Delta MADRS ~ \Delta VOL_Left.Cerebellum.Cortex | -0.8159 | 0.4159 | 2.4970 | -2.7965 | | 2 | \Delta MADRS ~ \Delta VOL_Left.Thalamus.Proper | 0.3803 | 0.7043 | 2.5724 | -2.9688 | | 3 | \Delta MADRS ~ \Delta VOL_Left.Caudate | -1.2435 | 0.2157 | 2.3922 | -2.6542 | | 4 | \Delta MADRS ~ \Delta VOL_Left.Putamen | 0.0762 | 0.9394 | 2.5478 | -2.9562 | | 5 | \Delta MADRS ~ \Delta VOL_Left.Pallidum | -0.5278 | 0.5985 | 2.5374 | -2.8869 | | 6 | \Delta MADRS ~ \Delta VOL_Brain.Stem | 0.3179 | 0.7510 | 2.5300 | -2.9811 | | 7 | \Delta MADRS ~ \Delta VOL_Left.Hippocampus | 0.0438 | 0.9651 | 2.4872 | -2.7122 | | 8 | \Delta MADRS ~ \Delta VOL_Left.Amygdala | -0.4254 | 0.6712 | 2.4191 | -2.8678 | | 9 | \Delta MADRS ~ \Delta VOL_Left.Accumbens.area | -1.2584 | 0.2103 | 2.1589 | -2.7525 | | 10 | \Delta MADRS ~ \Delta VOL_Left.VentralDC | -0.2899 | 0.7723 | 2.5358 | -2.8498 | | 11 | \Delta MADRS ~ \Delta VOL_Right.Cerebellum.Cortex | 0.1157 | 0.9081 | 2.5511 | -2.9561 | | 12 | \Delta MADRS ~ \Delta VOL_Right.Thalamus.Proper | 1.6058 | 0.1105 | 2.5791 | -3.3579 | | 13 | \Delta MADRS ~ \Delta VOL_Right.Caudate | -0.1530 | 0.8787 | 2.5529 | -2.9223 | | 14 | \Delta MADRS ~ \Delta VOL_Right.Putamen | -1.4137 | 0.1597 | 2.4802 | -2.7971 | | 15 | \Delta MADRS ~ \Delta VOL_Right.Pallidum | -0.2001 | 0.8417 | 2.5500 | -2.8283 | | 16 | \Delta MADRS ~ \Delta VOL_Right.Hippocampus | -0.8698 | 0.3859 | 2.4519 | -2.4505 | | 17 | \Delta MADRS ~ \Delta VOL_Right.Amygdala | 1.1161 | 0.2663 | 2.6417 | -3.1749 | | 18 | \Delta MADRS ~ \Delta VOL_Right.Accumbens.area | -0.4149 | 0.6789 | 2.5065 | -2.7461 | | 19 | \Delta MADRS ~ \Delta VOL_Right.VentralDC | -0.3803 | 0.7043 | 2.5596 | -2.9306 | | 20 | \Delta MADRS ~ \Delta VOL_ctx.lh.bankssts | -1.3143 | 0.1909 | 2.4005 | -2.6384 | | 21 | \Delta MADRS ~ \Delta VOL_ctx.lh.caudalanteriorcingulate | 0.6706 | 0.5036 | 2.6238 | -3.0414 | | 22 | \Delta MADRS ~ \Delta VOL_ctx.lh.caudalmiddlefrontal | -0.5397 | 0.5903 | 2.4958 | -2.8214 | | 23 | \Delta MADRS ~ \Delta VOL_ctx.lh.cuneus | 0.5126 | 0.6090 | 2.5799 | -3.0098 | | 24 | \Delta MADRS ~ \Delta VOL_ctx.lh.entorhinal | 0.0747 | 0.9405 | 2.5494 | -2.9577 | | 25 | \Delta MADRS ~ \Delta VOL_ctx.lh.fusiform | 1.2700 | 0.2062 | 2.6364 | -3.1500 | | 26 | \Delta MADRS ~ \Delta VOL_ctx.lh.inferiorparietal | -0.4188 | 0.6760 | 2.5568 | -2.8352 | | 27 | \Delta MADRS ~ \Delta VOL_ctx.lh.inferiortemporal | -0.1482 | 0.8824 | 2.5446 | -2.9097 | | 28 | \Delta MADRS ~ \Delta VOL_ctx.lh.isthmuscingulate | 0.0668 | 0.9469 | 2.5454 | -2.8863 | | 29 | \Delta MADRS ~ \Delta VOL_ctx.lh.lateraloccipital | 0.2522 | 0.8012 | 2.5595 | -2.9732 | | 30 | \Delta MADRS ~ \Delta VOL_ctx.lh.lateralorbitofrontal | -0.3648 | 0.7158 | 2.5145 | -2.8766 | | 31 | \Delta MADRS ~ \Delta VOL_ctx.lh.lingual | 0.9774 | 0.3300 | 2.6374 | -3.1140 | | 32 | \Delta MADRS ~ \Delta VOL_ctx.lh.medialorbitofrontal | -0.1897 | 0.8498 | 2.5328 | -2.9130 | | 33 | \Delta MADRS ~ \Delta VOL_ctx.lh.middletemporal | -1.2869 | 0.2002 | 2.3992 | -2.7005 | | 34 | \Delta MADRS ~ \Delta VOL_ctx.lh.parahippocampal | 1.1467 | 0.2534 | 2.6544 | -3.1609 | | 35 | \Delta MADRS ~ \Delta VOL_ctx.lh.paracentral | 0.0138 | 0.9890 | 2.5474 | -2.8063 | | 36 | \Delta MADRS ~ \Delta VOL_ctx.lh.parsopercularis | -0.7951 | 0.4279 | 2.4369 | -2.7884 | | 37 | \Delta MADRS ~ \Delta VOL_ctx.lh.parsorbitalis | -1.2866 | 0.2004 | 2.2743 | -2.8337 | | 38 | \Delta MADRS ~ \Delta VOL_ctx.lh.parstriangularis | -1.5848 | 0.1152 | 2.2654 | -2.5210 | | 39 | \Delta MADRS ~ \Delta VOL_ctx.lh.pericalcarine | 0.8398 | 0.4025 | 2.5998 | -3.0708 | | 40 | \Delta MADRS ~ \Delta VOL_ctx.lh.postcentral | -1.4048 | 0.1623 | 2.3034 | -2.6409 | | 41 | \Delta MADRS ~ \Delta VOL_ctx.lh.posteriorcingulate | 0.1186 | 0.9058 | 2.5425 | -2.8750 | | 42 | \Delta MADRS ~ \Delta VOL_ctx.lh.precentral | -0.4508 | 0.6528 | 2.4572 | -2.7958 | | 43 | \Delta MADRS ~ \Delta VOL_ctx.lh.precuneus | 0.0981 | 0.9220 | 2.5495 | -2.8463 | | 44 | \Delta MADRS ~ \Delta VOL_ctx.lh.rostralanteriorcingulate | -0.2813 | 0.7789 | 2.4718 | -2.9327 | | 45 | \Delta MADRS ~ \Delta VOL_ctx.lh.rostralmiddlefrontal | -2.3505 | 0.0201 | 2.1591 | -2.7368 | | 46 | \Delta MADRS ~ \Delta VOL_ctx.lh.superiorfrontal | -0.5910 | 0.5555 | 2.4791 | -2.7921 | | 47 | \Delta MADRS ~ \Delta VOL_ctx.lh.superiorparietal | -0.3451 | 0.7305 | 2.5493 | -2.7497 | | 48 | \Delta MADRS ~ \Delta VOL_ctx.lh.superiortemporal | -0.9754 | 0.3310 | 2.2232 | -2.8132 | | 49 | \Delta MADRS ~ \Delta VOL_ctx.lh.supramarginal | -0.3053 | 0.7606 | 2.5243 | -2.8646 | | 50 | \Delta MADRS ~ \Delta VOL_ctx.lh.frontalpole | -1.5128 | 0.1326 | 2.3742 | -2.9102 | | 51 | \Delta MADRS ~ \Delta VOL_ctx.lh.temporalpole | -0.5220 | 0.6025 | 2.5121 | -2.8943 | | 52 | \Delta MADRS ~ \Delta VOL_ctx.lh.transversetemporal | -0.0410 | 0.9673 | 2.5153 | -2.9130 | | 53 | \Delta MADRS ~ \Delta VOL_ctx.rh.bankssts | 1.0544 | 0.2935 | 2.4003 | -3.1466 | | 54 | \Delta MADRS ~ \Delta VOL_ctx.rh.caudalanteriorcingulate | -0.0699 | 0.9444 | 2.5484 | -2.8906 | | 55 | \Delta MADRS ~ \Delta VOL_ctx.rh.caudalmiddlefrontal | -1.1173 | 0.2658 | 2.6018 | -2.6252 | | 56 | \Delta MADRS ~ \Delta VOL_ctx.rh.cuneus | 1.6882 | 0.0936 | 2.7956 | -3.2841 | | 57 | \Delta MADRS ~ \Delta VOL_ctx.rh.entorhinal | 0.1265 | 0.8995 | 2.5284 | -2.9416 | | 58 | \Delta MADRS ~ \Delta VOL_ctx.rh.fusiform | 1.8055 | 0.0731 | 2.5182 | -3.4519 | | 59 | \Delta MADRS ~ \Delta VOL_ctx.rh.inferiorparietal | 0.5861 | 0.5588 | 2.4842 | -3.0097 | | 60 | \Delta MADRS ~ \Delta VOL_ctx.rh.inferiortemporal | 1.3803 | 0.1697 | 2.4002 | -3.2533 | | 61 | \Delta MADRS ~ \Delta VOL_ctx.rh.isthmuscingulate | -0.4382 | 0.6619 | 2.5502 | -2.9061 | | 62 | \Delta MADRS ~ \Delta VOL_ctx.rh.lateraloccipital | 0.7895 | 0.4311 | 2.5874 | -3.0540 | | 63 | \Delta MADRS ~ \Delta VOL_ctx.rh.lateralorbitofrontal | -0.2986 | 0.7657 | 2.5398 | -2.8305 | | 64 | \Delta MADRS ~ \Delta VOL_ctx.rh.lingual | 1.1723 | 0.2431 | 2.7481 | -3.1918 | | 65 | \Delta MADRS ~ \Delta VOL_ctx.rh.medialorbitofrontal | -0.8364 | 0.4044 | 2.6014 | -2.7752 | | 66 | \Delta MADRS ~ \Delta VOL_ctx.rh.middletemporal | -0.4179 | 0.6767 | 2.5828 | -2.6866 | | 67 | \Delta MADRS ~ \Delta VOL_ctx.rh.parahippocampal | 0.7784 | 0.4376 | 2.5784 | -3.0472 | | 68 | \Delta MADRS ~ \Delta VOL_ctx.rh.paracentral | -0.2366 | 0.8133 | 2.5589 | -2.8537 | | 69 | \Delta MADRS ~ \Delta VOL_ctx.rh.parsopercularis | -1.3880 | 0.1673 | 2.7090 | -2.5169 | | 70 | \Delta MADRS ~ \Delta VOL_ctx.rh.parsorbitalis | -0.5608 | 0.5758 | 2.5088 | -2.8376 | | 71 | \Delta MADRS ~ \Delta VOL_ctx.rh.parstriangularis | -0.8505 | 0.3965 | 2.5697 | -2.6889 | | 72 | \Delta MADRS ~ \Delta VOL_ctx.rh.pericalcarine | 0.4491 | 0.6541 | 2.5822 | -2.9972 | | 73 | \Delta MADRS ~ \Delta VOL_ctx.rh.postcentral | -0.6832 | 0.4956 | 2.5779 | -2.6697 | | 74 | \Delta MADRS ~ \Delta VOL_ctx.rh.posteriorcingulate | 0.2298 | 0.8185 | 2.5389 | -2.9631 | | 75 | \Delta MADRS ~ \Delta VOL_ctx.rh.precentral | -0.7629 | 0.4468 | 2.5321 | -2.5803 | | 76 | \Delta MADRS ~ \Delta VOL_ctx.rh.precuneus | 0.9296 | 0.3542 | 2.6022 | -3.1080 | | 77 | \Delta MADRS ~ \Delta VOL_ctx.rh.rostralanteriorcingulate | -0.5961 | 0.5521 | 2.5520 | -2.8063 | | 78 | \Delta MADRS ~ \Delta VOL_ctx.rh.rostralmiddlefrontal | -2.0552 | 0.0417 | 2.5896 | -2.5381 | | 79 | \Delta MADRS ~ \Delta VOL_ctx.rh.superiorfrontal | -0.8254 | 0.4105 | 2.5580 | -2.6422 | | 80 | \Delta MADRS ~ \Delta VOL_ctx.rh.superiorparietal | -0.1364 | 0.8917 | 2.5455 | -2.8742 | | 81 | \Delta MADRS ~ \Delta VOL_ctx.rh.superiortemporal | 0.1343 | 0.8934 | 2.5337 | -2.8135 | | 82 | \Delta MADRS ~ \Delta VOL_ctx.rh.supramarginal | 0.4538 | 0.6506 | 2.4526 | -2.9774 | | 83 | \Delta MADRS ~ \Delta VOL_ctx.rh.frontalpole | -0.8419 | 0.4013 | 2.4889 | -2.8006 | | 84 | \Delta MADRS ~ \Delta VOL_ctx.rh.temporalpole | -0.6126 | 0.5411 | 2.5318 | -2.6560 | | 85 | \Delta MADRS ~ \Delta VOL_ctx.rh.transversetemporal | 1.0526 | 0.2943 | 2.5712 | -3.1486 | ** Supplementary Table 6-classic :noexport: #+BEGIN_SRC R :results output raw :exports results library(ascii) library(stringr) mt<-read.csv('/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/N156_dMADRS-EF+Age+ECTnum+Site.csv')[,c(2:5,7)] mt$roi<-str_replace(mt$roi,'EF','\\\\Delta MADRS ~ EF') colnames(mt)[c(2:5)]<-c('t_EF','p_EF','t_Age','t_ECTnum') mt.asc<-ascii(mt, colnames=colnames(mt),digits=4, caption="The relationship clinical response and EF across individuals (\\Delta MADRS ~ EF + Age + ECTnum + Site)") print(mt.asc,type="org") #+END_SRC #+RESULTS: #+CAPTION: The relationship clinical response and EF across individuals (\Delta MADRS ~ EF + Age + ECTnum + Site) | | roi | t_EF | p_EF | t_Age | t_ECTnum | |----+---------------------------------------------------+---------+--------+--------+----------| | 1 | \Delta MADRS ~ EF_Left.Cerebellum.Cortex | 0.5911 | 0.5554 | 2.8958 | -3.0886 | | 2 | \Delta MADRS ~ EF_Left.Thalamus.Proper | 0.7565 | 0.4506 | 2.9212 | -3.0857 | | 3 | \Delta MADRS ~ EF_Left.Caudate | 0.1407 | 0.8883 | 2.7672 | -3.0888 | | 4 | \Delta MADRS ~ EF_Left.Putamen | 0.5994 | 0.5498 | 2.8943 | -3.0858 | | 5 | \Delta MADRS ~ EF_Left.Pallidum | 0.8604 | 0.3910 | 2.9470 | -3.0750 | | 6 | \Delta MADRS ~ EF_Brain.Stem | 0.6489 | 0.5174 | 2.8982 | -3.0561 | | 7 | \Delta MADRS ~ EF_Left.Hippocampus | 0.8988 | 0.3702 | 2.9636 | -3.0342 | | 8 | \Delta MADRS ~ EF_Left.Amygdala | 0.8849 | 0.3776 | 2.9681 | -3.0528 | | 9 | \Delta MADRS ~ EF_Left.Accumbens.area | 0.6629 | 0.5084 | 2.8936 | -3.1124 | | 10 | \Delta MADRS ~ EF_Left.VentralDC | 0.6340 | 0.5271 | 2.9056 | -3.0498 | | 11 | \Delta MADRS ~ EF_Right.Cerebellum.Cortex | 0.3516 | 0.7256 | 2.8562 | -3.0940 | | 12 | \Delta MADRS ~ EF_Right.Thalamus.Proper | 0.6640 | 0.5077 | 2.8529 | -3.0964 | | 13 | \Delta MADRS ~ EF_Right.Caudate | 0.8166 | 0.4155 | 2.7989 | -3.0779 | | 14 | \Delta MADRS ~ EF_Right.Putamen | 0.7897 | 0.4310 | 2.8274 | -3.0525 | | 15 | \Delta MADRS ~ EF_Right.Pallidum | 0.7554 | 0.4512 | 2.8359 | -3.0804 | | 16 | \Delta MADRS ~ EF_Right.Hippocampus | 0.8233 | 0.4117 | 2.8026 | -3.0201 | | 17 | \Delta MADRS ~ EF_Right.Amygdala | 0.5870 | 0.5581 | 2.8061 | -2.9934 | | 18 | \Delta MADRS ~ EF_Right.Accumbens.area | 0.3738 | 0.7091 | 2.7332 | -3.0934 | | 19 | \Delta MADRS ~ EF_Right.VentralDC | 0.4961 | 0.6206 | 2.8569 | -3.0618 | | 20 | \Delta MADRS ~ EF_ctx.lh.bankssts | 0.5426 | 0.5882 | 2.8745 | -3.0649 | | 21 | \Delta MADRS ~ EF_ctx.lh.caudalanteriorcingulate | 0.8541 | 0.3945 | 2.7991 | -3.1019 | | 22 | \Delta MADRS ~ EF_ctx.lh.caudalmiddlefrontal | 1.6153 | 0.1084 | 2.9058 | -3.0231 | | 23 | \Delta MADRS ~ EF_ctx.lh.cuneus | 0.9309 | 0.3534 | 2.9255 | -3.0206 | | 24 | \Delta MADRS ~ EF_ctx.lh.entorhinal | 0.5946 | 0.5530 | 2.8601 | -3.1275 | | 25 | \Delta MADRS ~ EF_ctx.lh.fusiform | 0.2980 | 0.7662 | 2.8459 | -3.0907 | | 26 | \Delta MADRS ~ EF_ctx.lh.inferiorparietal | 1.0851 | 0.2796 | 2.9171 | -3.0239 | | 27 | \Delta MADRS ~ EF_ctx.lh.inferiortemporal | 0.3270 | 0.7441 | 2.8518 | -3.0833 | | 28 | \Delta MADRS ~ EF_ctx.lh.isthmuscingulate | 1.2333 | 0.2195 | 2.9969 | -2.9874 | | 29 | \Delta MADRS ~ EF_ctx.lh.lateraloccipital | 0.4287 | 0.6688 | 2.8674 | -3.0807 | | 30 | \Delta MADRS ~ EF_ctx.lh.lateralorbitofrontal | 0.9777 | 0.3298 | 2.9416 | -3.0362 | | 31 | \Delta MADRS ~ EF_ctx.lh.lingual | -0.3531 | 0.7245 | 2.8298 | -3.1181 | | 32 | \Delta MADRS ~ EF_ctx.lh.medialorbitofrontal | 1.0563 | 0.2926 | 2.8343 | -2.9631 | | 33 | \Delta MADRS ~ EF_ctx.lh.middletemporal | 0.8938 | 0.3729 | 2.9696 | -3.0696 | | 34 | \Delta MADRS ~ EF_ctx.lh.parahippocampal | 0.6632 | 0.5082 | 2.8638 | -3.0749 | | 35 | \Delta MADRS ~ EF_ctx.lh.paracentral | 1.7388 | 0.0842 | 2.6519 | -3.0613 | | 36 | \Delta MADRS ~ EF_ctx.lh.parsopercularis | 0.7013 | 0.4843 | 2.9014 | -3.0782 | | 37 | \Delta MADRS ~ EF_ctx.lh.parsorbitalis | -0.2901 | 0.7722 | 2.6839 | -3.1086 | | 38 | \Delta MADRS ~ EF_ctx.lh.parstriangularis | 0.4616 | 0.6451 | 2.8729 | -3.0903 | | 39 | \Delta MADRS ~ EF_ctx.lh.pericalcarine | -0.3150 | 0.7532 | 2.7475 | -3.1151 | | 40 | \Delta MADRS ~ EF_ctx.lh.postcentral | 1.3784 | 0.1702 | 2.7424 | -3.0058 | | 41 | \Delta MADRS ~ EF_ctx.lh.posteriorcingulate | 1.8737 | 0.0630 | 2.4826 | -2.9605 | | 42 | \Delta MADRS ~ EF_ctx.lh.precentral | 1.2363 | 0.2183 | 2.8101 | -3.0200 | | 43 | \Delta MADRS ~ EF_ctx.lh.precuneus | 1.7816 | 0.0769 | 2.9329 | -2.9294 | | 44 | \Delta MADRS ~ EF_ctx.lh.rostralanteriorcingulate | 0.4875 | 0.6266 | 2.8769 | -3.0625 | | 45 | \Delta MADRS ~ EF_ctx.lh.rostralmiddlefrontal | 0.7272 | 0.4683 | 2.9169 | -3.0548 | | 46 | \Delta MADRS ~ EF_ctx.lh.superiorfrontal | 1.7150 | 0.0885 | 2.8632 | -3.0686 | | 47 | \Delta MADRS ~ EF_ctx.lh.superiorparietal | 1.7681 | 0.0791 | 2.7671 | -3.0394 | | 48 | \Delta MADRS ~ EF_ctx.lh.superiortemporal | 0.9419 | 0.3478 | 2.9896 | -3.0830 | | 49 | \Delta MADRS ~ EF_ctx.lh.supramarginal | 0.8131 | 0.4175 | 2.8963 | -3.0267 | | 50 | \Delta MADRS ~ EF_ctx.lh.frontalpole | 1.7784 | 0.0774 | 3.0466 | -2.9750 | | 51 | \Delta MADRS ~ EF_ctx.lh.temporalpole | -0.4641 | 0.6432 | 2.8275 | -3.0898 | | 52 | \Delta MADRS ~ EF_ctx.lh.transversetemporal | 0.9223 | 0.3579 | 2.9875 | -3.0618 | | 53 | \Delta MADRS ~ EF_ctx.rh.bankssts | 0.1027 | 0.9184 | 2.8195 | -3.0657 | | 54 | \Delta MADRS ~ EF_ctx.rh.caudalanteriorcingulate | 1.1338 | 0.2587 | 2.8861 | -3.1202 | | 55 | \Delta MADRS ~ EF_ctx.rh.caudalmiddlefrontal | 0.8728 | 0.3842 | 2.7763 | -3.0787 | | 56 | \Delta MADRS ~ EF_ctx.rh.cuneus | 0.9737 | 0.3318 | 2.9089 | -3.0052 | | 57 | \Delta MADRS ~ EF_ctx.rh.entorhinal | 0.4178 | 0.6767 | 2.7677 | -3.0826 | | 58 | \Delta MADRS ~ EF_ctx.rh.fusiform | -0.0251 | 0.9800 | 2.8316 | -3.0866 | | 59 | \Delta MADRS ~ EF_ctx.rh.inferiorparietal | 0.4089 | 0.6832 | 2.8434 | -3.0516 | | 60 | \Delta MADRS ~ EF_ctx.rh.inferiortemporal | 0.2850 | 0.7760 | 2.8278 | -3.0981 | | 61 | \Delta MADRS ~ EF_ctx.rh.isthmuscingulate | 1.1564 | 0.2494 | 2.9613 | -3.0001 | | 62 | \Delta MADRS ~ EF_ctx.rh.lateraloccipital | 1.2967 | 0.1968 | 3.0047 | -3.0047 | | 63 | \Delta MADRS ~ EF_ctx.rh.lateralorbitofrontal | 0.2584 | 0.7965 | 2.8039 | -3.0458 | | 64 | \Delta MADRS ~ EF_ctx.rh.lingual | 0.1690 | 0.8660 | 2.8354 | -3.0794 | | 65 | \Delta MADRS ~ EF_ctx.rh.medialorbitofrontal | 0.9539 | 0.3417 | 2.7991 | -2.9673 | | 66 | \Delta MADRS ~ EF_ctx.rh.middletemporal | -0.0044 | 0.9965 | 2.8248 | -3.0966 | | 67 | \Delta MADRS ~ EF_ctx.rh.parahippocampal | -0.1492 | 0.8816 | 2.8609 | -3.0761 | | 68 | \Delta MADRS ~ EF_ctx.rh.paracentral | 1.6563 | 0.0998 | 2.5742 | -3.0121 | | 69 | \Delta MADRS ~ EF_ctx.rh.parsopercularis | 0.5681 | 0.5708 | 2.8025 | -3.0427 | | 70 | \Delta MADRS ~ EF_ctx.rh.parsorbitalis | -1.3677 | 0.1735 | 2.4676 | -3.3135 | | 71 | \Delta MADRS ~ EF_ctx.rh.parstriangularis | 0.0660 | 0.9475 | 2.8333 | -3.0937 | | 72 | \Delta MADRS ~ EF_ctx.rh.pericalcarine | 0.6869 | 0.4932 | 2.9179 | -3.0338 | | 73 | \Delta MADRS ~ EF_ctx.rh.postcentral | 0.8297 | 0.4081 | 2.6889 | -3.0644 | | 74 | \Delta MADRS ~ EF_ctx.rh.posteriorcingulate | 2.0097 | 0.0463 | 2.4935 | -2.9198 | | 75 | \Delta MADRS ~ EF_ctx.rh.precentral | 0.4018 | 0.6884 | 2.7256 | -3.0819 | | 76 | \Delta MADRS ~ EF_ctx.rh.precuneus | 1.6233 | 0.1067 | 2.8070 | -2.9277 | | 77 | \Delta MADRS ~ EF_ctx.rh.rostralanteriorcingulate | 0.5211 | 0.6031 | 2.8836 | -3.0069 | | 78 | \Delta MADRS ~ EF_ctx.rh.rostralmiddlefrontal | 0.1262 | 0.8997 | 2.8358 | -3.0797 | | 79 | \Delta MADRS ~ EF_ctx.rh.superiorfrontal | 1.5330 | 0.1274 | 2.7144 | -3.1191 | | 80 | \Delta MADRS ~ EF_ctx.rh.superiorparietal | 0.9670 | 0.3351 | 2.7675 | -3.0314 | | 81 | \Delta MADRS ~ EF_ctx.rh.superiortemporal | 0.7561 | 0.4508 | 2.7978 | -3.0734 | | 82 | \Delta MADRS ~ EF_ctx.rh.supramarginal | 0.6117 | 0.5417 | 2.8186 | -3.0437 | | 83 | \Delta MADRS ~ EF_ctx.rh.frontalpole | 1.7738 | 0.0782 | 2.6474 | -2.9880 | | 84 | \Delta MADRS ~ EF_ctx.rh.temporalpole | -0.1891 | 0.8503 | 2.8393 | -3.1030 | | 85 | \Delta MADRS ~ EF_ctx.rh.transversetemporal | 0.8436 | 0.4003 | 2.8980 | -2.9848 | ** Supplementary Table 4 #+BEGIN_SRC R :results output raw :exports results #install.packages("/home/amiklos/Downloads/ascii_2.1.tar.gz", repos=NULL, type="source") library(ascii) library(stringr) mt<-read.csv('/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/Mixed_N151_dVol-EF+Age+ECTnum+Site_FDRcorrect.csv')[,c(2:5,7,9)] mt$roi<-str_replace(mt$roi,'EF','\\\\Delta VOL') colnames(mt)[6]<-'BH^EF_FDR' mt.asc<-ascii(mt, colnames=colnames(mt),digits=4,caption="The relationship between volume changes and EF across individuals (EF ~ \\Delta Vol + Age + ECTnum)") print(mt.asc,type="org") #+END_SRC #+RESULTS: #+CAPTION: The relationship between volume changes and EF across individuals (\Delta Vol ~ EF + Age + ECTnum) | | roi | t_EF | p_EF | t_Age | t_ECTnum | BH^EF_FDR | |----+--------------------------------------------+---------+--------+---------+----------+-----------| | 1 | \Delta VOL_Left.Cerebellum.Cortex | -0.3668 | 0.7143 | -0.1150 | 1.9368 | 0.8205 | | 2 | \Delta VOL_Left.Thalamus.Proper | 0.0244 | 0.9805 | -0.4046 | 2.8696 | 0.9952 | | 3 | \Delta VOL_Left.Caudate | 0.6555 | 0.5132 | -0.8301 | 2.6428 | 0.6924 | | 4 | \Delta VOL_Left.Putamen | 0.5737 | 0.5671 | -0.5992 | 1.3203 | 0.7212 | | 5 | \Delta VOL_Left.Pallidum | 0.0060 | 0.9952 | 0.1026 | 1.2295 | 0.9952 | | 6 | \Delta VOL_Brain.Stem | 1.2114 | 0.2278 | 0.8536 | 1.2309 | 0.4466 | | 7 | \Delta VOL_Left.Hippocampus | 4.5102 | 0.0000 | -2.6814 | 3.3221 | 0.0012 | | 8 | \Delta VOL_Left.Amygdala | 3.9069 | 0.0001 | -1.0572 | 2.1018 | 0.0061 | | 9 | \Delta VOL_Left.Accumbens.area | 2.0238 | 0.0449 | -3.4456 | 1.7246 | 0.1737 | | 10 | \Delta VOL_Left.VentralDC | 0.1740 | 0.8621 | 0.0605 | 2.2614 | 0.9395 | | 11 | \Delta VOL_Right.Cerebellum.Cortex | -0.5564 | 0.5788 | 0.0677 | 1.3212 | 0.7235 | | 12 | \Delta VOL_Right.Thalamus.Proper | 0.4582 | 0.6475 | 0.3541 | 4.0787 | 0.7712 | | 13 | \Delta VOL_Right.Caudate | 1.2293 | 0.2210 | 1.0254 | 1.5097 | 0.4466 | | 14 | \Delta VOL_Right.Putamen | 1.0724 | 0.2854 | -0.5112 | 1.4987 | 0.4756 | | 15 | \Delta VOL_Right.Pallidum | 0.6045 | 0.5465 | 0.8016 | 2.9589 | 0.7181 | | 16 | \Delta VOL_Right.Hippocampus | 1.5090 | 0.1336 | -1.2924 | 3.2473 | 0.3441 | | 17 | \Delta VOL_Right.Amygdala | 2.9945 | 0.0032 | -0.6087 | 4.2603 | 0.0344 | | 18 | \Delta VOL_Right.Accumbens.area | 1.9563 | 0.0524 | -0.8782 | 3.5228 | 0.1937 | | 19 | \Delta VOL_Right.VentralDC | 0.3488 | 0.7278 | 0.5197 | 0.7438 | 0.8248 | | 20 | \Delta VOL_ctx.lh.bankssts | 1.1757 | 0.2417 | -0.4102 | 2.5801 | 0.4466 | | 21 | \Delta VOL_ctx.lh.caudalanteriorcingulate | 1.3404 | 0.1823 | -1.2881 | 2.2330 | 0.4254 | | 22 | \Delta VOL_ctx.lh.caudalmiddlefrontal | -1.8989 | 0.0596 | -0.3804 | 2.0087 | 0.2112 | | 23 | \Delta VOL_ctx.lh.cuneus | 0.9827 | 0.3274 | 0.1037 | 2.0348 | 0.5352 | | 24 | \Delta VOL_ctx.lh.entorhinal | 3.2229 | 0.0016 | -1.2447 | 1.6659 | 0.0335 | | 25 | \Delta VOL_ctx.lh.fusiform | 3.0717 | 0.0026 | -0.1806 | 2.1319 | 0.0344 | | 26 | \Delta VOL_ctx.lh.inferiorparietal | 1.5131 | 0.1325 | 0.8515 | 2.3077 | 0.3441 | | 27 | \Delta VOL_ctx.lh.inferiortemporal | 2.6985 | 0.0078 | 0.6415 | 1.9131 | 0.0577 | | 28 | \Delta VOL_ctx.lh.isthmuscingulate | -0.3275 | 0.7438 | -0.4344 | 2.9060 | 0.8319 | | 29 | \Delta VOL_ctx.lh.lateraloccipital | 1.1916 | 0.2354 | 0.3669 | 1.2752 | 0.4466 | | 30 | \Delta VOL_ctx.lh.lateralorbitofrontal | 1.4274 | 0.1557 | -0.0081 | 1.5758 | 0.3780 | | 31 | \Delta VOL_ctx.lh.lingual | 0.1391 | 0.8896 | 0.3506 | 2.4745 | 0.9572 | | 32 | \Delta VOL_ctx.lh.medialorbitofrontal | 1.0744 | 0.2845 | -0.1246 | 1.1852 | 0.4756 | | 33 | \Delta VOL_ctx.lh.middletemporal | 2.0679 | 0.0405 | -0.3780 | 2.2600 | 0.1720 | | 34 | \Delta VOL_ctx.lh.parahippocampal | 1.2683 | 0.2068 | -0.2446 | 2.8373 | 0.4466 | | 35 | \Delta VOL_ctx.lh.paracentral | -2.0829 | 0.0391 | 0.2511 | 4.0937 | 0.1720 | | 36 | \Delta VOL_ctx.lh.parsopercularis | -0.6949 | 0.4883 | -0.7822 | 1.8435 | 0.6694 | | 37 | \Delta VOL_ctx.lh.parsorbitalis | 0.8057 | 0.4218 | -1.0427 | 0.9524 | 0.6289 | | 38 | \Delta VOL_ctx.lh.parstriangularis | 0.8228 | 0.4120 | -1.2157 | 2.7977 | 0.6254 | | 39 | \Delta VOL_ctx.lh.pericalcarine | 0.4426 | 0.6587 | -0.0479 | 1.8463 | 0.7712 | | 40 | \Delta VOL_ctx.lh.postcentral | 0.8692 | 0.3862 | -1.7655 | 2.5145 | 0.5969 | | 41 | \Delta VOL_ctx.lh.posteriorcingulate | -0.8698 | 0.3859 | -0.6961 | 3.3193 | 0.5969 | | 42 | \Delta VOL_ctx.lh.precentral | -0.7279 | 0.4679 | -1.2884 | 2.4234 | 0.6682 | | 43 | \Delta VOL_ctx.lh.precuneus | -1.5879 | 0.1145 | -0.4353 | 3.6729 | 0.3441 | | 44 | \Delta VOL_ctx.lh.rostralanteriorcingulate | 1.3315 | 0.1852 | -0.4449 | 0.5630 | 0.4254 | | 45 | \Delta VOL_ctx.lh.rostralmiddlefrontal | -0.7192 | 0.4732 | -1.6205 | 1.1936 | 0.6682 | | 46 | \Delta VOL_ctx.lh.superiorfrontal | -1.2073 | 0.2293 | -0.5851 | 2.1065 | 0.4466 | | 47 | \Delta VOL_ctx.lh.superiorparietal | -1.7423 | 0.0836 | 0.6952 | 3.3288 | 0.2734 | | 48 | \Delta VOL_ctx.lh.superiortemporal | 2.2820 | 0.0240 | -2.0868 | 1.6393 | 0.1199 | | 49 | \Delta VOL_ctx.lh.supramarginal | 0.5717 | 0.5685 | -0.2467 | 2.1282 | 0.7212 | | 50 | \Delta VOL_ctx.lh.frontalpole | -0.2029 | 0.8395 | -0.2904 | 0.4776 | 0.9267 | | 51 | \Delta VOL_ctx.lh.temporalpole | 2.5288 | 0.0125 | -0.0731 | 1.3167 | 0.0762 | | 52 | \Delta VOL_ctx.lh.transversetemporal | 0.4387 | 0.6616 | -0.4617 | 2.1817 | 0.7712 | | 53 | \Delta VOL_ctx.rh.bankssts | 0.1121 | 0.9109 | 2.0777 | 2.9991 | 0.9678 | | 54 | \Delta VOL_ctx.rh.caudalanteriorcingulate | -1.4295 | 0.1551 | 1.2935 | 2.4016 | 0.3780 | | 55 | \Delta VOL_ctx.rh.caudalmiddlefrontal | -2.9569 | 0.0036 | 1.6943 | 2.6065 | 0.0344 | | 56 | \Delta VOL_ctx.rh.cuneus | -0.0087 | 0.9930 | -1.1806 | 2.4017 | 0.9952 | | 57 | \Delta VOL_ctx.rh.entorhinal | 1.2514 | 0.2129 | 0.7897 | 2.4722 | 0.4466 | | 58 | \Delta VOL_ctx.rh.fusiform | 1.5380 | 0.1263 | 0.7997 | 4.7854 | 0.3441 | | 59 | \Delta VOL_ctx.rh.inferiorparietal | -2.9902 | 0.0033 | 1.6520 | 0.7114 | 0.0344 | | 60 | \Delta VOL_ctx.rh.inferiortemporal | 0.9300 | 0.3540 | 1.9310 | 3.3455 | 0.5677 | | 61 | \Delta VOL_ctx.rh.isthmuscingulate | 0.0325 | 0.9741 | 0.4230 | 1.1493 | 0.9952 | | 62 | \Delta VOL_ctx.rh.lateraloccipital | 1.1796 | 0.2401 | 0.6095 | 1.5161 | 0.4466 | | 63 | \Delta VOL_ctx.rh.lateralorbitofrontal | 0.5347 | 0.5937 | 0.3393 | 2.9240 | 0.7314 | | 64 | \Delta VOL_ctx.rh.lingual | -0.0753 | 0.9401 | -1.9555 | 3.5258 | 0.9865 | | 65 | \Delta VOL_ctx.rh.medialorbitofrontal | 0.7090 | 0.4795 | 1.5479 | 2.3419 | 0.6682 | | 66 | \Delta VOL_ctx.rh.middletemporal | -0.6005 | 0.5492 | 2.1275 | 3.6781 | 0.7181 | | 67 | \Delta VOL_ctx.rh.parahippocampal | 1.5217 | 0.1303 | 0.5057 | 3.1874 | 0.3441 | | 68 | \Delta VOL_ctx.rh.paracentral | -3.5101 | 0.0006 | 2.1809 | 2.2718 | 0.0170 | | 69 | \Delta VOL_ctx.rh.parsopercularis | -2.5585 | 0.0116 | 2.8854 | 2.9459 | 0.0756 | | 70 | \Delta VOL_ctx.rh.parsorbitalis | 1.0872 | 0.2788 | -0.5812 | 2.3737 | 0.4756 | | 71 | \Delta VOL_ctx.rh.parstriangularis | -1.2468 | 0.2146 | 1.0686 | 2.6086 | 0.4466 | | 72 | \Delta VOL_ctx.rh.pericalcarine | 1.5878 | 0.1146 | -0.0096 | 2.2815 | 0.3441 | | 73 | \Delta VOL_ctx.rh.postcentral | -1.7565 | 0.0812 | 1.2943 | 3.0605 | 0.2734 | | 74 | \Delta VOL_ctx.rh.posteriorcingulate | -1.5171 | 0.1315 | 2.0716 | 1.4731 | 0.3441 | | 75 | \Delta VOL_ctx.rh.precentral | -2.4918 | 0.0139 | 0.9967 | 3.7013 | 0.0762 | | 76 | \Delta VOL_ctx.rh.precuneus | -2.0231 | 0.0450 | -0.1921 | 2.5419 | 0.1737 | | 77 | \Delta VOL_ctx.rh.rostralanteriorcingulate | 2.2083 | 0.0288 | 1.3734 | 2.3606 | 0.1362 | | 78 | \Delta VOL_ctx.rh.rostralmiddlefrontal | -2.6842 | 0.0081 | 0.5804 | 2.2235 | 0.0577 | | 79 | \Delta VOL_ctx.rh.superiorfrontal | -3.0013 | 0.0032 | 1.1011 | 3.2699 | 0.0344 | | 80 | \Delta VOL_ctx.rh.superiorparietal | -2.7495 | 0.0067 | 0.9014 | 2.0779 | 0.0574 | | 81 | \Delta VOL_ctx.rh.superiortemporal | 0.4377 | 0.6623 | 1.2455 | 4.4002 | 0.7712 | | 82 | \Delta VOL_ctx.rh.supramarginal | -2.4794 | 0.0143 | 2.7408 | 3.0429 | 0.0762 | | 83 | \Delta VOL_ctx.rh.frontalpole | 1.1256 | 0.2623 | -0.1784 | 1.9185 | 0.4644 | | 84 | \Delta VOL_ctx.rh.temporalpole | 0.7274 | 0.4682 | 0.5099 | 3.7696 | 0.6682 | | 85 | \Delta VOL_ctx.rh.transversetemporal | 1.1426 | 0.2551 | 0.6448 | 3.2405 | 0.4614 | ** Supplementary Table 5 #+BEGIN_SRC R :results output raw :exports results library(ascii) library(stringr) mt<-read.csv('/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/Mixed_N156_dMADRSperc-dVol+Age+ECTnum+Site.csv')[,c(2:5,7)] mt$roi<-str_replace(mt$roi,'EF','\\\\Delta MADRS ~ \\\\Delta VOL') colnames(mt)[c(2:5)]<-c('t_VOL','p_VOL','t_Age','t_ECTnum') mt.asc<-ascii(mt, colnames=colnames(mt),digits=4, caption="The relationship clinical response and volume changes across individuals (\\Delta MADRS ~ \\Delta Vol + Age + ECTnum + Site)") print(mt.asc,type="org") #+END_SRC #+RESULTS: #+CAPTION: The relationship clinical response and volume changes across individuals (\Delta MADRS ~ \Delta Vol + Age + ECTnum + Site) | | roi | t_VOL | p_VOL | t_Age | t_ECTnum | |----+-----------------------------------------------------------+---------+--------+--------+----------| | 1 | \Delta MADRS ~ \Delta VOL_Left.Cerebellum.Cortex | -0.4996 | 0.6181 | 5.6129 | -2.8409 | | 2 | \Delta MADRS ~ \Delta VOL_Left.Thalamus.Proper | 0.6014 | 0.5486 | 5.5399 | -3.0339 | | 3 | \Delta MADRS ~ \Delta VOL_Left.Caudate | -0.9727 | 0.3324 | 5.5351 | -2.6916 | | 4 | \Delta MADRS ~ \Delta VOL_Left.Putamen | 0.1944 | 0.8462 | 5.5897 | -2.9713 | | 5 | \Delta MADRS ~ \Delta VOL_Left.Pallidum | -0.6016 | 0.5484 | 5.6222 | -2.8859 | | 6 | \Delta MADRS ~ \Delta VOL_Brain.Stem | 0.0780 | 0.9380 | 5.5551 | -2.9623 | | 7 | \Delta MADRS ~ \Delta VOL_Left.Hippocampus | 0.2436 | 0.8079 | 5.3838 | -2.7114 | | 8 | \Delta MADRS ~ \Delta VOL_Left.Amygdala | 0.0822 | 0.9346 | 5.5736 | -2.9514 | | 9 | \Delta MADRS ~ \Delta VOL_Left.Accumbens.area | -1.1617 | 0.2473 | 5.1099 | -2.7724 | | 10 | \Delta MADRS ~ \Delta VOL_Left.VentralDC | -0.2002 | 0.8416 | 5.5898 | -2.8887 | | 11 | \Delta MADRS ~ \Delta VOL_Right.Cerebellum.Cortex | -0.0366 | 0.9708 | 5.5858 | -2.9504 | | 12 | \Delta MADRS ~ \Delta VOL_Right.Thalamus.Proper | 1.4615 | 0.1461 | 5.3363 | -3.2850 | | 13 | \Delta MADRS ~ \Delta VOL_Right.Caudate | -0.0246 | 0.9804 | 5.5218 | -2.9425 | | 14 | \Delta MADRS ~ \Delta VOL_Right.Putamen | -1.0967 | 0.2746 | 5.6266 | -2.8020 | | 15 | \Delta MADRS ~ \Delta VOL_Right.Pallidum | 0.1767 | 0.8600 | 5.4055 | -2.9293 | | 16 | \Delta MADRS ~ \Delta VOL_Right.Hippocampus | -0.7164 | 0.4750 | 5.4632 | -2.4620 | | 17 | \Delta MADRS ~ \Delta VOL_Right.Amygdala | 1.5094 | 0.1334 | 5.1476 | -3.3036 | | 18 | \Delta MADRS ~ \Delta VOL_Right.Accumbens.area | 0.0774 | 0.9384 | 5.5702 | -2.8683 | | 19 | \Delta MADRS ~ \Delta VOL_Right.VentralDC | -0.3931 | 0.6948 | 5.6024 | -2.9437 | | 20 | \Delta MADRS ~ \Delta VOL_ctx.lh.bankssts | -0.7238 | 0.4704 | 5.6411 | -2.7428 | | 21 | \Delta MADRS ~ \Delta VOL_ctx.lh.caudalanteriorcingulate | 1.2169 | 0.2257 | 5.3627 | -3.1468 | | 22 | \Delta MADRS ~ \Delta VOL_ctx.lh.caudalmiddlefrontal | 0.0928 | 0.9262 | 5.5154 | -2.9549 | | 23 | \Delta MADRS ~ \Delta VOL_ctx.lh.cuneus | 0.6429 | 0.5213 | 5.5821 | -3.0413 | | 24 | \Delta MADRS ~ \Delta VOL_ctx.lh.entorhinal | 0.4162 | 0.6779 | 5.6001 | -3.0022 | | 25 | \Delta MADRS ~ \Delta VOL_ctx.lh.fusiform | 1.6961 | 0.0921 | 5.3670 | -3.2505 | | 26 | \Delta MADRS ~ \Delta VOL_ctx.lh.inferiorparietal | 0.1364 | 0.8917 | 5.3652 | -2.9423 | | 27 | \Delta MADRS ~ \Delta VOL_ctx.lh.inferiortemporal | 0.2425 | 0.8088 | 5.4837 | -2.9730 | | 28 | \Delta MADRS ~ \Delta VOL_ctx.lh.isthmuscingulate | 0.2110 | 0.8332 | 5.5711 | -2.9383 | | 29 | \Delta MADRS ~ \Delta VOL_ctx.lh.lateraloccipital | 0.7252 | 0.4695 | 5.3551 | -3.0336 | | 30 | \Delta MADRS ~ \Delta VOL_ctx.lh.lateralorbitofrontal | -0.5301 | 0.5969 | 5.5877 | -2.8830 | | 31 | \Delta MADRS ~ \Delta VOL_ctx.lh.lingual | 1.2153 | 0.2263 | 5.4860 | -3.1695 | | 32 | \Delta MADRS ~ \Delta VOL_ctx.lh.medialorbitofrontal | -0.3501 | 0.7268 | 5.5881 | -2.9271 | | 33 | \Delta MADRS ~ \Delta VOL_ctx.lh.middletemporal | -0.6038 | 0.5469 | 5.6239 | -2.8140 | | 34 | \Delta MADRS ~ \Delta VOL_ctx.lh.parahippocampal | 1.5379 | 0.1263 | 5.3899 | -3.2626 | | 35 | \Delta MADRS ~ \Delta VOL_ctx.lh.paracentral | 0.3763 | 0.7072 | 5.4862 | -2.9448 | | 36 | \Delta MADRS ~ \Delta VOL_ctx.lh.parsopercularis | -0.4156 | 0.6783 | 5.6035 | -2.8779 | | 37 | \Delta MADRS ~ \Delta VOL_ctx.lh.parsorbitalis | -1.0305 | 0.3045 | 5.5172 | -2.8969 | | 38 | \Delta MADRS ~ \Delta VOL_ctx.lh.parstriangularis | -1.2208 | 0.2242 | 5.5629 | -2.6377 | | 39 | \Delta MADRS ~ \Delta VOL_ctx.lh.pericalcarine | 0.7751 | 0.4396 | 5.5888 | -3.0587 | | 40 | \Delta MADRS ~ \Delta VOL_ctx.lh.postcentral | -1.0000 | 0.3190 | 5.4727 | -2.6996 | | 41 | \Delta MADRS ~ \Delta VOL_ctx.lh.posteriorcingulate | 0.5498 | 0.5833 | 5.4460 | -3.0158 | | 42 | \Delta MADRS ~ \Delta VOL_ctx.lh.precentral | -0.0495 | 0.9606 | 5.5712 | -2.9143 | | 43 | \Delta MADRS ~ \Delta VOL_ctx.lh.precuneus | 0.3625 | 0.7175 | 5.4787 | -2.9521 | | 44 | \Delta MADRS ~ \Delta VOL_ctx.lh.rostralanteriorcingulate | -0.1290 | 0.8975 | 5.5730 | -2.9618 | | 45 | \Delta MADRS ~ \Delta VOL_ctx.lh.rostralmiddlefrontal | -1.9889 | 0.0487 | 5.1060 | -2.7949 | | 46 | \Delta MADRS ~ \Delta VOL_ctx.lh.superiorfrontal | -0.3027 | 0.7626 | 5.5862 | -2.9033 | | 47 | \Delta MADRS ~ \Delta VOL_ctx.lh.superiorparietal | -0.0438 | 0.9651 | 5.4356 | -2.8571 | | 48 | \Delta MADRS ~ \Delta VOL_ctx.lh.superiortemporal | -0.3779 | 0.7061 | 5.5151 | -2.8940 | | 49 | \Delta MADRS ~ \Delta VOL_ctx.lh.supramarginal | 0.1638 | 0.8702 | 5.5116 | -2.9469 | | 50 | \Delta MADRS ~ \Delta VOL_ctx.lh.frontalpole | -1.0660 | 0.2882 | 5.6368 | -2.9350 | | 51 | \Delta MADRS ~ \Delta VOL_ctx.lh.temporalpole | -0.0468 | 0.9627 | 5.5854 | -2.9437 | | 52 | \Delta MADRS ~ \Delta VOL_ctx.lh.transversetemporal | 0.2540 | 0.7999 | 5.5916 | -2.9687 | | 53 | \Delta MADRS ~ \Delta VOL_ctx.rh.bankssts | 0.9053 | 0.3668 | 5.0801 | -3.1088 | | 54 | \Delta MADRS ~ \Delta VOL_ctx.rh.caudalanteriorcingulate | 0.3475 | 0.7288 | 5.2346 | -2.9811 | | 55 | \Delta MADRS ~ \Delta VOL_ctx.rh.caudalmiddlefrontal | -1.0823 | 0.2809 | 5.6919 | -2.7464 | | 56 | \Delta MADRS ~ \Delta VOL_ctx.rh.cuneus | 1.8884 | 0.0610 | 5.3569 | -3.3128 | | 57 | \Delta MADRS ~ \Delta VOL_ctx.rh.entorhinal | 0.0560 | 0.9554 | 5.5400 | -2.9105 | | 58 | \Delta MADRS ~ \Delta VOL_ctx.rh.fusiform | 1.8334 | 0.0688 | 4.8882 | -3.4592 | | 59 | \Delta MADRS ~ \Delta VOL_ctx.rh.inferiorparietal | 0.5439 | 0.5874 | 5.0947 | -2.9941 | | 60 | \Delta MADRS ~ \Delta VOL_ctx.rh.inferiortemporal | 1.3208 | 0.1887 | 5.0209 | -3.2240 | | 61 | \Delta MADRS ~ \Delta VOL_ctx.rh.isthmuscingulate | -0.3354 | 0.7378 | 5.5933 | -2.9160 | | 62 | \Delta MADRS ~ \Delta VOL_ctx.rh.lateraloccipital | 0.8522 | 0.3956 | 5.3702 | -3.0514 | | 63 | \Delta MADRS ~ \Delta VOL_ctx.rh.lateralorbitofrontal | -0.3644 | 0.7161 | 5.5981 | -2.8076 | | 64 | \Delta MADRS ~ \Delta VOL_ctx.rh.lingual | 1.4913 | 0.1381 | 5.4989 | -3.2735 | | 65 | \Delta MADRS ~ \Delta VOL_ctx.rh.medialorbitofrontal | -0.7994 | 0.4254 | 5.6489 | -2.7635 | | 66 | \Delta MADRS ~ \Delta VOL_ctx.rh.middletemporal | -0.2340 | 0.8153 | 5.3303 | -2.8169 | | 67 | \Delta MADRS ~ \Delta VOL_ctx.rh.parahippocampal | 0.9612 | 0.3381 | 5.3354 | -3.1011 | | 68 | \Delta MADRS ~ \Delta VOL_ctx.rh.paracentral | -0.1723 | 0.8635 | 5.4405 | -2.8938 | | 69 | \Delta MADRS ~ \Delta VOL_ctx.rh.parsopercularis | -1.2194 | 0.2247 | 5.7367 | -2.6122 | | 70 | \Delta MADRS ~ \Delta VOL_ctx.rh.parsorbitalis | -0.4771 | 0.6340 | 5.5286 | -2.8337 | | 71 | \Delta MADRS ~ \Delta VOL_ctx.rh.parstriangularis | -0.9698 | 0.3338 | 5.6854 | -2.7035 | | 72 | \Delta MADRS ~ \Delta VOL_ctx.rh.pericalcarine | 0.6953 | 0.4880 | 5.5519 | -3.0529 | | 73 | \Delta MADRS ~ \Delta VOL_ctx.rh.postcentral | -0.8104 | 0.4191 | 5.6535 | -2.7233 | | 74 | \Delta MADRS ~ \Delta VOL_ctx.rh.posteriorcingulate | 0.2733 | 0.7850 | 5.3170 | -2.9835 | | 75 | \Delta MADRS ~ \Delta VOL_ctx.rh.precentral | -0.5814 | 0.5619 | 5.6124 | -2.7227 | | 76 | \Delta MADRS ~ \Delta VOL_ctx.rh.precuneus | 0.9170 | 0.3607 | 5.2108 | -3.0999 | | 77 | \Delta MADRS ~ \Delta VOL_ctx.rh.rostralanteriorcingulate | -0.2783 | 0.7812 | 5.5346 | -2.8761 | | 78 | \Delta MADRS ~ \Delta VOL_ctx.rh.rostralmiddlefrontal | -1.9601 | 0.0520 | 5.7845 | -2.6038 | | 79 | \Delta MADRS ~ \Delta VOL_ctx.rh.superiorfrontal | -0.5633 | 0.5741 | 5.5987 | -2.7686 | | 80 | \Delta MADRS ~ \Delta VOL_ctx.rh.superiorparietal | -0.0981 | 0.9220 | 5.5139 | -2.9201 | | 81 | \Delta MADRS ~ \Delta VOL_ctx.rh.superiortemporal | 0.2295 | 0.8188 | 5.2989 | -2.8918 | | 82 | \Delta MADRS ~ \Delta VOL_ctx.rh.supramarginal | 0.5443 | 0.5871 | 5.0334 | -3.0211 | | 83 | \Delta MADRS ~ \Delta VOL_ctx.rh.frontalpole | -0.6669 | 0.5059 | 5.6124 | -2.8353 | | 84 | \Delta MADRS ~ \Delta VOL_ctx.rh.temporalpole | -0.1912 | 0.8486 | 5.5429 | -2.7693 | | 85 | \Delta MADRS ~ \Delta VOL_ctx.rh.transversetemporal | 1.1493 | 0.2524 | 5.0365 | -3.1736 | ** Supplementary Table 6 #+BEGIN_SRC R :results output raw :exports results library(ascii) library(stringr) mt<-read.csv('/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/Mixed_N156_dMADRS-EF+Age+ECTnum+Site.csv')[,c(2:5,7)] mt$roi<-str_replace(mt$roi,'EF','\\\\Delta MADRS ~ EF') colnames(mt)[c(2:5)]<-c('t_EF','p_EF','t_Age','t_ECTnum') mt.asc<-ascii(mt, colnames=colnames(mt),digits=4, caption="The relationship clinical response and EF across individuals (\\Delta MADRS ~ EF + Age + ECTnum + Site)") print(mt.asc,type="org") #+END_SRC #+RESULTS: #+CAPTION: The relationship clinical response and EF across individuals (\Delta MADRS ~ EF + Age + ECTnum + Site) | | roi | t_EF | p_EF | t_Age | t_ECTnum | |----+---------------------------------------------------+---------+--------+--------+----------| | 1 | \Delta MADRS ~ EF_Left.Cerebellum.Cortex | 1.3516 | 0.1787 | 5.3362 | -2.9932 | | 2 | \Delta MADRS ~ EF_Left.Thalamus.Proper | 0.8783 | 0.3813 | 5.6445 | -3.0320 | | 3 | \Delta MADRS ~ EF_Left.Caudate | 0.4661 | 0.6419 | 5.5098 | -2.9904 | | 4 | \Delta MADRS ~ EF_Left.Putamen | 0.8759 | 0.3826 | 5.6312 | -3.0171 | | 5 | \Delta MADRS ~ EF_Left.Pallidum | 1.1551 | 0.2500 | 5.7127 | -3.0332 | | 6 | \Delta MADRS ~ EF_Brain.Stem | 0.8996 | 0.3699 | 5.5420 | -2.9615 | | 7 | \Delta MADRS ~ EF_Left.Hippocampus | 1.2165 | 0.2258 | 5.6648 | -2.9576 | | 8 | \Delta MADRS ~ EF_Left.Amygdala | 1.0714 | 0.2858 | 5.7090 | -2.9743 | | 9 | \Delta MADRS ~ EF_Left.Accumbens.area | 0.8968 | 0.3713 | 5.5454 | -3.0450 | | 10 | \Delta MADRS ~ EF_Left.VentralDC | 0.8683 | 0.3867 | 5.6287 | -2.9751 | | 11 | \Delta MADRS ~ EF_Right.Cerebellum.Cortex | 0.9875 | 0.3251 | 5.4111 | -2.9886 | | 12 | \Delta MADRS ~ EF_Right.Thalamus.Proper | 0.5893 | 0.5566 | 5.4818 | -3.0056 | | 13 | \Delta MADRS ~ EF_Right.Caudate | 0.6738 | 0.5016 | 5.3063 | -2.9863 | | 14 | \Delta MADRS ~ EF_Right.Putamen | 0.6475 | 0.5184 | 5.4451 | -2.9704 | | 15 | \Delta MADRS ~ EF_Right.Pallidum | 0.5802 | 0.5627 | 5.4664 | -2.9926 | | 16 | \Delta MADRS ~ EF_Right.Hippocampus | 0.6835 | 0.4954 | 5.2478 | -2.9474 | | 17 | \Delta MADRS ~ EF_Right.Amygdala | 0.3874 | 0.6990 | 5.4204 | -2.9439 | | 18 | \Delta MADRS ~ EF_Right.Accumbens.area | 0.3876 | 0.6989 | 5.0600 | -2.9816 | | 19 | \Delta MADRS ~ EF_Right.VentralDC | 0.6604 | 0.5101 | 5.4074 | -2.9732 | | 20 | \Delta MADRS ~ EF_ctx.lh.bankssts | 0.8611 | 0.3907 | 5.6521 | -2.9588 | | 21 | \Delta MADRS ~ EF_ctx.lh.caudalanteriorcingulate | 0.8251 | 0.4107 | 5.5545 | -3.0185 | | 22 | \Delta MADRS ~ EF_ctx.lh.caudalmiddlefrontal | 1.7234 | 0.0870 | 5.5849 | -3.0935 | | 23 | \Delta MADRS ~ EF_ctx.lh.cuneus | 1.1248 | 0.2626 | 5.5896 | -2.9989 | | 24 | \Delta MADRS ~ EF_ctx.lh.entorhinal | 0.9818 | 0.3279 | 5.1629 | -3.0469 | | 25 | \Delta MADRS ~ EF_ctx.lh.fusiform | 0.7246 | 0.4699 | 5.3341 | -2.9969 | | 26 | \Delta MADRS ~ EF_ctx.lh.inferiorparietal | 1.2372 | 0.2181 | 5.6178 | -3.0306 | | 27 | \Delta MADRS ~ EF_ctx.lh.inferiortemporal | 0.7907 | 0.4304 | 5.6349 | -2.9838 | | 28 | \Delta MADRS ~ EF_ctx.lh.isthmuscingulate | 1.2497 | 0.2135 | 5.5542 | -3.0068 | | 29 | \Delta MADRS ~ EF_ctx.lh.lateraloccipital | 0.6946 | 0.4885 | 5.5630 | -2.9939 | | 30 | \Delta MADRS ~ EF_ctx.lh.lateralorbitofrontal | 1.2830 | 0.2016 | 5.6728 | -2.9776 | | 31 | \Delta MADRS ~ EF_ctx.lh.lingual | -0.0992 | 0.9211 | 5.4741 | -2.9728 | | 32 | \Delta MADRS ~ EF_ctx.lh.medialorbitofrontal | 1.0597 | 0.2911 | 5.4500 | -2.9399 | | 33 | \Delta MADRS ~ EF_ctx.lh.middletemporal | 1.3588 | 0.1764 | 5.7274 | -3.0252 | | 34 | \Delta MADRS ~ EF_ctx.lh.parahippocampal | 1.0622 | 0.2900 | 5.2664 | -2.9874 | | 35 | \Delta MADRS ~ EF_ctx.lh.paracentral | 1.5686 | 0.1190 | 5.3424 | -3.0830 | | 36 | \Delta MADRS ~ EF_ctx.lh.parsopercularis | 0.8736 | 0.3838 | 5.6654 | -2.9925 | | 37 | \Delta MADRS ~ EF_ctx.lh.parsorbitalis | 0.1145 | 0.9090 | 5.2936 | -2.9698 | | 38 | \Delta MADRS ~ EF_ctx.lh.parstriangularis | 0.6089 | 0.5436 | 5.6063 | -2.9876 | | 39 | \Delta MADRS ~ EF_ctx.lh.pericalcarine | -0.1227 | 0.9025 | 5.5874 | -2.9741 | | 40 | \Delta MADRS ~ EF_ctx.lh.postcentral | 1.5423 | 0.1252 | 5.4710 | -3.0388 | | 41 | \Delta MADRS ~ EF_ctx.lh.posteriorcingulate | 1.7234 | 0.0870 | 4.7193 | -2.9849 | | 42 | \Delta MADRS ~ EF_ctx.lh.precentral | 1.3961 | 0.1649 | 5.5618 | -3.0584 | | 43 | \Delta MADRS ~ EF_ctx.lh.precuneus | 1.7322 | 0.0854 | 5.1261 | -3.0170 | | 44 | \Delta MADRS ~ EF_ctx.lh.rostralanteriorcingulate | 0.6893 | 0.4918 | 5.6371 | -2.9984 | | 45 | \Delta MADRS ~ EF_ctx.lh.rostralmiddlefrontal | 1.0314 | 0.3041 | 5.7001 | -2.9903 | | 46 | \Delta MADRS ~ EF_ctx.lh.superiorfrontal | 1.7343 | 0.0851 | 5.4624 | -3.0974 | | 47 | \Delta MADRS ~ EF_ctx.lh.superiorparietal | 1.8563 | 0.0655 | 5.3965 | -3.1262 | | 48 | \Delta MADRS ~ EF_ctx.lh.superiortemporal | 1.2854 | 0.2008 | 5.7506 | -3.0322 | | 49 | \Delta MADRS ~ EF_ctx.lh.supramarginal | 0.9368 | 0.3505 | 5.6569 | -2.9983 | | 50 | \Delta MADRS ~ EF_ctx.lh.frontalpole | 1.5205 | 0.1306 | 5.8005 | -2.9350 | | 51 | \Delta MADRS ~ EF_ctx.lh.temporalpole | 0.0839 | 0.9333 | 5.5167 | -2.9689 | | 52 | \Delta MADRS ~ EF_ctx.lh.transversetemporal | 1.0350 | 0.3024 | 5.6356 | -2.9753 | | 53 | \Delta MADRS ~ EF_ctx.rh.bankssts | 0.2089 | 0.8348 | 5.5736 | -2.9477 | | 54 | \Delta MADRS ~ EF_ctx.rh.caudalanteriorcingulate | 1.3109 | 0.1920 | 5.5031 | -3.0585 | | 55 | \Delta MADRS ~ EF_ctx.rh.caudalmiddlefrontal | 0.9931 | 0.3224 | 5.3116 | -3.0101 | | 56 | \Delta MADRS ~ EF_ctx.rh.cuneus | 1.0257 | 0.3068 | 5.5313 | -2.9757 | | 57 | \Delta MADRS ~ EF_ctx.rh.entorhinal | 0.3188 | 0.7503 | 5.1370 | -2.9683 | | 58 | \Delta MADRS ~ EF_ctx.rh.fusiform | 0.0353 | 0.9719 | 5.3492 | -2.9627 | | 59 | \Delta MADRS ~ EF_ctx.rh.inferiorparietal | 0.4416 | 0.6594 | 5.5409 | -2.9719 | | 60 | \Delta MADRS ~ EF_ctx.rh.inferiortemporal | 0.0980 | 0.9220 | 5.5216 | -2.9687 | | 61 | \Delta MADRS ~ EF_ctx.rh.isthmuscingulate | 1.1468 | 0.2534 | 5.5553 | -3.0096 | | 62 | \Delta MADRS ~ EF_ctx.rh.lateraloccipital | 1.3549 | 0.1776 | 5.5079 | -2.9649 | | 63 | \Delta MADRS ~ EF_ctx.rh.lateralorbitofrontal | 0.1181 | 0.9061 | 5.4682 | -2.9482 | | 64 | \Delta MADRS ~ EF_ctx.rh.lingual | 0.4466 | 0.6558 | 5.4910 | -2.9775 | | 65 | \Delta MADRS ~ EF_ctx.rh.medialorbitofrontal | 0.8851 | 0.3776 | 5.1102 | -2.9038 | | 66 | \Delta MADRS ~ EF_ctx.rh.middletemporal | -0.1713 | 0.8642 | 5.5875 | -2.9728 | | 67 | \Delta MADRS ~ EF_ctx.rh.parahippocampal | -0.0533 | 0.9576 | 5.4170 | -2.9421 | | 68 | \Delta MADRS ~ EF_ctx.rh.paracentral | 1.4722 | 0.1432 | 5.2359 | -3.0446 | | 69 | \Delta MADRS ~ EF_ctx.rh.parsopercularis | 0.4057 | 0.6856 | 5.5058 | -2.9625 | | 70 | \Delta MADRS ~ EF_ctx.rh.parsorbitalis | -1.5217 | 0.1303 | 4.4952 | -3.2479 | | 71 | \Delta MADRS ~ EF_ctx.rh.parstriangularis | 0.0523 | 0.9584 | 5.5856 | -2.9713 | | 72 | \Delta MADRS ~ EF_ctx.rh.pericalcarine | 0.8017 | 0.4241 | 5.5964 | -2.9479 | | 73 | \Delta MADRS ~ EF_ctx.rh.postcentral | 0.8949 | 0.3723 | 5.2388 | -3.0063 | | 74 | \Delta MADRS ~ EF_ctx.rh.posteriorcingulate | 1.8661 | 0.0641 | 4.5850 | -2.9572 | | 75 | \Delta MADRS ~ EF_ctx.rh.precentral | 0.4125 | 0.6806 | 5.3439 | -2.9885 | | 76 | \Delta MADRS ~ EF_ctx.rh.precuneus | 1.5202 | 0.1307 | 5.1634 | -2.9922 | | 77 | \Delta MADRS ~ EF_ctx.rh.rostralanteriorcingulate | 0.7513 | 0.4537 | 5.6464 | -2.9519 | | 78 | \Delta MADRS ~ EF_ctx.rh.rostralmiddlefrontal | 0.2203 | 0.8259 | 5.5770 | -2.9690 | | 79 | \Delta MADRS ~ EF_ctx.rh.superiorfrontal | 1.5058 | 0.1344 | 5.3401 | -3.1130 | | 80 | \Delta MADRS ~ EF_ctx.rh.superiorparietal | 1.1193 | 0.2649 | 5.3231 | -3.0022 | | 81 | \Delta MADRS ~ EF_ctx.rh.superiortemporal | 0.5845 | 0.5598 | 5.4082 | -2.9776 | | 82 | \Delta MADRS ~ EF_ctx.rh.supramarginal | 0.5194 | 0.6043 | 5.4970 | -2.9756 | | 83 | \Delta MADRS ~ EF_ctx.rh.frontalpole | 1.6027 | 0.1112 | 5.5188 | -2.9469 | | 84 | \Delta MADRS ~ EF_ctx.rh.temporalpole | -0.4055 | 0.6857 | 5.6013 | -2.9909 | | 85 | \Delta MADRS ~ EF_ctx.rh.transversetemporal | 0.7262 | 0.4689 | 5.5628 | -2.9155 | ** Supplementary Table 7 #+BEGIN_SRC R :results output raw :exports results library(ascii) library(stringr) mt<-read.csv('/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/Mixed_N156_BaselineVolumevsAge.csv')[,c(2,3,4)] mt$roi<-paste0(str_replace(mt$roi,'EF','Baseline Vol'),' ~ Age') colnames(mt)[c(2:3)]<-c('t_Age','p_Age') mt.asc<-ascii(mt, colnames=colnames(mt),digits=4, caption="The relationship between baseline volume and age (Baseline Volume ~ Age)") print(mt.asc,type="org") #+END_SRC #+RESULTS: #+CAPTION: The relationship between baseline volume and age (Baseline Volume ~ Age) | | roi | t_Age | p_Age | |----+----------------------------------------------------+---------+--------| | 1 | Baseline Vol_Left.Cerebellum.Cortex ~ Age | -4.2768 | 0.0000 | | 2 | Baseline Vol_Left.Thalamus.Proper ~ Age | -2.6668 | 0.0085 | | 3 | Baseline Vol_Left.Caudate ~ Age | 1.1587 | 0.2485 | | 4 | Baseline Vol_Left.Putamen ~ Age | -5.1151 | 0.0000 | | 5 | Baseline Vol_Left.Pallidum ~ Age | -2.0723 | 0.0400 | | 6 | Baseline Vol_Brain.Stem ~ Age | -1.7714 | 0.0786 | | 7 | Baseline Vol_Left.Hippocampus ~ Age | -6.5427 | 0.0000 | | 8 | Baseline Vol_Left.Amygdala ~ Age | -4.6348 | 0.0000 | | 9 | Baseline Vol_Left.Accumbens.area ~ Age | -4.6046 | 0.0000 | | 10 | Baseline Vol_Left.VentralDC ~ Age | -1.3501 | 0.1791 | | 11 | Baseline Vol_Right.Cerebellum.Cortex ~ Age | -4.1066 | 0.0001 | | 12 | Baseline Vol_Right.Thalamus.Proper ~ Age | -3.6386 | 0.0004 | | 13 | Baseline Vol_Right.Caudate ~ Age | -1.2939 | 0.1978 | | 14 | Baseline Vol_Right.Putamen ~ Age | -6.7879 | 0.0000 | | 15 | Baseline Vol_Right.Pallidum ~ Age | -4.5543 | 0.0000 | | 16 | Baseline Vol_Right.Hippocampus ~ Age | -5.6416 | 0.0000 | | 17 | Baseline Vol_Right.Amygdala ~ Age | -3.6549 | 0.0004 | | 18 | Baseline Vol_Right.Accumbens.area ~ Age | -5.8783 | 0.0000 | | 19 | Baseline Vol_Right.VentralDC ~ Age | -2.5733 | 0.0111 | | 20 | Baseline Vol_ctx.lh.bankssts ~ Age | -2.8936 | 0.0044 | | 21 | Baseline Vol_ctx.lh.caudalanteriorcingulate ~ Age | -0.8132 | 0.4174 | | 22 | Baseline Vol_ctx.lh.caudalmiddlefrontal ~ Age | -3.3319 | 0.0011 | | 23 | Baseline Vol_ctx.lh.cuneus ~ Age | -2.9607 | 0.0036 | | 24 | Baseline Vol_ctx.lh.entorhinal ~ Age | -3.5206 | 0.0006 | | 25 | Baseline Vol_ctx.lh.fusiform ~ Age | -5.5547 | 0.0000 | | 26 | Baseline Vol_ctx.lh.inferiorparietal ~ Age | -4.1748 | 0.0001 | | 27 | Baseline Vol_ctx.lh.inferiortemporal ~ Age | -5.6376 | 0.0000 | | 28 | Baseline Vol_ctx.lh.isthmuscingulate ~ Age | -3.3345 | 0.0011 | | 29 | Baseline Vol_ctx.lh.lateraloccipital ~ Age | -3.7491 | 0.0003 | | 30 | Baseline Vol_ctx.lh.lateralorbitofrontal ~ Age | -7.0033 | 0.0000 | | 31 | Baseline Vol_ctx.lh.lingual ~ Age | -5.9806 | 0.0000 | | 32 | Baseline Vol_ctx.lh.medialorbitofrontal ~ Age | -1.9891 | 0.0486 | | 33 | Baseline Vol_ctx.lh.middletemporal ~ Age | -6.2512 | 0.0000 | | 34 | Baseline Vol_ctx.lh.parahippocampal ~ Age | -7.4016 | 0.0000 | | 35 | Baseline Vol_ctx.lh.paracentral ~ Age | -1.9326 | 0.0553 | | 36 | Baseline Vol_ctx.lh.parsopercularis ~ Age | -5.0408 | 0.0000 | | 37 | Baseline Vol_ctx.lh.parsorbitalis ~ Age | -5.3290 | 0.0000 | | 38 | Baseline Vol_ctx.lh.parstriangularis ~ Age | -5.5008 | 0.0000 | | 39 | Baseline Vol_ctx.lh.pericalcarine ~ Age | -2.0474 | 0.0424 | | 40 | Baseline Vol_ctx.lh.postcentral ~ Age | -5.1513 | 0.0000 | | 41 | Baseline Vol_ctx.lh.posteriorcingulate ~ Age | -3.4563 | 0.0007 | | 42 | Baseline Vol_ctx.lh.precentral ~ Age | -4.3857 | 0.0000 | | 43 | Baseline Vol_ctx.lh.precuneus ~ Age | -4.0321 | 0.0001 | | 44 | Baseline Vol_ctx.lh.rostralanteriorcingulate ~ Age | -2.3314 | 0.0211 | | 45 | Baseline Vol_ctx.lh.rostralmiddlefrontal ~ Age | -3.9878 | 0.0001 | | 46 | Baseline Vol_ctx.lh.superiorfrontal ~ Age | -5.4678 | 0.0000 | | 47 | Baseline Vol_ctx.lh.superiorparietal ~ Age | -4.8697 | 0.0000 | | 48 | Baseline Vol_ctx.lh.superiortemporal ~ Age | -6.6056 | 0.0000 | | 49 | Baseline Vol_ctx.lh.supramarginal ~ Age | -5.6008 | 0.0000 | | 50 | Baseline Vol_ctx.lh.frontalpole ~ Age | -3.7056 | 0.0003 | | 51 | Baseline Vol_ctx.lh.temporalpole ~ Age | -3.3124 | 0.0012 | | 52 | Baseline Vol_ctx.lh.transversetemporal ~ Age | -5.2842 | 0.0000 | | 53 | Baseline Vol_ctx.rh.bankssts ~ Age | -5.8200 | 0.0000 | | 54 | Baseline Vol_ctx.rh.caudalanteriorcingulate ~ Age | -0.1144 | 0.9091 | | 55 | Baseline Vol_ctx.rh.caudalmiddlefrontal ~ Age | -3.7977 | 0.0002 | | 56 | Baseline Vol_ctx.rh.cuneus ~ Age | -2.8824 | 0.0046 | | 57 | Baseline Vol_ctx.rh.entorhinal ~ Age | -1.8970 | 0.0598 | | 58 | Baseline Vol_ctx.rh.fusiform ~ Age | -5.2218 | 0.0000 | | 59 | Baseline Vol_ctx.rh.inferiorparietal ~ Age | -5.7134 | 0.0000 | | 60 | Baseline Vol_ctx.rh.inferiortemporal ~ Age | -4.6609 | 0.0000 | | 61 | Baseline Vol_ctx.rh.isthmuscingulate ~ Age | -4.2929 | 0.0000 | | 62 | Baseline Vol_ctx.rh.lateraloccipital ~ Age | -3.7913 | 0.0002 | | 63 | Baseline Vol_ctx.rh.lateralorbitofrontal ~ Age | -4.8756 | 0.0000 | | 64 | Baseline Vol_ctx.rh.lingual ~ Age | -5.3444 | 0.0000 | | 65 | Baseline Vol_ctx.rh.medialorbitofrontal ~ Age | -3.0897 | 0.0024 | | 66 | Baseline Vol_ctx.rh.middletemporal ~ Age | -6.9557 | 0.0000 | | 67 | Baseline Vol_ctx.rh.parahippocampal ~ Age | -5.6025 | 0.0000 | | 68 | Baseline Vol_ctx.rh.paracentral ~ Age | -2.0546 | 0.0417 | | 69 | Baseline Vol_ctx.rh.parsopercularis ~ Age | -5.4711 | 0.0000 | | 70 | Baseline Vol_ctx.rh.parsorbitalis ~ Age | -5.0994 | 0.0000 | | 71 | Baseline Vol_ctx.rh.parstriangularis ~ Age | -4.4944 | 0.0000 | | 72 | Baseline Vol_ctx.rh.pericalcarine ~ Age | -1.7874 | 0.0760 | | 73 | Baseline Vol_ctx.rh.postcentral ~ Age | -3.7190 | 0.0003 | | 74 | Baseline Vol_ctx.rh.posteriorcingulate ~ Age | -3.6034 | 0.0004 | | 75 | Baseline Vol_ctx.rh.precentral ~ Age | -3.9917 | 0.0001 | | 76 | Baseline Vol_ctx.rh.precuneus ~ Age | -5.6244 | 0.0000 | | 77 | Baseline Vol_ctx.rh.rostralanteriorcingulate ~ Age | -1.7497 | 0.0823 | | 78 | Baseline Vol_ctx.rh.rostralmiddlefrontal ~ Age | -4.5143 | 0.0000 | | 79 | Baseline Vol_ctx.rh.superiorfrontal ~ Age | -6.1004 | 0.0000 | | 80 | Baseline Vol_ctx.rh.superiorparietal ~ Age | -3.9167 | 0.0001 | | 81 | Baseline Vol_ctx.rh.superiortemporal ~ Age | -8.2332 | 0.0000 | | 82 | Baseline Vol_ctx.rh.supramarginal ~ Age | -5.8496 | 0.0000 | | 83 | Baseline Vol_ctx.rh.frontalpole ~ Age | -2.3721 | 0.0190 | | 84 | Baseline Vol_ctx.rh.temporalpole ~ Age | -1.6448 | 0.1022 | | 85 | Baseline Vol_ctx.rh.transversetemporal ~ Age | -3.8244 | 0.0002 | ** Supplementary Table 8 without confound :noexport: #+BEGIN_SRC R :results output raw :exports results library(ascii) library(stringr) mt<-read.csv('/nethome/amiklos/argyelan@gmail.com/projects/ECT/Bergen/ECTEF_collaboration/RULcorrelation/N156_dMADRS-EFwFDR.csv')[,c(2:5)] mt$roi<-str_replace(mt$roi,'EF','\\\\Delta MADRS ~ EF') colnames(mt)[c(2:4)]<-c('t_EF','p_EF','BH^EF_FDR') mt.asc<-ascii(mt, colnames=colnames(mt),digits=4, caption="The relationship clinical response and EF across individuals (\\Delta MADRS ~ EF)") print(mt.asc,type="org") #+END_SRC #+RESULTS: #+CAPTION: The relationship clinical response and EF across individuals (\Delta MADRS ~ EF) | | roi | t_EF | p_EF | BH^EF_FDR | |----+---------------------------------------------------+---------+--------+-----------| | 1 | \Delta MADRS ~ EF_Left.Cerebellum.Cortex | 2.0187 | 0.0453 | 0.3530 | | 2 | \Delta MADRS ~ EF_Left.Thalamus.Proper | 0.2348 | 0.8147 | 0.9233 | | 3 | \Delta MADRS ~ EF_Left.Caudate | -1.1309 | 0.2599 | 0.5021 | | 4 | \Delta MADRS ~ EF_Left.Putamen | -0.7879 | 0.4320 | 0.5922 | | 5 | \Delta MADRS ~ EF_Left.Pallidum | 0.2054 | 0.8375 | 0.9245 | | 6 | \Delta MADRS ~ EF_Brain.Stem | 1.1509 | 0.2516 | 0.4974 | | 7 | \Delta MADRS ~ EF_Left.Hippocampus | 0.8985 | 0.3704 | 0.5724 | | 8 | \Delta MADRS ~ EF_Left.Amygdala | -0.0018 | 0.9986 | 0.9986 | | 9 | \Delta MADRS ~ EF_Left.Accumbens.area | 0.8038 | 0.4228 | 0.5922 | | 10 | \Delta MADRS ~ EF_Left.VentralDC | 0.5858 | 0.5589 | 0.7091 | | 11 | \Delta MADRS ~ EF_Right.Cerebellum.Cortex | 1.5834 | 0.1154 | 0.3634 | | 12 | \Delta MADRS ~ EF_Right.Thalamus.Proper | 0.9544 | 0.3414 | 0.5475 | | 13 | \Delta MADRS ~ EF_Right.Caudate | 1.7073 | 0.0899 | 0.3530 | | 14 | \Delta MADRS ~ EF_Right.Putamen | 1.3416 | 0.1818 | 0.4380 | | 15 | \Delta MADRS ~ EF_Right.Pallidum | 1.1015 | 0.2725 | 0.5100 | | 16 | \Delta MADRS ~ EF_Right.Hippocampus | 2.0280 | 0.0443 | 0.3530 | | 17 | \Delta MADRS ~ EF_Right.Amygdala | 1.4977 | 0.1363 | 0.4138 | | 18 | \Delta MADRS ~ EF_Right.Accumbens.area | 2.1945 | 0.0297 | 0.3530 | | 19 | \Delta MADRS ~ EF_Right.VentralDC | 1.4640 | 0.1453 | 0.4199 | | 20 | \Delta MADRS ~ EF_ctx.lh.bankssts | -0.3402 | 0.7341 | 0.8455 | | 21 | \Delta MADRS ~ EF_ctx.lh.caudalanteriorcingulate | 0.8038 | 0.4228 | 0.5922 | | 22 | \Delta MADRS ~ EF_ctx.lh.caudalmiddlefrontal | 1.3298 | 0.1856 | 0.4380 | | 23 | \Delta MADRS ~ EF_ctx.lh.cuneus | 1.0436 | 0.2984 | 0.5158 | | 24 | \Delta MADRS ~ EF_ctx.lh.entorhinal | 1.9766 | 0.0499 | 0.3530 | | 25 | \Delta MADRS ~ EF_ctx.lh.fusiform | 1.6062 | 0.1103 | 0.3607 | | 26 | \Delta MADRS ~ EF_ctx.lh.inferiorparietal | 0.9641 | 0.3366 | 0.5475 | | 27 | \Delta MADRS ~ EF_ctx.lh.inferiortemporal | 0.3619 | 0.7180 | 0.8455 | | 28 | \Delta MADRS ~ EF_ctx.lh.isthmuscingulate | 1.2893 | 0.1993 | 0.4380 | | 29 | \Delta MADRS ~ EF_ctx.lh.lateraloccipital | 0.7392 | 0.4609 | 0.6219 | | 30 | \Delta MADRS ~ EF_ctx.lh.lateralorbitofrontal | 0.9012 | 0.3689 | 0.5724 | | 31 | \Delta MADRS ~ EF_ctx.lh.lingual | 1.0934 | 0.2760 | 0.5100 | | 32 | \Delta MADRS ~ EF_ctx.lh.medialorbitofrontal | 1.6548 | 0.1001 | 0.3530 | | 33 | \Delta MADRS ~ EF_ctx.lh.middletemporal | 0.5919 | 0.5548 | 0.7091 | | 34 | \Delta MADRS ~ EF_ctx.lh.parahippocampal | 2.0102 | 0.0462 | 0.3530 | | 35 | \Delta MADRS ~ EF_ctx.lh.paracentral | 1.6410 | 0.1029 | 0.3530 | | 36 | \Delta MADRS ~ EF_ctx.lh.parsopercularis | 0.0712 | 0.9434 | 0.9661 | | 37 | \Delta MADRS ~ EF_ctx.lh.parsorbitalis | -1.6490 | 0.1013 | 0.3530 | | 38 | \Delta MADRS ~ EF_ctx.lh.parstriangularis | -0.5335 | 0.5945 | 0.7323 | | 39 | \Delta MADRS ~ EF_ctx.lh.pericalcarine | 0.2059 | 0.8371 | 0.9245 | | 40 | \Delta MADRS ~ EF_ctx.lh.postcentral | 1.7415 | 0.0837 | 0.3530 | | 41 | \Delta MADRS ~ EF_ctx.lh.posteriorcingulate | 2.9618 | 0.0036 | 0.1513 | | 42 | \Delta MADRS ~ EF_ctx.lh.precentral | 1.2845 | 0.2010 | 0.4380 | | 43 | \Delta MADRS ~ EF_ctx.lh.precuneus | 1.4511 | 0.1489 | 0.4199 | | 44 | \Delta MADRS ~ EF_ctx.lh.rostralanteriorcingulate | -0.1401 | 0.8888 | 0.9563 | | 45 | \Delta MADRS ~ EF_ctx.lh.rostralmiddlefrontal | -0.0831 | 0.9339 | 0.9661 | | 46 | \Delta MADRS ~ EF_ctx.lh.superiorfrontal | 1.2621 | 0.2089 | 0.4402 | | 47 | \Delta MADRS ~ EF_ctx.lh.superiorparietal | 1.9921 | 0.0482 | 0.3530 | | 48 | \Delta MADRS ~ EF_ctx.lh.superiortemporal | 0.1687 | 0.8663 | 0.9440 | | 49 | \Delta MADRS ~ EF_ctx.lh.supramarginal | 0.3719 | 0.7105 | 0.8455 | | 50 | \Delta MADRS ~ EF_ctx.lh.frontalpole | 0.5969 | 0.5515 | 0.7091 | | 51 | \Delta MADRS ~ EF_ctx.lh.temporalpole | 0.5724 | 0.5679 | 0.7099 | | 52 | \Delta MADRS ~ EF_ctx.lh.transversetemporal | -0.8330 | 0.4062 | 0.5922 | | 53 | \Delta MADRS ~ EF_ctx.rh.bankssts | 0.6319 | 0.5284 | 0.7018 | | 54 | \Delta MADRS ~ EF_ctx.rh.caudalanteriorcingulate | 1.3759 | 0.1709 | 0.4380 | | 55 | \Delta MADRS ~ EF_ctx.rh.caudalmiddlefrontal | 1.7846 | 0.0764 | 0.3530 | | 56 | \Delta MADRS ~ EF_ctx.rh.cuneus | 1.2526 | 0.2123 | 0.4402 | | 57 | \Delta MADRS ~ EF_ctx.rh.entorhinal | 2.1299 | 0.0348 | 0.3530 | | 58 | \Delta MADRS ~ EF_ctx.rh.fusiform | 1.7119 | 0.0890 | 0.3530 | | 59 | \Delta MADRS ~ EF_ctx.rh.inferiorparietal | 0.7931 | 0.4290 | 0.5922 | | 60 | \Delta MADRS ~ EF_ctx.rh.inferiortemporal | 0.8641 | 0.3889 | 0.5903 | | 61 | \Delta MADRS ~ EF_ctx.rh.isthmuscingulate | 1.1737 | 0.2424 | 0.4906 | | 62 | \Delta MADRS ~ EF_ctx.rh.lateraloccipital | 1.6365 | 0.1038 | 0.3530 | | 63 | \Delta MADRS ~ EF_ctx.rh.lateralorbitofrontal | 1.3512 | 0.1787 | 0.4380 | | 64 | \Delta MADRS ~ EF_ctx.rh.lingual | 1.0162 | 0.3112 | 0.5186 | | 65 | \Delta MADRS ~ EF_ctx.rh.medialorbitofrontal | 2.5152 | 0.0130 | 0.2753 | | 66 | \Delta MADRS ~ EF_ctx.rh.middletemporal | -0.0983 | 0.9218 | 0.9661 | | 67 | \Delta MADRS ~ EF_ctx.rh.parahippocampal | 1.2959 | 0.1970 | 0.4380 | | 68 | \Delta MADRS ~ EF_ctx.rh.paracentral | 2.2035 | 0.0291 | 0.3530 | | 69 | \Delta MADRS ~ EF_ctx.rh.parsopercularis | 1.0327 | 0.3034 | 0.5158 | | 70 | \Delta MADRS ~ EF_ctx.rh.parsorbitalis | -2.8075 | 0.0057 | 0.1604 | | 71 | \Delta MADRS ~ EF_ctx.rh.parstriangularis | -0.0547 | 0.9564 | 0.9678 | | 72 | \Delta MADRS ~ EF_ctx.rh.pericalcarine | 0.8297 | 0.4080 | 0.5922 | | 73 | \Delta MADRS ~ EF_ctx.rh.postcentral | 1.9125 | 0.0577 | 0.3530 | | 74 | \Delta MADRS ~ EF_ctx.rh.posteriorcingulate | 2.9942 | 0.0032 | 0.1513 | | 75 | \Delta MADRS ~ EF_ctx.rh.precentral | 1.4359 | 0.1531 | 0.4199 | | 76 | \Delta MADRS ~ EF_ctx.rh.precuneus | 1.7473 | 0.0827 | 0.3530 | | 77 | \Delta MADRS ~ EF_ctx.rh.rostralanteriorcingulate | 0.1195 | 0.9051 | 0.9616 | | 78 | \Delta MADRS ~ EF_ctx.rh.rostralmiddlefrontal | 0.4001 | 0.6896 | 0.8374 | | 79 | \Delta MADRS ~ EF_ctx.rh.superiorfrontal | 1.8392 | 0.0679 | 0.3530 | | 80 | \Delta MADRS ~ EF_ctx.rh.superiorparietal | 1.8661 | 0.0640 | 0.3530 | | 81 | \Delta MADRS ~ EF_ctx.rh.superiortemporal | 1.4039 | 0.1624 | 0.4314 | | 82 | \Delta MADRS ~ EF_ctx.rh.supramarginal | 1.0408 | 0.2997 | 0.5158 | | 83 | \Delta MADRS ~ EF_ctx.rh.frontalpole | 1.8559 | 0.0654 | 0.3530 | | 84 | \Delta MADRS ~ EF_ctx.rh.temporalpole | 0.3377 | 0.7361 | 0.8455 | | 85 | \Delta MADRS ~ EF_ctx.rh.transversetemporal | 1.0770 | 0.2832 | 0.5122 |