Qingyang Li | 2013/03/27 | Qingyang.Li@Childmind.org
The reason we care about the smoothness of the data is that we want to make sure the ICC results were not driven or affected by the smoothness of the data from different scan protocols. We can achieve this goal by only making sure the smoothness of the data used as input of ICC calculation are comparable. Report part 1 shows the smoothness of the data before the calculation of resting state connectivity measurse. Report part 1 indicate that there are indeed smoothness difference among the data aquired by different protocol and different downsampling stratergy. Here this report, I wanted to 1) estimate the smoothness of every each input dataset of inputs of ICC calculation. 2) redo data smoothing to those inputs so that they achieve a comaparable smoothness.
The smoothness was estimated by AFNI's 3dFWHMx.
All the derivatives files for the resting-state connectivity measures are 3D volumes while most of the smoothness estimation program reqire a 4D dataset. For 3D volumes, 3dFWHMx has an option “-2difMAD” which can estimate smoothness using 3d volume. For detail about this option, see 3dFWHMx'shelp page. Another way to estimate the smoothness is to concatenate 3D files of all the subjects to a 4D file and estimate group level smoothness. I refer the first method as subject level estimation and the second as group level estimation (sub and grp).
The estimation was done by a bash scripts Smoothestimation_deriv.sh [this file is not accessble online].
Below the Smoothness of the data are plotted. Subject level estimation is plotted as violin plots while group level estimation is plotted as lines.
Some highlights:
setwd("/home2/data/Projects/NKI_TRT_paper/NewAnalysisWithCPAC/Smoothestimation")
library(ggplot2)
plotDeriv_sub <- function(x, deriv, axis = "x", outSummary = "off") {
require(ggplot2)
subdf = subset(x, x$derivative == deriv)
if (outSummary == "on") {
print(summary(subdf))
}
if (axis == "x") {
p = ggplot(data = subdf, mapping = aes(scan, FWHMx, colour = session))
p = p + geom_violin(alpha = 0.5) + stat_summary(fun.y = median, geom = "point",
color = "black", fill = "black", pch = 23, size = 2) + facet_grid(session ~
., scales = "fixed", space = "fixed") + ggtitle(paste(deriv, "FWHMx: Sub_level")) +
xlab("Scan Type") + ylab("Estimated Smoothness")
}
if (axis == "y") {
p = ggplot(data = subdf, mapping = aes(scan, FWHMy, colour = session))
p = p + geom_violin(alpha = 0.5) + stat_summary(fun.y = median, geom = "point",
color = "black", fill = "black", pch = 23, size = 2) + facet_grid(session ~
., scales = "fixed", space = "fixed") + ggtitle(paste(deriv, "FWHMy: Sub_level")) +
xlab("Scan Type") + ylab("Estimated Smoothness")
}
if (axis == "z") {
p = ggplot(data = subdf, mapping = aes(scan, FWHMz, colour = session))
p = p + geom_violin(alpha = 0.5) + stat_summary(fun.y = median, geom = "point",
color = "black", fill = "black", pch = 23, size = 2) + facet_grid(session ~
., scales = "fixed", space = "fixed") + ggtitle(paste(deriv, "FWHMz: Sub_level")) +
xlab("Scan Type") + ylab("Estimated Smoothness")
}
return(p)
}
plotDeriv_grp <- function(x, deriv, axis = "x", outSummary = "off") {
require(ggplot2)
subdf = subset(x, x$derivative == deriv)
if (outSummary == "on") {
print(summary(subdf))
}
if (axis == "x") {
p = ggplot(subdf, aes(x = scan, y = FWHMx, colour = session, group = session))
p = p + geom_line() + geom_point() + ggtitle(paste(deriv, "FWHMx: Grp_level")) +
xlab("Scan Type") + ylab("Estimated Smoothness")
}
if (axis == "y") {
p = ggplot(subdf, aes(x = scan, y = FWHMy, colour = session, group = session))
p = p + geom_line() + geom_point() + ggtitle(paste(deriv, "FWHMy: Grp_level")) +
xlab("Scan Type") + ylab("Estimated Smoothness")
}
if (axis == "z") {
p = ggplot(subdf, aes(x = scan, y = FWHMz, colour = session, group = session))
p = p + geom_line() + geom_point() + ggtitle(paste(deriv, "FWHMz: Grp_level")) +
xlab("Scan Type") + ylab("Estimated Smoothness")
}
return(p)
}
derivs = c("alff", "degree_centrality_binarize", "degree_centrality_weighted",
"falff", "reho", "vmhc", "sca_roi_PNAS_smith10_plus5_1", "sca_roi_PNAS_smith10_plus5_10",
"sca_roi_PNAS_smith10_plus5_11", "sca_roi_PNAS_smith10_plus5_12", "sca_roi_PNAS_smith10_plus5_13",
"sca_roi_PNAS_smith10_plus5_14", "sca_roi_PNAS_smith10_plus5_15", "sca_roi_PNAS_smith10_plus5_2",
"sca_roi_PNAS_smith10_plus5_3", "sca_roi_PNAS_smith10_plus5_4", "sca_roi_PNAS_smith10_plus5_5",
"sca_roi_PNAS_smith10_plus5_6", "sca_roi_PNAS_smith10_plus5_7", "sca_roi_PNAS_smith10_plus5_8",
"sca_roi_PNAS_smith10_plus5_9")
df_sub = read.csv("/home2/data/Projects/NKI_TRT_paper/NewAnalysisWithCPAC/Smoothestimation/SmoothnessofDerivatives_estimated_byAFNI_sub.csv")
# here we only show the data for one of the strategy
df_sub = subset(df_sub, df_sub$pipeline == "pipeline_NewStrawn" & (df_sub$scan ==
"mx_1400_First5Min" | df_sub$scan == "mx_1400_First5MinDS" | df_sub$scan ==
"mx_1400_First5MinDSNF" | df_sub$scan == "mx_645_First5Min" | df_sub$scan ==
"mx_645_First5MinDS" | df_sub$scan == "mx_645_First5MinDSNF" | df_sub$scan ==
"std_2500"))
df_grp = read.csv("/home2/data/Projects/NKI_TRT_paper/NewAnalysisWithCPAC/Smoothestimation/SmoothnessofDerivatives_estimated_byAFNI_grp.csv")
# here we only show the data for one of the strategy
df_grp = subset(df_grp, df_grp$pipeline == "pipeline_NewStrawn" & (df_grp$scan ==
"mx_1400_First5Min" | df_grp$scan == "mx_1400_First5MinDS" | df_grp$scan ==
"mx_1400_First5MinDSNF" | df_grp$scan == "mx_645_First5Min" | df_grp$scan ==
"mx_645_First5MinDS" | df_grp$scan == "mx_645_First5MinDSNF" | df_grp$scan ==
"std_2500"))
summary(df_sub)
## pipeline scan
## pipeline_NewStrawn :6468 mx_1400_First5Min :924
## pipeline_WoodworthTown: 0 mx_1400_First5MinDS :924
## mx_1400_First5MinDSNF:924
## mx_645_First5Min :924
## mx_645_First5MinDS :924
## mx_645_First5MinDSNF :924
## (Other) :924
## derivative session subid
## alff : 308 Min. :1.0 Min. : 21002
## degree_centrality_binarize : 308 1st Qu.:1.0 1st Qu.:1793622
## degree_centrality_weighted : 308 Median :1.5 Median :3257582
## falff : 308 Mean :1.5 Mean :3507852
## reho : 308 3rd Qu.:2.0 3rd Qu.:4176156
## sca_roi_PNAS_smith10_plus5_1: 308 Max. :2.0 Max. :9630905
## (Other) :4620
## FWHMx FWHMy FWHMz
## Min. : 3.55 Min. : 3.65 Min. : 3.19
## 1st Qu.: 5.82 1st Qu.: 5.79 1st Qu.: 5.34
## Median : 6.27 Median : 6.04 Median : 6.00
## Mean : 6.48 Mean : 6.23 Mean : 6.09
## 3rd Qu.: 6.76 3rd Qu.: 6.36 3rd Qu.: 6.49
## Max. :16.43 Max. :12.80 Max. :12.95
##
summary(df_grp)
## pipeline scan
## pipeline_NewStrawn :294 mx_1400_First5Min :42
## pipeline_WoodworthTown: 0 mx_1400_First5MinDS :42
## mx_1400_First5MinDSNF:42
## mx_645_First5Min :42
## mx_645_First5MinDS :42
## mx_645_First5MinDSNF :42
## (Other) :42
## derivative session FWHMx
## alff : 14 Min. :1.0 Min. : 2.25
## degree_centrality_binarize : 14 1st Qu.:1.0 1st Qu.: 8.04
## degree_centrality_weighted : 14 Median :1.5 Median : 8.41
## falff : 14 Mean :1.5 Mean : 8.46
## reho : 14 3rd Qu.:2.0 3rd Qu.: 9.22
## sca_roi_PNAS_smith10_plus5_1: 14 Max. :2.0 Max. :13.59
## (Other) :210
## FWHMy FWHMz
## Min. : 2.44 Min. : 2.43
## 1st Qu.: 8.00 1st Qu.: 7.67
## Median : 8.44 Median : 8.24
## Mean : 8.47 Mean : 8.32
## 3rd Qu.: 8.99 3rd Qu.: 9.13
## Max. :14.72 Max. :15.46
##
for (i in derivs) {
print(plotDeriv_sub(df_sub, i, "x", outSummary = "on"))
print(plotDeriv_grp(df_grp, i, "x", outSummary = "on"))
print(plotDeriv_sub(df_sub, i, "y"))
print(plotDeriv_grp(df_grp, i, "y"))
print(plotDeriv_sub(df_sub, i, "z"))
print(plotDeriv_grp(df_grp, i, "z"))
}
## pipeline scan
## pipeline_NewStrawn :308 mx_1400_First5Min :44
## pipeline_WoodworthTown: 0 mx_1400_First5MinDS :44
## mx_1400_First5MinDSNF:44
## mx_645_First5Min :44
## mx_645_First5MinDS :44
## mx_645_First5MinDSNF :44
## (Other) :44
## derivative session subid
## alff :308 Min. :1.0 Min. : 21002
## degree_centrality_binarize : 0 1st Qu.:1.0 1st Qu.:1793622
## degree_centrality_weighted : 0 Median :1.5 Median :3257582
## falff : 0 Mean :1.5 Mean :3507852
## reho : 0 3rd Qu.:2.0 3rd Qu.:4176156
## sca_roi_PNAS_smith10_plus5_1: 0 Max. :2.0 Max. :9630905
## (Other) : 0
## FWHMx FWHMy FWHMz
## Min. : 6.29 Min. :6.08 Min. :6.23
## 1st Qu.: 7.64 1st Qu.:7.19 1st Qu.:6.83
## Median : 8.33 Median :7.64 Median :7.25
## Mean : 8.34 Mean :7.61 Mean :7.33
## 3rd Qu.: 8.98 3rd Qu.:8.08 3rd Qu.:7.76
## Max. :12.13 Max. :9.34 Max. :9.08
##
## pipeline scan
## pipeline_NewStrawn :14 mx_1400_First5Min :2
## pipeline_WoodworthTown: 0 mx_1400_First5MinDS :2
## mx_1400_First5MinDSNF:2
## mx_645_First5Min :2
## mx_645_First5MinDS :2
## mx_645_First5MinDSNF :2
## (Other) :2
## derivative session FWHMx
## alff :14 Min. :1.0 Min. : 9.78
## degree_centrality_binarize : 0 1st Qu.:1.0 1st Qu.: 9.95
## degree_centrality_weighted : 0 Median :1.5 Median :10.02
## falff : 0 Mean :1.5 Mean :10.14
## reho : 0 3rd Qu.:2.0 3rd Qu.:10.44
## sca_roi_PNAS_smith10_plus5_1: 0 Max. :2.0 Max. :10.50
## (Other) : 0
## FWHMy FWHMz
## Min. : 9.97 Min. : 9.24
## 1st Qu.:10.11 1st Qu.: 9.50
## Median :10.19 Median : 9.83
## Mean :10.25 Mean : 9.79
## 3rd Qu.:10.32 3rd Qu.:10.06
## Max. :10.70 Max. :10.37
##
## pipeline scan
## pipeline_NewStrawn :308 mx_1400_First5Min :44
## pipeline_WoodworthTown: 0 mx_1400_First5MinDS :44
## mx_1400_First5MinDSNF:44
## mx_645_First5Min :44
## mx_645_First5MinDS :44
## mx_645_First5MinDSNF :44
## (Other) :44
## derivative session subid
## degree_centrality_binarize :308 Min. :1.0 Min. : 21002
## alff : 0 1st Qu.:1.0 1st Qu.:1793622
## degree_centrality_weighted : 0 Median :1.5 Median :3257582
## falff : 0 Mean :1.5 Mean :3507852
## reho : 0 3rd Qu.:2.0 3rd Qu.:4176156
## sca_roi_PNAS_smith10_plus5_1: 0 Max. :2.0 Max. :9630905
## (Other) : 0
## FWHMx FWHMy FWHMz
## Min. :5.55 Min. :5.48 Min. :4.82
## 1st Qu.:6.45 1st Qu.:6.38 1st Qu.:5.88
## Median :7.17 Median :6.68 Median :6.93
## Mean :7.09 Mean :6.71 Mean :6.76
## 3rd Qu.:7.69 3rd Qu.:7.04 3rd Qu.:7.56
## Max. :8.83 Max. :8.05 Max. :8.91
##
## pipeline scan
## pipeline_NewStrawn :14 mx_1400_First5Min :2
## pipeline_WoodworthTown: 0 mx_1400_First5MinDS :2
## mx_1400_First5MinDSNF:2
## mx_645_First5Min :2
## mx_645_First5MinDS :2
## mx_645_First5MinDSNF :2
## (Other) :2
## derivative session FWHMx
## degree_centrality_binarize :14 Min. :1.0 Min. :7.31
## alff : 0 1st Qu.:1.0 1st Qu.:7.55
## degree_centrality_weighted : 0 Median :1.5 Median :7.92
## falff : 0 Mean :1.5 Mean :8.02
## reho : 0 3rd Qu.:2.0 3rd Qu.:8.40
## sca_roi_PNAS_smith10_plus5_1: 0 Max. :2.0 Max. :8.98
## (Other) : 0
## FWHMy FWHMz
## Min. :7.57 Min. :7.00
## 1st Qu.:7.83 1st Qu.:7.21
## Median :8.12 Median :7.99
## Mean :8.10 Mean :7.84
## 3rd Qu.:8.24 3rd Qu.:8.32
## Max. :8.89 Max. :8.93
##
## pipeline scan
## pipeline_NewStrawn :308 mx_1400_First5Min :44
## pipeline_WoodworthTown: 0 mx_1400_First5MinDS :44
## mx_1400_First5MinDSNF:44
## mx_645_First5Min :44
## mx_645_First5MinDS :44
## mx_645_First5MinDSNF :44
## (Other) :44
## derivative session subid
## degree_centrality_weighted :308 Min. :1.0 Min. : 21002
## alff : 0 1st Qu.:1.0 1st Qu.:1793622
## degree_centrality_binarize : 0 Median :1.5 Median :3257582
## falff : 0 Mean :1.5 Mean :3507852
## reho : 0 3rd Qu.:2.0 3rd Qu.:4176156
## sca_roi_PNAS_smith10_plus5_1: 0 Max. :2.0 Max. :9630905
## (Other) : 0
## FWHMx FWHMy FWHMz
## Min. :5.53 Min. :5.46 Min. :4.83
## 1st Qu.:6.45 1st Qu.:6.40 1st Qu.:5.89
## Median :7.18 Median :6.70 Median :6.93
## Mean :7.12 Mean :6.74 Mean :6.76
## 3rd Qu.:7.76 3rd Qu.:7.08 3rd Qu.:7.54
## Max. :8.94 Max. :8.10 Max. :9.20
##
## pipeline scan
## pipeline_NewStrawn :14 mx_1400_First5Min :2
## pipeline_WoodworthTown: 0 mx_1400_First5MinDS :2
## mx_1400_First5MinDSNF:2
## mx_645_First5Min :2
## mx_645_First5MinDS :2
## mx_645_First5MinDSNF :2
## (Other) :2
## derivative session FWHMx
## degree_centrality_weighted :14 Min. :1.0 Min. :7.35
## alff : 0 1st Qu.:1.0 1st Qu.:7.67
## degree_centrality_binarize : 0 Median :1.5 Median :8.02
## falff : 0 Mean :1.5 Mean :8.15
## reho : 0 3rd Qu.:2.0 3rd Qu.:8.65
## sca_roi_PNAS_smith10_plus5_1: 0 Max. :2.0 Max. :9.10
## (Other) : 0
## FWHMy FWHMz
## Min. :7.63 Min. :7.08
## 1st Qu.:7.98 1st Qu.:7.38
## Median :8.29 Median :8.36
## Mean :8.26 Mean :8.02
## 3rd Qu.:8.49 3rd Qu.:8.45
## Max. :9.04 Max. :9.11
##
## pipeline scan
## pipeline_NewStrawn :308 mx_1400_First5Min :44
## pipeline_WoodworthTown: 0 mx_1400_First5MinDS :44
## mx_1400_First5MinDSNF:44
## mx_645_First5Min :44
## mx_645_First5MinDS :44
## mx_645_First5MinDSNF :44
## (Other) :44
## derivative session subid
## falff :308 Min. :1.0 Min. : 21002
## alff : 0 1st Qu.:1.0 1st Qu.:1793622
## degree_centrality_binarize : 0 Median :1.5 Median :3257582
## degree_centrality_weighted : 0 Mean :1.5 Mean :3507852
## reho : 0 3rd Qu.:2.0 3rd Qu.:4176156
## sca_roi_PNAS_smith10_plus5_1: 0 Max. :2.0 Max. :9630905
## (Other) : 0
## FWHMx FWHMy FWHMz
## Min. :4.91 Min. :4.84 Min. :4.78
## 1st Qu.:5.64 1st Qu.:5.55 1st Qu.:5.33
## Median :5.99 Median :5.82 Median :5.83
## Mean :6.15 Mean :5.94 Mean :5.85
## 3rd Qu.:6.50 3rd Qu.:6.19 3rd Qu.:6.21
## Max. :8.41 Max. :7.99 Max. :7.37
##
## pipeline scan
## pipeline_NewStrawn :14 mx_1400_First5Min :2
## pipeline_WoodworthTown: 0 mx_1400_First5MinDS :2
## mx_1400_First5MinDSNF:2
## mx_645_First5Min :2
## mx_645_First5MinDS :2
## mx_645_First5MinDSNF :2
## (Other) :2
## derivative session FWHMx
## falff :14 Min. :1.0 Min. : 7.64
## alff : 0 1st Qu.:1.0 1st Qu.: 8.12
## degree_centrality_binarize : 0 Median :1.5 Median : 8.65
## degree_centrality_weighted : 0 Mean :1.5 Mean : 8.84
## reho : 0 3rd Qu.:2.0 3rd Qu.: 9.45
## sca_roi_PNAS_smith10_plus5_1: 0 Max. :2.0 Max. :10.74
## (Other) : 0
## FWHMy FWHMz
## Min. : 7.82 Min. : 7.46
## 1st Qu.: 8.10 1st Qu.: 8.05
## Median : 8.83 Median : 8.75
## Mean : 8.99 Mean : 8.86
## 3rd Qu.: 9.60 3rd Qu.: 9.60
## Max. :10.71 Max. :10.73
##
## pipeline scan
## pipeline_NewStrawn :308 mx_1400_First5Min :44
## pipeline_WoodworthTown: 0 mx_1400_First5MinDS :44
## mx_1400_First5MinDSNF:44
## mx_645_First5Min :44
## mx_645_First5MinDS :44
## mx_645_First5MinDSNF :44
## (Other) :44
## derivative session subid
## reho :308 Min. :1.0 Min. : 21002
## alff : 0 1st Qu.:1.0 1st Qu.:1793622
## degree_centrality_binarize : 0 Median :1.5 Median :3257582
## degree_centrality_weighted : 0 Mean :1.5 Mean :3507852
## falff : 0 3rd Qu.:2.0 3rd Qu.:4176156
## sca_roi_PNAS_smith10_plus5_1: 0 Max. :2.0 Max. :9630905
## (Other) : 0
## FWHMx FWHMy FWHMz
## Min. : 6.96 Min. : 6.89 Min. : 6.55
## 1st Qu.: 8.49 1st Qu.: 8.13 1st Qu.: 7.57
## Median :10.51 Median : 9.54 Median : 9.53
## Mean :10.27 Mean : 9.43 Mean : 9.24
## 3rd Qu.:11.84 3rd Qu.:10.50 3rd Qu.:10.64
## Max. :16.43 Max. :12.80 Max. :12.95
##
## pipeline scan
## pipeline_NewStrawn :14 mx_1400_First5Min :2
## pipeline_WoodworthTown: 0 mx_1400_First5MinDS :2
## mx_1400_First5MinDSNF:2
## mx_645_First5Min :2
## mx_645_First5MinDS :2
## mx_645_First5MinDSNF :2
## (Other) :2
## derivative session FWHMx
## reho :14 Min. :1.0 Min. :10.5
## alff : 0 1st Qu.:1.0 1st Qu.:10.9
## degree_centrality_binarize : 0 Median :1.5 Median :12.9
## degree_centrality_weighted : 0 Mean :1.5 Mean :12.2
## falff : 0 3rd Qu.:2.0 3rd Qu.:13.4
## sca_roi_PNAS_smith10_plus5_1: 0 Max. :2.0 Max. :13.6
## (Other) : 0
## FWHMy FWHMz
## Min. :10.7 Min. :10.8
## 1st Qu.:11.4 1st Qu.:11.6
## Median :13.9 Median :14.3
## Mean :13.0 Mean :13.3
## 3rd Qu.:14.5 3rd Qu.:14.8
## Max. :14.7 Max. :15.5
##
## pipeline scan
## pipeline_NewStrawn :308 mx_1400_First5Min :44
## pipeline_WoodworthTown: 0 mx_1400_First5MinDS :44
## mx_1400_First5MinDSNF:44
## mx_645_First5Min :44
## mx_645_First5MinDS :44
## mx_645_First5MinDSNF :44
## (Other) :44
## derivative session subid
## vmhc :308 Min. :1.0 Min. : 21002
## alff : 0 1st Qu.:1.0 1st Qu.:1793622
## degree_centrality_binarize: 0 Median :1.5 Median :3257582
## degree_centrality_weighted: 0 Mean :1.5 Mean :3507852
## falff : 0 3rd Qu.:2.0 3rd Qu.:4176156
## reho : 0 Max. :2.0 Max. :9630905
## (Other) : 0
## FWHMx FWHMy FWHMz
## Min. :3.55 Min. :3.65 Min. :3.19
## 1st Qu.:4.06 1st Qu.:4.15 1st Qu.:4.21
## Median :4.26 Median :4.44 Median :4.50
## Mean :4.26 Mean :4.46 Mean :4.45
## 3rd Qu.:4.46 3rd Qu.:4.74 3rd Qu.:4.68
## Max. :4.93 Max. :5.81 Max. :5.32
##
## pipeline scan
## pipeline_NewStrawn :14 mx_1400_First5Min :2
## pipeline_WoodworthTown: 0 mx_1400_First5MinDS :2
## mx_1400_First5MinDSNF:2
## mx_645_First5Min :2
## mx_645_First5MinDS :2
## mx_645_First5MinDSNF :2
## (Other) :2
## derivative session FWHMx
## vmhc :14 Min. :1.0 Min. :2.25
## alff : 0 1st Qu.:1.0 1st Qu.:2.30
## degree_centrality_binarize: 0 Median :1.5 Median :2.38
## degree_centrality_weighted: 0 Mean :1.5 Mean :2.35
## falff : 0 3rd Qu.:2.0 3rd Qu.:2.40
## reho : 0 Max. :2.0 Max. :2.43
## (Other) : 0
## FWHMy FWHMz
## Min. :2.44 Min. :2.43
## 1st Qu.:2.49 1st Qu.:2.49
## Median :2.57 Median :2.56
## Mean :2.54 Mean :2.53
## 3rd Qu.:2.59 3rd Qu.:2.58
## Max. :2.61 Max. :2.61
##
## pipeline scan
## pipeline_NewStrawn :308 mx_1400_First5Min :44
## pipeline_WoodworthTown: 0 mx_1400_First5MinDS :44
## mx_1400_First5MinDSNF:44
## mx_645_First5Min :44
## mx_645_First5MinDS :44
## mx_645_First5MinDSNF :44
## (Other) :44
## derivative session subid
## sca_roi_PNAS_smith10_plus5_1:308 Min. :1.0 Min. : 21002
## alff : 0 1st Qu.:1.0 1st Qu.:1793622
## degree_centrality_binarize : 0 Median :1.5 Median :3257582
## degree_centrality_weighted : 0 Mean :1.5 Mean :3507852
## falff : 0 3rd Qu.:2.0 3rd Qu.:4176156
## reho : 0 Max. :2.0 Max. :9630905
## (Other) : 0
## FWHMx FWHMy FWHMz
## Min. :5.24 Min. :5.37 Min. :4.68
## 1st Qu.:5.77 1st Qu.:5.80 1st Qu.:5.31
## Median :6.14 Median :6.00 Median :5.90
## Mean :6.17 Mean :6.01 Mean :5.83
## 3rd Qu.:6.52 3rd Qu.:6.18 3rd Qu.:6.29
## Max. :7.35 Max. :6.80 Max. :6.90
##
## pipeline scan
## pipeline_NewStrawn :14 mx_1400_First5Min :2
## pipeline_WoodworthTown: 0 mx_1400_First5MinDS :2
## mx_1400_First5MinDSNF:2
## mx_645_First5Min :2
## mx_645_First5MinDS :2
## mx_645_First5MinDSNF :2
## (Other) :2
## derivative session FWHMx
## sca_roi_PNAS_smith10_plus5_1:14 Min. :1.0 Min. :7.87
## alff : 0 1st Qu.:1.0 1st Qu.:8.46
## degree_centrality_binarize : 0 Median :1.5 Median :8.68
## degree_centrality_weighted : 0 Mean :1.5 Mean :8.82
## falff : 0 3rd Qu.:2.0 3rd Qu.:9.32
## reho : 0 Max. :2.0 Max. :9.87
## (Other) : 0
## FWHMy FWHMz
## Min. :8.01 Min. :7.19
## 1st Qu.:8.38 1st Qu.:8.00
## Median :8.76 Median :8.22
## Mean :8.79 Mean :8.48
## 3rd Qu.:9.15 3rd Qu.:9.21
## Max. :9.57 Max. :9.65
##
## pipeline scan
## pipeline_NewStrawn :308 mx_1400_First5Min :44
## pipeline_WoodworthTown: 0 mx_1400_First5MinDS :44
## mx_1400_First5MinDSNF:44
## mx_645_First5Min :44
## mx_645_First5MinDS :44
## mx_645_First5MinDSNF :44
## (Other) :44
## derivative session subid
## sca_roi_PNAS_smith10_plus5_10:308 Min. :1.0 Min. : 21002
## alff : 0 1st Qu.:1.0 1st Qu.:1793622
## degree_centrality_binarize : 0 Median :1.5 Median :3257582
## degree_centrality_weighted : 0 Mean :1.5 Mean :3507852
## falff : 0 3rd Qu.:2.0 3rd Qu.:4176156
## reho : 0 Max. :2.0 Max. :9630905
## (Other) : 0
## FWHMx FWHMy FWHMz
## Min. :5.23 Min. :5.27 Min. :4.70
## 1st Qu.:5.80 1st Qu.:5.82 1st Qu.:5.33
## Median :6.15 Median :6.02 Median :5.91
## Mean :6.17 Mean :6.02 Mean :5.83
## 3rd Qu.:6.54 3rd Qu.:6.20 3rd Qu.:6.31
## Max. :7.13 Max. :7.15 Max. :6.85
##
## pipeline scan
## pipeline_NewStrawn :14 mx_1400_First5Min :2
## pipeline_WoodworthTown: 0 mx_1400_First5MinDS :2
## mx_1400_First5MinDSNF:2
## mx_645_First5Min :2
## mx_645_First5MinDS :2
## mx_645_First5MinDSNF :2
## (Other) :2
## derivative session FWHMx
## sca_roi_PNAS_smith10_plus5_10:14 Min. :1.0 Min. :7.92
## alff : 0 1st Qu.:1.0 1st Qu.:8.29
## degree_centrality_binarize : 0 Median :1.5 Median :8.50
## degree_centrality_weighted : 0 Mean :1.5 Mean :8.62
## falff : 0 3rd Qu.:2.0 3rd Qu.:9.01
## reho : 0 Max. :2.0 Max. :9.49
## (Other) : 0
## FWHMy FWHMz
## Min. :7.95 Min. :7.32
## 1st Qu.:8.18 1st Qu.:7.99
## Median :8.53 Median :8.13
## Mean :8.53 Mean :8.34
## 3rd Qu.:8.83 3rd Qu.:8.86
## Max. :9.16 Max. :9.33
##
## pipeline scan
## pipeline_NewStrawn :308 mx_1400_First5Min :44
## pipeline_WoodworthTown: 0 mx_1400_First5MinDS :44
## mx_1400_First5MinDSNF:44
## mx_645_First5Min :44
## mx_645_First5MinDS :44
## mx_645_First5MinDSNF :44
## (Other) :44
## derivative session subid
## sca_roi_PNAS_smith10_plus5_11:308 Min. :1.0 Min. : 21002
## alff : 0 1st Qu.:1.0 1st Qu.:1793622
## degree_centrality_binarize : 0 Median :1.5 Median :3257582
## degree_centrality_weighted : 0 Mean :1.5 Mean :3507852
## falff : 0 3rd Qu.:2.0 3rd Qu.:4176156
## reho : 0 Max. :2.0 Max. :9630905
## (Other) : 0
## FWHMx FWHMy FWHMz
## Min. :5.28 Min. :5.33 Min. :4.79
## 1st Qu.:5.79 1st Qu.:5.78 1st Qu.:5.29
## Median :6.11 Median :5.95 Median :5.83
## Mean :6.16 Mean :5.97 Mean :5.82
## 3rd Qu.:6.52 3rd Qu.:6.16 3rd Qu.:6.30
## Max. :7.33 Max. :6.71 Max. :7.26
##
## pipeline scan
## pipeline_NewStrawn :14 mx_1400_First5Min :2
## pipeline_WoodworthTown: 0 mx_1400_First5MinDS :2
## mx_1400_First5MinDSNF:2
## mx_645_First5Min :2
## mx_645_First5MinDS :2
## mx_645_First5MinDSNF :2
## (Other) :2
## derivative session FWHMx
## sca_roi_PNAS_smith10_plus5_11:14 Min. :1.0 Min. :7.60
## alff : 0 1st Qu.:1.0 1st Qu.:8.22
## degree_centrality_binarize : 0 Median :1.5 Median :8.25
## degree_centrality_weighted : 0 Mean :1.5 Mean :8.45
## falff : 0 3rd Qu.:2.0 3rd Qu.:8.85
## reho : 0 Max. :2.0 Max. :9.35
## (Other) : 0
## FWHMy FWHMz
## Min. :7.71 Min. :7.01
## 1st Qu.:8.03 1st Qu.:7.78
## Median :8.37 Median :7.98
## Mean :8.38 Mean :8.24
## 3rd Qu.:8.66 3rd Qu.:8.87
## Max. :9.09 Max. :9.30
##
## pipeline scan
## pipeline_NewStrawn :308 mx_1400_First5Min :44
## pipeline_WoodworthTown: 0 mx_1400_First5MinDS :44
## mx_1400_First5MinDSNF:44
## mx_645_First5Min :44
## mx_645_First5MinDS :44
## mx_645_First5MinDSNF :44
## (Other) :44
## derivative session subid
## sca_roi_PNAS_smith10_plus5_12:308 Min. :1.0 Min. : 21002
## alff : 0 1st Qu.:1.0 1st Qu.:1793622
## degree_centrality_binarize : 0 Median :1.5 Median :3257582
## degree_centrality_weighted : 0 Mean :1.5 Mean :3507852
## falff : 0 3rd Qu.:2.0 3rd Qu.:4176156
## reho : 0 Max. :2.0 Max. :9630905
## (Other) : 0
## FWHMx FWHMy FWHMz
## Min. :5.34 Min. :5.29 Min. :4.63
## 1st Qu.:5.81 1st Qu.:5.79 1st Qu.:5.33
## Median :6.15 Median :5.97 Median :5.84
## Mean :6.20 Mean :5.98 Mean :5.82
## 3rd Qu.:6.56 3rd Qu.:6.17 3rd Qu.:6.32
## Max. :7.60 Max. :6.67 Max. :7.02
##
## pipeline scan
## pipeline_NewStrawn :14 mx_1400_First5Min :2
## pipeline_WoodworthTown: 0 mx_1400_First5MinDS :2
## mx_1400_First5MinDSNF:2
## mx_645_First5Min :2
## mx_645_First5MinDS :2
## mx_645_First5MinDSNF :2
## (Other) :2
## derivative session FWHMx
## sca_roi_PNAS_smith10_plus5_12:14 Min. :1.0 Min. :7.57
## alff : 0 1st Qu.:1.0 1st Qu.:8.12
## degree_centrality_binarize : 0 Median :1.5 Median :8.17
## degree_centrality_weighted : 0 Mean :1.5 Mean :8.35
## falff : 0 3rd Qu.:2.0 3rd Qu.:8.74
## reho : 0 Max. :2.0 Max. :9.23
## (Other) : 0
## FWHMy FWHMz
## Min. :7.67 Min. :6.96
## 1st Qu.:7.88 1st Qu.:7.67
## Median :8.31 Median :7.78
## Mean :8.26 Mean :8.07
## 3rd Qu.:8.51 3rd Qu.:8.73
## Max. :8.92 Max. :9.16
##
## pipeline scan
## pipeline_NewStrawn :308 mx_1400_First5Min :44
## pipeline_WoodworthTown: 0 mx_1400_First5MinDS :44
## mx_1400_First5MinDSNF:44
## mx_645_First5Min :44
## mx_645_First5MinDS :44
## mx_645_First5MinDSNF :44
## (Other) :44
## derivative session subid
## sca_roi_PNAS_smith10_plus5_13:308 Min. :1.0 Min. : 21002
## alff : 0 1st Qu.:1.0 1st Qu.:1793622
## degree_centrality_binarize : 0 Median :1.5 Median :3257582
## degree_centrality_weighted : 0 Mean :1.5 Mean :3507852
## falff : 0 3rd Qu.:2.0 3rd Qu.:4176156
## reho : 0 Max. :2.0 Max. :9630905
## (Other) : 0
## FWHMx FWHMy FWHMz
## Min. :5.41 Min. :5.37 Min. :4.93
## 1st Qu.:5.90 1st Qu.:5.85 1st Qu.:5.42
## Median :6.26 Median :6.03 Median :5.95
## Mean :6.27 Mean :6.05 Mean :5.92
## 3rd Qu.:6.59 3rd Qu.:6.24 3rd Qu.:6.38
## Max. :7.37 Max. :7.12 Max. :7.28
##
## pipeline scan
## pipeline_NewStrawn :14 mx_1400_First5Min :2
## pipeline_WoodworthTown: 0 mx_1400_First5MinDS :2
## mx_1400_First5MinDSNF:2
## mx_645_First5Min :2
## mx_645_First5MinDS :2
## mx_645_First5MinDSNF :2
## (Other) :2
## derivative session FWHMx
## sca_roi_PNAS_smith10_plus5_13:14 Min. :1.0 Min. :7.43
## alff : 0 1st Qu.:1.0 1st Qu.:8.04
## degree_centrality_binarize : 0 Median :1.5 Median :8.17
## degree_centrality_weighted : 0 Mean :1.5 Mean :8.33
## falff : 0 3rd Qu.:2.0 3rd Qu.:8.84
## reho : 0 Max. :2.0 Max. :9.25
## (Other) : 0
## FWHMy FWHMz
## Min. :7.58 Min. :6.85
## 1st Qu.:7.97 1st Qu.:7.64
## Median :8.28 Median :7.88
## Mean :8.29 Mean :8.10
## 3rd Qu.:8.61 3rd Qu.:8.82
## Max. :9.00 Max. :9.15
##
## pipeline scan
## pipeline_NewStrawn :308 mx_1400_First5Min :44
## pipeline_WoodworthTown: 0 mx_1400_First5MinDS :44
## mx_1400_First5MinDSNF:44
## mx_645_First5Min :44
## mx_645_First5MinDS :44
## mx_645_First5MinDSNF :44
## (Other) :44
## derivative session subid
## sca_roi_PNAS_smith10_plus5_14:308 Min. :1.0 Min. : 21002
## alff : 0 1st Qu.:1.0 1st Qu.:1793622
## degree_centrality_binarize : 0 Median :1.5 Median :3257582
## degree_centrality_weighted : 0 Mean :1.5 Mean :3507852
## falff : 0 3rd Qu.:2.0 3rd Qu.:4176156
## reho : 0 Max. :2.0 Max. :9630905
## (Other) : 0
## FWHMx FWHMy FWHMz
## Min. :5.26 Min. :5.47 Min. :4.68
## 1st Qu.:5.87 1st Qu.:5.82 1st Qu.:5.36
## Median :6.18 Median :6.00 Median :5.83
## Mean :6.21 Mean :6.02 Mean :5.82
## 3rd Qu.:6.54 3rd Qu.:6.20 3rd Qu.:6.26
## Max. :7.30 Max. :6.98 Max. :6.93
##
## pipeline scan
## pipeline_NewStrawn :14 mx_1400_First5Min :2
## pipeline_WoodworthTown: 0 mx_1400_First5MinDS :2
## mx_1400_First5MinDSNF:2
## mx_645_First5Min :2
## mx_645_First5MinDS :2
## mx_645_First5MinDSNF :2
## (Other) :2
## derivative session FWHMx
## sca_roi_PNAS_smith10_plus5_14:14 Min. :1.0 Min. :7.87
## alff : 0 1st Qu.:1.0 1st Qu.:8.35
## degree_centrality_binarize : 0 Median :1.5 Median :8.52
## degree_centrality_weighted : 0 Mean :1.5 Mean :8.63
## falff : 0 3rd Qu.:2.0 3rd Qu.:8.97
## reho : 0 Max. :2.0 Max. :9.52
## (Other) : 0
## FWHMy FWHMz
## Min. :7.91 Min. :7.31
## 1st Qu.:8.15 1st Qu.:8.08
## Median :8.55 Median :8.22
## Mean :8.49 Mean :8.44
## 3rd Qu.:8.69 3rd Qu.:8.93
## Max. :9.13 Max. :9.52
##
## pipeline scan
## pipeline_NewStrawn :308 mx_1400_First5Min :44
## pipeline_WoodworthTown: 0 mx_1400_First5MinDS :44
## mx_1400_First5MinDSNF:44
## mx_645_First5Min :44
## mx_645_First5MinDS :44
## mx_645_First5MinDSNF :44
## (Other) :44
## derivative session subid
## sca_roi_PNAS_smith10_plus5_15:308 Min. :1.0 Min. : 21002
## alff : 0 1st Qu.:1.0 1st Qu.:1793622
## degree_centrality_binarize : 0 Median :1.5 Median :3257582
## degree_centrality_weighted : 0 Mean :1.5 Mean :3507852
## falff : 0 3rd Qu.:2.0 3rd Qu.:4176156
## reho : 0 Max. :2.0 Max. :9630905
## (Other) : 0
## FWHMx FWHMy FWHMz
## Min. :5.29 Min. :5.36 Min. :4.58
## 1st Qu.:5.82 1st Qu.:5.80 1st Qu.:5.36
## Median :6.12 Median :5.97 Median :5.84
## Mean :6.19 Mean :6.00 Mean :5.82
## 3rd Qu.:6.55 3rd Qu.:6.18 3rd Qu.:6.29
## Max. :7.44 Max. :6.83 Max. :6.76
##
## pipeline scan
## pipeline_NewStrawn :14 mx_1400_First5Min :2
## pipeline_WoodworthTown: 0 mx_1400_First5MinDS :2
## mx_1400_First5MinDSNF:2
## mx_645_First5Min :2
## mx_645_First5MinDS :2
## mx_645_First5MinDSNF :2
## (Other) :2
## derivative session FWHMx
## sca_roi_PNAS_smith10_plus5_15:14 Min. :1.0 Min. :7.74
## alff : 0 1st Qu.:1.0 1st Qu.:8.18
## degree_centrality_binarize : 0 Median :1.5 Median :8.38
## degree_centrality_weighted : 0 Mean :1.5 Mean :8.50
## falff : 0 3rd Qu.:2.0 3rd Qu.:8.93
## reho : 0 Max. :2.0 Max. :9.42
## (Other) : 0
## FWHMy FWHMz
## Min. :7.69 Min. :7.22
## 1st Qu.:7.95 1st Qu.:7.95
## Median :8.41 Median :8.10
## Mean :8.30 Mean :8.27
## 3rd Qu.:8.58 3rd Qu.:8.86
## Max. :8.98 Max. :9.35
##
## pipeline scan
## pipeline_NewStrawn :308 mx_1400_First5Min :44
## pipeline_WoodworthTown: 0 mx_1400_First5MinDS :44
## mx_1400_First5MinDSNF:44
## mx_645_First5Min :44
## mx_645_First5MinDS :44
## mx_645_First5MinDSNF :44
## (Other) :44
## derivative session subid
## sca_roi_PNAS_smith10_plus5_2:308 Min. :1.0 Min. : 21002
## alff : 0 1st Qu.:1.0 1st Qu.:1793622
## degree_centrality_binarize : 0 Median :1.5 Median :3257582
## degree_centrality_weighted : 0 Mean :1.5 Mean :3507852
## falff : 0 3rd Qu.:2.0 3rd Qu.:4176156
## reho : 0 Max. :2.0 Max. :9630905
## (Other) : 0
## FWHMx FWHMy FWHMz
## Min. :5.24 Min. :5.30 Min. :4.60
## 1st Qu.:5.74 1st Qu.:5.77 1st Qu.:5.28
## Median :6.07 Median :5.92 Median :5.87
## Mean :6.10 Mean :5.95 Mean :5.81
## 3rd Qu.:6.45 3rd Qu.:6.12 3rd Qu.:6.28
## Max. :7.27 Max. :6.86 Max. :7.04
##
## pipeline scan
## pipeline_NewStrawn :14 mx_1400_First5Min :2
## pipeline_WoodworthTown: 0 mx_1400_First5MinDS :2
## mx_1400_First5MinDSNF:2
## mx_645_First5Min :2
## mx_645_First5MinDS :2
## mx_645_First5MinDSNF :2
## (Other) :2
## derivative session FWHMx
## sca_roi_PNAS_smith10_plus5_2:14 Min. :1.0 Min. :7.50
## alff : 0 1st Qu.:1.0 1st Qu.:8.03
## degree_centrality_binarize : 0 Median :1.5 Median :8.32
## degree_centrality_weighted : 0 Mean :1.5 Mean :8.47
## falff : 0 3rd Qu.:2.0 3rd Qu.:8.97
## reho : 0 Max. :2.0 Max. :9.51
## (Other) : 0
## FWHMy FWHMz
## Min. :7.54 Min. :6.82
## 1st Qu.:8.01 1st Qu.:7.51
## Median :8.17 Median :8.00
## Mean :8.30 Mean :8.09
## 3rd Qu.:8.62 3rd Qu.:8.72
## Max. :9.15 Max. :9.27
##
## pipeline scan
## pipeline_NewStrawn :308 mx_1400_First5Min :44
## pipeline_WoodworthTown: 0 mx_1400_First5MinDS :44
## mx_1400_First5MinDSNF:44
## mx_645_First5Min :44
## mx_645_First5MinDS :44
## mx_645_First5MinDSNF :44
## (Other) :44
## derivative session subid
## sca_roi_PNAS_smith10_plus5_3:308 Min. :1.0 Min. : 21002
## alff : 0 1st Qu.:1.0 1st Qu.:1793622
## degree_centrality_binarize : 0 Median :1.5 Median :3257582
## degree_centrality_weighted : 0 Mean :1.5 Mean :3507852
## falff : 0 3rd Qu.:2.0 3rd Qu.:4176156
## reho : 0 Max. :2.0 Max. :9630905
## (Other) : 0
## FWHMx FWHMy FWHMz
## Min. :5.33 Min. :5.37 Min. :4.88
## 1st Qu.:5.87 1st Qu.:5.84 1st Qu.:5.35
## Median :6.25 Median :6.03 Median :5.95
## Mean :6.26 Mean :6.05 Mean :5.88
## 3rd Qu.:6.64 3rd Qu.:6.23 3rd Qu.:6.35
## Max. :7.21 Max. :7.15 Max. :7.02
##
## pipeline scan
## pipeline_NewStrawn :14 mx_1400_First5Min :2
## pipeline_WoodworthTown: 0 mx_1400_First5MinDS :2
## mx_1400_First5MinDSNF:2
## mx_645_First5Min :2
## mx_645_First5MinDS :2
## mx_645_First5MinDSNF :2
## (Other) :2
## derivative session FWHMx
## sca_roi_PNAS_smith10_plus5_3:14 Min. :1.0 Min. :7.94
## alff : 0 1st Qu.:1.0 1st Qu.:8.53
## degree_centrality_binarize : 0 Median :1.5 Median :8.84
## degree_centrality_weighted : 0 Mean :1.5 Mean :8.92
## falff : 0 3rd Qu.:2.0 3rd Qu.:9.46
## reho : 0 Max. :2.0 Max. :9.95
## (Other) : 0
## FWHMy FWHMz
## Min. :8.15 Min. : 7.49
## 1st Qu.:8.67 1st Qu.: 8.26
## Median :8.96 Median : 8.79
## Mean :9.03 Mean : 8.93
## 3rd Qu.:9.46 3rd Qu.: 9.81
## Max. :9.87 Max. :10.15
##
## pipeline scan
## pipeline_NewStrawn :308 mx_1400_First5Min :44
## pipeline_WoodworthTown: 0 mx_1400_First5MinDS :44
## mx_1400_First5MinDSNF:44
## mx_645_First5Min :44
## mx_645_First5MinDS :44
## mx_645_First5MinDSNF :44
## (Other) :44
## derivative session subid
## sca_roi_PNAS_smith10_plus5_4:308 Min. :1.0 Min. : 21002
## alff : 0 1st Qu.:1.0 1st Qu.:1793622
## degree_centrality_binarize : 0 Median :1.5 Median :3257582
## degree_centrality_weighted : 0 Mean :1.5 Mean :3507852
## falff : 0 3rd Qu.:2.0 3rd Qu.:4176156
## reho : 0 Max. :2.0 Max. :9630905
## (Other) : 0
## FWHMx FWHMy FWHMz
## Min. :5.23 Min. :5.30 Min. :4.80
## 1st Qu.:5.86 1st Qu.:5.80 1st Qu.:5.36
## Median :6.21 Median :5.97 Median :5.95
## Mean :6.24 Mean :5.99 Mean :5.87
## 3rd Qu.:6.61 3rd Qu.:6.17 3rd Qu.:6.35
## Max. :7.24 Max. :6.75 Max. :7.00
##
## pipeline scan
## pipeline_NewStrawn :14 mx_1400_First5Min :2
## pipeline_WoodworthTown: 0 mx_1400_First5MinDS :2
## mx_1400_First5MinDSNF:2
## mx_645_First5Min :2
## mx_645_First5MinDS :2
## mx_645_First5MinDSNF :2
## (Other) :2
## derivative session FWHMx
## sca_roi_PNAS_smith10_plus5_4:14 Min. :1.0 Min. :7.59
## alff : 0 1st Qu.:1.0 1st Qu.:8.12
## degree_centrality_binarize : 0 Median :1.5 Median :8.37
## degree_centrality_weighted : 0 Mean :1.5 Mean :8.48
## falff : 0 3rd Qu.:2.0 3rd Qu.:9.02
## reho : 0 Max. :2.0 Max. :9.45
## (Other) : 0
## FWHMy FWHMz
## Min. :7.80 Min. :7.07
## 1st Qu.:8.20 1st Qu.:7.74
## Median :8.46 Median :8.17
## Mean :8.59 Mean :8.37
## 3rd Qu.:9.09 3rd Qu.:9.27
## Max. :9.43 Max. :9.59
##
## pipeline scan
## pipeline_NewStrawn :308 mx_1400_First5Min :44
## pipeline_WoodworthTown: 0 mx_1400_First5MinDS :44
## mx_1400_First5MinDSNF:44
## mx_645_First5Min :44
## mx_645_First5MinDS :44
## mx_645_First5MinDSNF :44
## (Other) :44
## derivative session subid
## sca_roi_PNAS_smith10_plus5_5:308 Min. :1.0 Min. : 21002
## alff : 0 1st Qu.:1.0 1st Qu.:1793622
## degree_centrality_binarize : 0 Median :1.5 Median :3257582
## degree_centrality_weighted : 0 Mean :1.5 Mean :3507852
## falff : 0 3rd Qu.:2.0 3rd Qu.:4176156
## reho : 0 Max. :2.0 Max. :9630905
## (Other) : 0
## FWHMx FWHMy FWHMz
## Min. :5.26 Min. :5.32 Min. :4.71
## 1st Qu.:5.79 1st Qu.:5.76 1st Qu.:5.30
## Median :6.13 Median :5.96 Median :5.87
## Mean :6.18 Mean :5.96 Mean :5.82
## 3rd Qu.:6.54 3rd Qu.:6.15 3rd Qu.:6.30
## Max. :7.32 Max. :7.12 Max. :7.05
##
## pipeline scan
## pipeline_NewStrawn :14 mx_1400_First5Min :2
## pipeline_WoodworthTown: 0 mx_1400_First5MinDS :2
## mx_1400_First5MinDSNF:2
## mx_645_First5Min :2
## mx_645_First5MinDS :2
## mx_645_First5MinDSNF :2
## (Other) :2
## derivative session FWHMx
## sca_roi_PNAS_smith10_plus5_5:14 Min. :1.0 Min. :7.64
## alff : 0 1st Qu.:1.0 1st Qu.:8.14
## degree_centrality_binarize : 0 Median :1.5 Median :8.40
## degree_centrality_weighted : 0 Mean :1.5 Mean :8.59
## falff : 0 3rd Qu.:2.0 3rd Qu.:9.20
## reho : 0 Max. :2.0 Max. :9.65
## (Other) : 0
## FWHMy FWHMz
## Min. :7.63 Min. :7.08
## 1st Qu.:8.00 1st Qu.:7.88
## Median :8.27 Median :8.05
## Mean :8.36 Mean :8.29
## 3rd Qu.:8.77 3rd Qu.:9.04
## Max. :9.17 Max. :9.45
##
## pipeline scan
## pipeline_NewStrawn :308 mx_1400_First5Min :44
## pipeline_WoodworthTown: 0 mx_1400_First5MinDS :44
## mx_1400_First5MinDSNF:44
## mx_645_First5Min :44
## mx_645_First5MinDS :44
## mx_645_First5MinDSNF :44
## (Other) :44
## derivative session subid
## sca_roi_PNAS_smith10_plus5_6:308 Min. :1.0 Min. : 21002
## alff : 0 1st Qu.:1.0 1st Qu.:1793622
## degree_centrality_binarize : 0 Median :1.5 Median :3257582
## degree_centrality_weighted : 0 Mean :1.5 Mean :3507852
## falff : 0 3rd Qu.:2.0 3rd Qu.:4176156
## reho : 0 Max. :2.0 Max. :9630905
## (Other) : 0
## FWHMx FWHMy FWHMz
## Min. :5.29 Min. :5.36 Min. :4.65
## 1st Qu.:5.83 1st Qu.:5.75 1st Qu.:5.34
## Median :6.16 Median :5.96 Median :5.89
## Mean :6.19 Mean :5.98 Mean :5.84
## 3rd Qu.:6.57 3rd Qu.:6.16 3rd Qu.:6.29
## Max. :7.38 Max. :7.17 Max. :7.23
##
## pipeline scan
## pipeline_NewStrawn :14 mx_1400_First5Min :2
## pipeline_WoodworthTown: 0 mx_1400_First5MinDS :2
## mx_1400_First5MinDSNF:2
## mx_645_First5Min :2
## mx_645_First5MinDS :2
## mx_645_First5MinDSNF :2
## (Other) :2
## derivative session FWHMx
## sca_roi_PNAS_smith10_plus5_6:14 Min. :1.0 Min. :7.40
## alff : 0 1st Qu.:1.0 1st Qu.:7.91
## degree_centrality_binarize : 0 Median :1.5 Median :8.24
## degree_centrality_weighted : 0 Mean :1.5 Mean :8.37
## falff : 0 3rd Qu.:2.0 3rd Qu.:8.87
## reho : 0 Max. :2.0 Max. :9.44
## (Other) : 0
## FWHMy FWHMz
## Min. :7.44 Min. :6.69
## 1st Qu.:7.78 1st Qu.:7.43
## Median :7.99 Median :7.71
## Mean :8.18 Mean :7.91
## 3rd Qu.:8.53 3rd Qu.:8.55
## Max. :9.01 Max. :9.06
##
## pipeline scan
## pipeline_NewStrawn :308 mx_1400_First5Min :44
## pipeline_WoodworthTown: 0 mx_1400_First5MinDS :44
## mx_1400_First5MinDSNF:44
## mx_645_First5Min :44
## mx_645_First5MinDS :44
## mx_645_First5MinDSNF :44
## (Other) :44
## derivative session subid
## sca_roi_PNAS_smith10_plus5_7:308 Min. :1.0 Min. : 21002
## alff : 0 1st Qu.:1.0 1st Qu.:1793622
## degree_centrality_binarize : 0 Median :1.5 Median :3257582
## degree_centrality_weighted : 0 Mean :1.5 Mean :3507852
## falff : 0 3rd Qu.:2.0 3rd Qu.:4176156
## reho : 0 Max. :2.0 Max. :9630905
## (Other) : 0
## FWHMx FWHMy FWHMz
## Min. :5.31 Min. :5.36 Min. :4.91
## 1st Qu.:5.83 1st Qu.:5.78 1st Qu.:5.34
## Median :6.17 Median :5.98 Median :5.95
## Mean :6.22 Mean :6.00 Mean :5.89
## 3rd Qu.:6.61 3rd Qu.:6.19 3rd Qu.:6.38
## Max. :7.31 Max. :6.87 Max. :7.11
##
## pipeline scan
## pipeline_NewStrawn :14 mx_1400_First5Min :2
## pipeline_WoodworthTown: 0 mx_1400_First5MinDS :2
## mx_1400_First5MinDSNF:2
## mx_645_First5Min :2
## mx_645_First5MinDS :2
## mx_645_First5MinDSNF :2
## (Other) :2
## derivative session FWHMx
## sca_roi_PNAS_smith10_plus5_7:14 Min. :1.0 Min. :7.27
## alff : 0 1st Qu.:1.0 1st Qu.:7.76
## degree_centrality_binarize : 0 Median :1.5 Median :7.98
## degree_centrality_weighted : 0 Mean :1.5 Mean :8.15
## falff : 0 3rd Qu.:2.0 3rd Qu.:8.76
## reho : 0 Max. :2.0 Max. :9.12
## (Other) : 0
## FWHMy FWHMz
## Min. :7.47 Min. :6.68
## 1st Qu.:7.92 1st Qu.:7.28
## Median :8.08 Median :7.66
## Mean :8.19 Mean :7.88
## 3rd Qu.:8.67 3rd Qu.:8.74
## Max. :9.04 Max. :8.97
##
## pipeline scan
## pipeline_NewStrawn :308 mx_1400_First5Min :44
## pipeline_WoodworthTown: 0 mx_1400_First5MinDS :44
## mx_1400_First5MinDSNF:44
## mx_645_First5Min :44
## mx_645_First5MinDS :44
## mx_645_First5MinDSNF :44
## (Other) :44
## derivative session subid
## sca_roi_PNAS_smith10_plus5_8:308 Min. :1.0 Min. : 21002
## alff : 0 1st Qu.:1.0 1st Qu.:1793622
## degree_centrality_binarize : 0 Median :1.5 Median :3257582
## degree_centrality_weighted : 0 Mean :1.5 Mean :3507852
## falff : 0 3rd Qu.:2.0 3rd Qu.:4176156
## reho : 0 Max. :2.0 Max. :9630905
## (Other) : 0
## FWHMx FWHMy FWHMz
## Min. :5.29 Min. :5.32 Min. :4.67
## 1st Qu.:5.79 1st Qu.:5.79 1st Qu.:5.30
## Median :6.21 Median :5.96 Median :5.83
## Mean :6.21 Mean :5.99 Mean :5.80
## 3rd Qu.:6.58 3rd Qu.:6.18 3rd Qu.:6.27
## Max. :7.36 Max. :6.74 Max. :6.87
##
## pipeline scan
## pipeline_NewStrawn :14 mx_1400_First5Min :2
## pipeline_WoodworthTown: 0 mx_1400_First5MinDS :2
## mx_1400_First5MinDSNF:2
## mx_645_First5Min :2
## mx_645_First5MinDS :2
## mx_645_First5MinDSNF :2
## (Other) :2
## derivative session FWHMx
## sca_roi_PNAS_smith10_plus5_8:14 Min. :1.0 Min. :7.70
## alff : 0 1st Qu.:1.0 1st Qu.:8.36
## degree_centrality_binarize : 0 Median :1.5 Median :8.55
## degree_centrality_weighted : 0 Mean :1.5 Mean :8.68
## falff : 0 3rd Qu.:2.0 3rd Qu.:9.18
## reho : 0 Max. :2.0 Max. :9.68
## (Other) : 0
## FWHMy FWHMz
## Min. :7.83 Min. :7.25
## 1st Qu.:8.38 1st Qu.:7.96
## Median :8.57 Median :8.37
## Mean :8.61 Mean :8.55
## 3rd Qu.:8.93 3rd Qu.:9.35
## Max. :9.41 Max. :9.69
##
## pipeline scan
## pipeline_NewStrawn :308 mx_1400_First5Min :44
## pipeline_WoodworthTown: 0 mx_1400_First5MinDS :44
## mx_1400_First5MinDSNF:44
## mx_645_First5Min :44
## mx_645_First5MinDS :44
## mx_645_First5MinDSNF :44
## (Other) :44
## derivative session subid
## sca_roi_PNAS_smith10_plus5_9:308 Min. :1.0 Min. : 21002
## alff : 0 1st Qu.:1.0 1st Qu.:1793622
## degree_centrality_binarize : 0 Median :1.5 Median :3257582
## degree_centrality_weighted : 0 Mean :1.5 Mean :3507852
## falff : 0 3rd Qu.:2.0 3rd Qu.:4176156
## reho : 0 Max. :2.0 Max. :9630905
## (Other) : 0
## FWHMx FWHMy FWHMz
## Min. :5.26 Min. :5.40 Min. :4.75
## 1st Qu.:5.80 1st Qu.:5.81 1st Qu.:5.28
## Median :6.16 Median :5.97 Median :5.87
## Mean :6.17 Mean :6.00 Mean :5.81
## 3rd Qu.:6.53 3rd Qu.:6.18 3rd Qu.:6.27
## Max. :7.09 Max. :6.90 Max. :7.07
##
## pipeline scan
## pipeline_NewStrawn :14 mx_1400_First5Min :2
## pipeline_WoodworthTown: 0 mx_1400_First5MinDS :2
## mx_1400_First5MinDSNF:2
## mx_645_First5Min :2
## mx_645_First5MinDS :2
## mx_645_First5MinDSNF :2
## (Other) :2
## derivative session FWHMx
## sca_roi_PNAS_smith10_plus5_9:14 Min. :1.0 Min. :7.70
## alff : 0 1st Qu.:1.0 1st Qu.:8.35
## degree_centrality_binarize : 0 Median :1.5 Median :8.39
## degree_centrality_weighted : 0 Mean :1.5 Mean :8.60
## falff : 0 3rd Qu.:2.0 3rd Qu.:9.14
## reho : 0 Max. :2.0 Max. :9.58
## (Other) : 0
## FWHMy FWHMz
## Min. :7.81 Min. :7.17
## 1st Qu.:8.23 1st Qu.:7.93
## Median :8.52 Median :8.22
## Mean :8.54 Mean :8.41
## 3rd Qu.:8.88 3rd Qu.:9.15
## Max. :9.33 Max. :9.62
##