Nothing
#' Summarize a \code{"bMap.cifti"} object
#'
#' Summary method for class \code{"bMap.cifti"}
#'
#' @param object Object of class \code{"bMap.cifti"}.
#' @param ... further arguments passed to or from other methods.
#' @return A list summarizing of the results of the BrainMap analysis.
#' @export
#' @method summary bMap.cifti
summary.bMap.cifti <- function(object, ...) {
bMap_params <- lapply(
object$params,
function(q) {
if (is.null(q)) { q <- "NULL"};
paste0(as.character(q), collapse=" ")
}
)
x <- c(
summary(object$subjNet_mean),
bMap_params
)
class(x) <- "summary.bMap.cifti"
return(x)
}
#' Summarize a \code{"bMap.nifti"} object
#'
#' Summary method for class \code{"bMap.nifti"}
#'
#' @param object Object of class \code{"bMap.nifti"}.
#' @param ... further arguments passed to or from other methods.
#' @return A list summarizing of the results of the BrainMap analysis.
#' @export
#' @method summary bMap.nifti
summary.bMap.nifti <- function(object, ...) {
bMap_params <- lapply(
object$params,
function(q) {
if (is.null(q)) { q <- "NULL"};
paste0(as.character(q), collapse=" ")
}
)
x <- c(
list(
mask_dims=dim(object$mask_nii),
nV=nrow(object$prior_mean),
nL=ncol(object$prior_mean)
),
bMap_params
)
class(x) <- "summary.bMap.nifti"
return(x)
}
#' Summarize a \code{"bMap.matrix"} object
#'
#' Summary method for class \code{"bMap.matrix"}
#'
#' @param object Object of class \code{"bMap.matrix"}.
#' @param ... further arguments passed to or from other methods.
#' @return A list summarizing of the results of the BrainMap analysis.
#' @export
#' @method summary bMap.matrix
summary.bMap.matrix <- function(object, ...) {
bMap_params <- lapply(
object$params,
function(q) {
if (is.null(q)) { q <- "NULL"};
paste0(as.character(q), collapse=" ")
}
)
x <- c(
list(nV=nrow(object$subjNet_mean), nL=ncol(object$subjNet_mean)),
bMap_params
)
class(x) <- "summary.bMap.matrix"
return(x)
}
#' @rdname summary.bMap.cifti
#' @export
#'
#' @param x The result of \code{BrainMap} with CIFTI data
#' @param ... further arguments passed to or from other methods.
#' @return Nothing, invisibly.
#' @method print summary.bMap.cifti
print.summary.bMap.cifti <- function(x, ...) {
cat("====BRAIN MAP INFO===================\n")
cat("Temporal Res.: ", x$TR, "s.\n")
cat("Highpass filter: ", x$hpf, "Hz\n")
cat("Spatial scaling: ", x$scale, "\n")
cat("Variance method: ", x$tvar_method, "\n")
cat("Q2 and Q2_max: ", paste0(x$Q2, ", ", x$Q2_max), "\n")
cat("-------------------------------------\n")
cat("FC model: ", x$FC, "\n")
cat("Spatial model: ", x$spatial_model, "\n")
cat("Dims reduced: ", x$reduce_dim, "\n")
cat("Maximum iters: ", x$maxiter, "\n")
cat("Epsilon: ", x$epsilon, "\n")
if (as.logical(x$spatial_model)) {
cat("Mwall removed: ", x$rm_mwall, "\n")
cat("Initial Kappa: ", x$kappa_init, "\n")
}
cat("\n")
class(x) <- "summary.xifti"
print(x)
invisible(NULL)
}
#' @rdname summary.bMap.nifti
#' @export
#'
#' @param x The prior from \code{estimate_prior.cifti}
#' @param ... further arguments passed to or from other methods.
#' @return Nothing, invisibly.
#' @method print summary.bMap.nifti
print.summary.bMap.nifti <- function(x, ...) {
cat("====BRAIN MAP INFO===================\n")
cat("Temporal Res.: ", x$TR, "s.\n")
cat("Highpass filter: ", x$hpf, "Hz\n")
cat("Spatial scaling: ", x$scale, "\n")
cat("Variance method: ", x$tvar_method, "\n")
cat("Q2 and Q2_max: ", paste0(x$Q2, ", ", x$Q2_max), "\n")
cat("-------------------------------------\n")
cat("FC model: ", x$FC, "\n")
cat("Spatial model: ", x$spatial_model, "\n")
cat("Dims reduced: ", x$reduce_dim, "\n")
cat("Maximum iters: ", x$maxiter, "\n")
cat("Epsilon: ", x$epsilon, "\n")
cat("-------------------------------------\n")
cat("Mask dims: ", paste0(x$mask_dims, collapse=" x "), "\n")
cat("Vectorized dims:\n")
cat("# Locations: ", x$nV, "\n")
cat("# Networks: ", x$nL, "\n")
cat("\n")
invisible(NULL)
}
#' @rdname summary.bMap.matrix
#' @export
#'
#' @param x The prior from \code{estimate_prior.cifti}
#' @param ... further arguments passed to or from other methods.
#' @return Nothing, invisibly.
#' @method print summary.bMap.matrix
print.summary.bMap.matrix <- function(x, ...) {
cat("====BRAIN MAP INFO===================\n")
cat("Temporal Res.: ", x$TR, "s.\n")
cat("Highpass filter: ", x$hpf, "Hz\n")
cat("Spatial scaling: ", x$scale, "\n")
cat("Variance method: ", x$tvar_method, "\n")
cat("Q2 and Q2_max: ", paste0(x$Q2, ", ", x$Q2_max), "\n")
cat("-------------------------------------\n")
cat("FC model: ", x$FC, "\n")
cat("Spatial model: ", x$spatial_model, "\n")
cat("Dims reduced: ", x$reduce_dim, "\n")
cat("Maximum iters: ", x$maxiter, "\n")
cat("Epsilon: ", x$epsilon, "\n")
cat("-------------------------------------\n")
cat("# Locations: ", x$nV, "\n")
cat("# Networks: ", x$nL, "\n")
cat("\n")
invisible(NULL)
}
#' @rdname summary.bMap.cifti
#' @export
#'
#' @return Nothing, invisibly.
#' @method print bMap.cifti
print.bMap.cifti <- function(x, ...) {
print.summary.bMap.cifti(summary(x))
}
#' @rdname summary.bMap.nifti
#' @export
#'
#' @return Nothing, invisibly.
#' @method print bMap.nifti
print.bMap.nifti <- function(x, ...) {
print.summary.bMap.nifti(summary(x))
}
#' @rdname summary.bMap.matrix
#' @export
#'
#' @return Nothing, invisibly.
#' @method print bMap.matrix
print.bMap.matrix <- function(x, ...) {
print.summary.bMap.matrix(summary(x))
}
#' Plot BrainMap estiamte
#'
#' @param x The result of \code{BrainMap} with CIFTI data
#' @param stat \code{"mean"} (default) or \code{"se"}.
#' @param maps Show the BrianMap estimates on the brain? Default: \code{TRUE}.
#' @param FC Show the FC estimates? Default: \code{TRUE}. Note that only the
#' mean estimate is available for FC, not the SE.
#' @param ... Additional arguments to \code{view_xifti}
#' @return The plot
#' @export
#' @method plot bMap.cifti
plot.bMap.cifti <- function(x,
stat=c("mean", "se"),
maps=TRUE,
FC=TRUE,
...) {
stopifnot(inherits(x, "bMap.cifti"))
if (!requireNamespace("ciftiTools", quietly = TRUE)) {
stop("Package \"ciftiTools\" needed to work with CIFTI data. Please install it.", call. = FALSE)
}
stat <- match.arg(stat, c("mean", "se"))
stopifnot(isTRUE(maps) || isFALSE(maps))
stopifnot(isTRUE(FC) || isFALSE(FC))
if (!maps && !FC) { return(invisible(NULL)) }
if (stat=="se" && !maps) {
message("No FC SE, and maps==FALSE, so nothing to plot.")
return(invisible(NULL))
}
# Check `...`
args <- list(...)
has_title <- "title" %in% names(args)
has_idx <- "idx" %in% names(args)
has_fname <- "fname" %in% names(args)
# Print message saying what's happening.
msg1 <- ifelse(has_idx,
"Plotting the",
"Plotting the first component's"
)
msg2 <- switch(stat,
mean=if (FC) { "mean estimate of the maps and FC." } else { "mean estimate of the maps." },
se="standard error of the maps."
)
cat(msg1, msg2, "\n")
# Plot
out <- list()
for (plt in c("map" , "FC")) {
if (plt == "map" && !maps) { next }
if (plt == "FC" && is.null(x$FC)) { next }
if (plt == "FC" && !FC) { next }
if (plt == "FC" && stat=="se") { next }
ss <- stat
args_ss <- args
tsfx_ss <- c(mean="", se=" (se)")[ss]
# Handle title and idx
if (!has_title) {
if (has_idx) {
c1name <- if (!is.null(x$subjNet_mean$meta$cifti$names)) {
x$subjNet_mean$meta$cifti$names[args$idx]
} else {
paste("Component", args$idx)
}
} else {
c1name <- if (!is.null(x$subjNet_mean$meta$cifti$names)) {
x$subjNet_mean$meta$cifti$names[1]
} else {
"First component"
}
}
args_ss$title <- paste0(c1name, tsfx_ss)
} else if (!has_idx) {
args_ss$title <- paste0(args_ss$title, tsfx_ss)
}
# Handle fname
if (has_fname) {
fext <- if (grepl("html$", args_ss$fname[1])) {
"html"
} else if (grepl("pdf$", args_ss$fname[1])) {
"pdf"
} else {
"png"
}
args_ss$fname <- gsub(paste0(".", fext), "", args_ss$fname, fixed=TRUE)
args_ss$fname <- paste0(args_ss$fname, "_", ss, ".", fext)
}
if (plt == "map") {
out[[paste0(ss, "_map")]] <- do.call(
ciftiTools::view_xifti, c(list(x[[paste0("subjNet_", ss)]]), args_ss)
)
if (inherits(out[[paste0(ss, "_map")]], "htmlwidget")) { print(out[[paste0(ss, "_map")]]) }
} else if (plt == "FC") {
out[[paste0(ss, "_FC")]] <- fMRItools::plot_FC_gg(x$FC$mean, title="FC mean", diagVal=NULL)
print(out[[paste0(ss, "_FC")]])
}
}
invisible(out)
}
#' Plot prior
#'
#' @param x The result of \code{BrainMap} with NIFTI data
#' @param stat \code{"mean"} (default), \code{"se"}
#' @param plane,n_slices,slices Anatomical plane and which slice indices to show.
#' Default: 9 axial slices.
#' @param ... Additional arguments
#' @return The plot
#' @export
#' @method plot bMap.nifti
plot.bMap.nifti <- function(x, stat=c("mean", "se"),
plane=c("axial", "sagittal", "coronal"), n_slices=9, slices=NULL,
...) {
stopifnot(inherits(x, "bMap.nifti"))
if (!requireNamespace("oro.nifti", quietly = TRUE)) {
stop("Package \"oro.nifti\" needed to read NIFTI data. Please install it.", call. = FALSE)
}
# Check `...`
args <- list(...)
has_title <- "title" %in% names(args)
has_idx <- "idx" %in% names(args)
has_fname <- "fname" %in% names(args)
# Check `idx`
if (has_idx) {
stopifnot(length(args$idx)==1)
stopifnot(is.numeric(args$idx) && args$idx==round(args$idx))
stopifnot(args$idx %in% seq(ncol(x$subjNet_mean)))
} else {
args$idx <- 1
}
idx <- args$idx; args$idx <- NULL
# Check `stat`
stat <- tolower(stat)
if (has_idx && length(args$idx)>1 && !("fname" %in% names(args))) {
if (identical(stat, c("mean", "se"))) {
stat <- "mean"
} else {
stat <- match.arg(stat, c("mean", "se"))
}
}
stat <- match.arg(stat, c("mean", "se"))
# Print message saying what's happening.
msg1 <- ifelse(has_idx,
"Plotting the",
"Plotting the first component's"
)
msg2 <- switch(stat,
mean="estimate.",
se="standard error."
)
cat(msg1, msg2, "\n")
# Plot
out <- list(mean=NULL, se=NULL)
ss <- stat
plane <- match.arg(plane, c("axial", "sagittal", "coronal"))
args$plane <- plane
plane_dim <- switch(plane, axial=3, coronal=2, sagittal=1)
if (is.null(slices)) {
if (is.null(n_slices)) { warning("Using 9 slices."); n_slices <- 9 }
n_slices <- as.numeric(n_slices)
if (length(n_slices) > 1) { warning("Using the first entry of `slice`."); n_slices <- n_slices[1] }
# Pick slices that are spaced out, and with many voxels.
mask_count <- apply(x$mask_nii, plane_dim, sum)
ns_all <- length(mask_count)
slices <- seq(ns_all)
# Remove slices with zero voxels.
slices <- slices[mask_count != 0]
mask_count <- mask_count[mask_count != 0]
ns_all <- length(mask_count)
if (n_slices > length(slices)) {
warning(
"`n_slices` is larger than the number of non-empty slices (",
length(slices), "). Showing all non-empty slices."
)
n_slices <- length(slices)
}
# Remove slices with few voxels.
if (n_slices < (ns_all / 2)) {
slices <- slices[mask_count > quantile(mask_count, .33)]
}
slices <- slices[round(seq(1, length(slices), length.out=n_slices))]
} else {
slices <- as.numeric(slices)
stopifnot(all(slices %in% seq(dim(x$mask_nii)[plane_dim])))
}
tss <- x[[paste0("subjNet_", ss)]]
tss <- tss[,,,idx]
if (plane=="axial") {
tss <- tss[,,slices,drop=FALSE]
} else if (plane=="coronal") {
tss <- tss[,slices,,drop=FALSE]
} else if (plane=="sagittal") {
tss <- tss[slices,,,drop=FALSE]
} else { stop() }
args_ss <- args
args_ss$plane <- plane
# Handle title and idx
if (!has_title && !has_idx) {
c1name <- "First component"
}
if (has_title) { stop("Not supported yet.") }
if (has_fname) { stop("Not supported yet. Call `pdf` or `png` beforehand, and then `dev.off`.") }
do.call(
oro.nifti::image,
c(list(oro.nifti::as.nifti(tss)), args_ss)
)
}
#' Plot prior
#'
#' This feature is not supported yet.
#'
#' @param x The result of \code{BrainMap} with NIFTI data
#' @param ... Additional arguments
#' @return Nothing, because an error is raised.
#' @export
#' @method plot bMap.matrix
plot.bMap.matrix <- function(x, ...) {
stopifnot(inherits(x, "bMap.matrix"))
stop("Not supported yet.")
}
Any scripts or data that you put into this service are public.
Add the following code to your website.
For more information on customizing the embed code, read Embedding Snippets.