Load Required Packages for NMA and Data Handling

# Define the list of required packages
required_packages <- c(
  "metafor",      # For meta-analysis functions (used indirectly by netmeta sometimes)
  "dplyr",        # For data manipulation
  "tidyr",        # For data tidying (e.g., pivot_wider)
  "ggplot2",      # For creating plots (SUCRA, Cross-Domain, Meta-Reg Bubble)
  "readxl",       # For reading Excel files
  "netmeta",      # Core package for Network Meta-Analysis
  "igraph",       # Used by netmeta for graph structures
  "gridExtra",    # For arranging plots (if needed)
  "knitr",        # For creating reports
  "kableExtra",   # For enhancing tables
  "scales",       # For formatting plot labels (e.g., percent)
  "stringr",      # For string manipulation (parsing study names)
  "tibble"        # For tribble function (used in RoB processing, though now loading from file)
)

# Loop through packages, install if missing, and load
for(pkg in required_packages) {
  if (!require(pkg, character.only = TRUE)) {
    install.packages(pkg)
    library(pkg, character.only = TRUE)
  }
}

# Define a consistent theme for ggplot
theme_set(theme_minimal(base_size = 12))

— Define File Paths —

# !!! IMPORTANT: Replace with the correct paths to your files !!!
# Use forward slashes '/' or double backslashes '\\' in paths
file_path_main <- "Downloads//final_meta_analysis_data.xlsx" 
file_path_rob <- "Downloads//RoB-overall.xlsx"

cat("Main data file path set to:", file_path_main, "\n")
## Main data file path set to: Downloads//final_meta_analysis_data.xlsx
cat("RoB data file path set to:", file_path_rob, "\n")
## RoB data file path set to: Downloads//RoB-overall.xlsx

— Load Main Data —

# Check if main file exists
if (!file.exists(file_path_main)) {
  stop("Error: Main data file not found at path: ", file_path_main, 
       "\nPlease ensure the file exists and the path is correct.")
}

# Import the sheets using tryCatch for better error handling
tryCatch({
  baseline_raw <- read_excel(file_path_main, sheet = "Baseline")
  outcomes_raw <- read_excel(file_path_main, sheet = "Outcomes")
  codes_raw <- read_excel(file_path_main, sheet = "Codes") # Load codes for potential reference
}, error = function(e) {
  stop("Error reading Excel file '", file_path_main, "': ", e$message)
})

cat("\n--- Raw Main Data Loaded ---")
## 
## --- Raw Main Data Loaded ---
cat("\nBaseline dimensions:", dim(baseline_raw)[1], "rows,", dim(baseline_raw)[2], "columns")
## 
## Baseline dimensions: 256 rows, 16 columns
cat("\nOutcomes dimensions:", dim(outcomes_raw)[1], "rows,", dim(outcomes_raw)[2], "columns")
## 
## Outcomes dimensions: 2915 rows, 8 columns
cat("\nCodes dimensions:", dim(codes_raw)[1], "rows,", dim(codes_raw)[2], "columns")
## 
## Codes dimensions: 120 rows, 3 columns
cat("\nBaseline Columns:", paste(colnames(baseline_raw), collapse=", "))
## 
## Baseline Columns: Study, Group, N, Age_Mean, Age_SD, percentage_Male, Target, Lateralisation, Targeting_Method, Technique, Total_Time, Total_Sessions, Session_Frequency, Sham_Condition, T0, T1
cat("\nOutcomes Columns:", paste(colnames(outcomes_raw), collapse=", "))
## 
## Outcomes Columns: Study, Group, Outcome_Measure, Time_Point, Days, N, Mean, SD
cat("\n------------------------\n")
## 
## ------------------------

— Data Cleaning and Standardization —

# Function to clean and standardize text columns
clean_text <- function(text) {
  if (is.factor(text)) text <- as.character(text) # Convert factors to character first
  if (!is.character(text)) return(text) # Return unchanged if not character
  text <- tolower(trimws(text)) # Convert to lowercase and remove leading/trailing whitespace
  # Optional: Replace multiple spaces/tabs with a single space
  # text <- gsub("\\s+", " ", text) 
  return(text)
}

# Apply cleaning to relevant columns (handle potential non-character columns)
baseline <- baseline_raw %>% mutate(across(where(is.character), clean_text))
outcomes <- outcomes_raw %>% mutate(across(where(is.character), clean_text))
codes <- codes_raw %>% mutate(across(where(is.character), clean_text)) # Clean codes too

# Create unique identifiers for each study-group combination
# Ensure Study and Group columns exist and handle potential missing values
if (!all(c("Study", "Group") %in% names(baseline))) stop("Baseline sheet missing 'Study' or 'Group' column.")
if (!all(c("Study", "Group") %in% names(outcomes))) stop("Outcomes sheet missing 'Study' or 'Group' column.")

baseline <- baseline %>% 
  mutate(study_group_id = if_else(is.na(Study) | is.na(Group), NA_character_, paste(Study, Group, sep = "_")))
outcomes <- outcomes %>% 
  mutate(study_group_id = if_else(is.na(Study) | is.na(Group), NA_character_, paste(Study, Group, sep = "_")))

# Check if Diagnosis column exists in baseline and clean it
if (!"Diagnosis" %in% names(baseline)) {
    warning("Column 'Diagnosis' not found in the Baseline sheet. Diagnosis-based analysis will be skipped.")
    # Add a placeholder NA column if it's missing, to avoid errors later if code expects it
    baseline$Diagnosis <- NA_character_ 
} else {
    cat("\nDiagnosis column found in Baseline data.\n")
    baseline$Diagnosis <- clean_text(baseline$Diagnosis) # Clean the diagnosis column
    # Optional: Check unique Diagnosis values
    cat("Unique Diagnosis values after cleaning:\n")
    print(table(baseline$Diagnosis, useNA = "ifany"))
}


# --- Standardize Time_Point Column --- 
# Ensure Time_Point column exists
if (!"Time_Point" %in% names(outcomes)) stop("Outcomes sheet missing 'Time_Point' column.")
outcomes$Time_Point <- clean_text(outcomes$Time_Point) 

# Add a standardized time point column based on common patterns
# This logic handles T0, T1, and change scores implicitly through keywords
outcomes <- outcomes %>%
  mutate(
    Time_Point_Std = case_when(
      # Baseline indicators (T0, Pre, Baseline) - Ensure it catches variations
      grepl("^t0$|baseline|pre|-0$", Time_Point, ignore.case = TRUE) ~ "baseline",
      
      # Change score indicators - Make this robust
      grepl("change|delta|diff", Time_Point, ignore.case = TRUE) ~ "change",
      
      # Follow-up indicators (T1, Post, Follow-up, End) - Make sure this doesn't overlap unintendedly with 'change'
      grepl("^t1$|follow|post|end", Time_Point, ignore.case = TRUE) & !grepl("change|delta|diff", Time_Point, ignore.case = TRUE) ~ "followup",
      
      # Add more specific rules if needed based on your actual data values
      # e.g., grepl("^week 4$", Time_Point, ignore.case=TRUE) ~ "followup", 
      
      TRUE ~ "other" # Assign 'other' if no pattern matches
    )
  )
cat("\n--- Standardized Time Points ('Time_Point_Std') ---\n")
## 
## --- Standardized Time Points ('Time_Point_Std') ---
cat("Review this table carefully. Ensure 'baseline', 'change', and 'followup' categories correctly capture your data.\n")
## Review this table carefully. Ensure 'baseline', 'change', and 'followup' categories correctly capture your data.
cat("If you see many 'other' or misclassified points, adjust the 'case_when' rules above.\n")
## If you see many 'other' or misclassified points, adjust the 'case_when' rules above.
# Use try() in case Time_Point has unexpected types after cleaning
try(print(table(outcomes$Time_Point, outcomes$Time_Point_Std, useNA = "ifany")), silent = TRUE)
##            
##             baseline change followup
##   t0            1366      0        0
##   t1               0      0     1395
##   t1_change        0    154        0
cat("-----------------------------------------------\n")
## -----------------------------------------------
# --- Outcome Categorization ---
# Ensure Outcome_Measure column exists
if (!"Outcome_Measure" %in% names(outcomes)) stop("Outcomes sheet missing 'Outcome_Measure' column.")

# Ensure Outcome_Measure is character before applying categorization
outcomes$Outcome_Measure <- as.character(outcomes$Outcome_Measure) 

outcome_categories <- list(
  positive_symptoms = c("^p_", "panss_p", "saps"),
  negative_symptoms = c("^n_", "panss_n", "sans", "bnss"), # Added bnss
  total_psychopathology = c("^t_", "panss_t", "bprs"),
  general_psychopathology = c("^g_", "panss_g"),
  processing_speed = "^ps_",
  attention_vigilance = "^av_",
  working_memory = "^wm_",
  verbal_learning = "^verl_",
  visual_learning = "^visl_",
  reasoning_problem_solving = "^rps_",
  social_cognition = "^sc_",
  global_cognition = c("^gc_", "mccb", "bacs", "mmse", "rbans", "moca"), # Added moca
  auditory_hallucinations = c("ahrs", "psyrats_ah", "avhrs") 
  # Add more domains as needed
)

# Function to categorize outcomes based on patterns
categorize_outcome <- function(measure_name, categories) {
  measure_name <- clean_text(measure_name) # Ensure measure name is cleaned
  if (is.na(measure_name) || measure_name == "") return("other") # Handle missing measure names
  for (domain in names(categories)) {
    patterns <- categories[[domain]]
    # Combine patterns with OR operator for grepl, ensure patterns match start (^) or whole words if needed
    combined_pattern <- paste0("(", paste(patterns, collapse = ")|("), ")") # Ensure patterns are distinct
    if (grepl(combined_pattern, measure_name, ignore.case = TRUE)) {
      return(domain)
    }
  }
  return("other") # Default category if no match
}

# Apply categorization using the function
outcomes <- outcomes %>%
  rowwise() %>% 
  mutate(domain = categorize_outcome(Outcome_Measure, outcome_categories)) %>%
  ungroup() 

# Display counts per domain to check categorization
cat("\nOutcome counts per domain:\n")
## 
## Outcome counts per domain:
print(table(outcomes$domain, useNA = "ifany"))
## 
##       attention_vigilance   auditory_hallucinations   general_psychopathology 
##                       106                         4                       216 
##          global_cognition         negative_symptoms                     other 
##                       120                       448                        69 
##         positive_symptoms          processing_speed reasoning_problem_solving 
##                       488                       188                       294 
##          social_cognition     total_psychopathology           verbal_learning 
##                        78                       304                       160 
##           visual_learning            working_memory 
##                       146                       294
# --- Define Direction of Effect ---
# List outcome measure patterns where lower scores are better (e.g., symptom scales)
lower_better_patterns <- c("panss", "sans", "saps", "ahrs", "bprs", "psyrats", "avhrs", "bnss") # Added bnss
combined_lower_better_pattern <- paste(lower_better_patterns, collapse = "|")

outcomes <- outcomes %>%
  mutate(lower_is_better = grepl(combined_lower_better_pattern, Outcome_Measure, ignore.case = TRUE))

cat("\nCounts for 'lower_is_better' (TRUE means lower score = improvement):\n")
## 
## Counts for 'lower_is_better' (TRUE means lower score = improvement):
print(table(outcomes$lower_is_better, useNA = "ifany"))
## 
## FALSE  TRUE 
##  1419  1496
cat("\n--- Data Cleaning and Standardization Complete ---\n")
## 
## --- Data Cleaning and Standardization Complete ---

— Load and Prepare Risk of Bias (RoB) Data —

# Check if RoB file exists
if (!file.exists(file_path_rob)) {
  warning("Warning: RoB data file not found at path: ", file_path_rob, 
          "\nRoB analysis and meta-regression will be skipped.")
  processed_rob_data <- NULL # Set to NULL if file not found
} else {
  # Load all relevant sheets from the RoB Excel file
  rob_sheet_names <- c("overall", "P", "N", "C") # Sheets to load based on user description
  rob_data_list <- list()
  
  tryCatch({
    # Check available sheets in the Excel file
    available_sheets <- excel_sheets(file_path_rob)
    sheets_to_load_actual <- intersect(tolower(rob_sheet_names), tolower(available_sheets))
    
    if(length(sheets_to_load_actual) == 0) {
      stop("None of the expected RoB sheets (overall, P, N, C) found in ", file_path_rob)
    }
    
    cat("Found RoB sheets:", paste(sheets_to_load_actual, collapse=", "), "\n")
    
    for (sheet_name_lower in sheets_to_load_actual) {
       # Find the original case sheet name
       original_sheet_name <- available_sheets[tolower(available_sheets) == sheet_name_lower][1]
       rob_data_list[[sheet_name_lower]] <- read_excel(file_path_rob, sheet = original_sheet_name)
       cat("Loaded RoB sheet:", original_sheet_name, "-", nrow(rob_data_list[[sheet_name_lower]]), "rows\n")
    }
  }, error = function(e) {
    warning("Error reading RoB Excel file '", file_path_rob, "': ", e$message, 
            "\nRoB analysis may be incomplete or skipped.")
    rob_data_list <<- NULL # Set to NULL on error
  })
}
## Found RoB sheets: overall, p, n, c 
## Loaded RoB sheet: overall - 229 rows
## Loaded RoB sheet: P - 84 rows
## Loaded RoB sheet: N - 84 rows
## Loaded RoB sheet: C - 61 rows
# --- Process RoB Data if Loaded Successfully ---
if (!is.null(rob_data_list) && length(rob_data_list) > 0) {
  
  # Function to process a single RoB data frame
  process_rob_sheet <- function(rob_df, sheet_name) {
    
    # Check for required 'Study' column (might be named differently, adapt if needed)
    # Use the exact name from the user's example table: 'Study'
    study_col <- "Study" 
    
    if (!study_col %in% colnames(rob_df)) {
        warning("Could not find the required 'Study' column in RoB sheet: '", sheet_name, "'. Skipping processing for this sheet.")
        return(NULL)
    }
    # Rename the found study column to a standard name for consistency
    colnames(rob_df)[colnames(rob_df) == study_col] <- "Study_RoB_ID"
    
    # Ensure 'Overall' column exists for RoB level
    if (!"Overall" %in% colnames(rob_df)) {
         warning("Column 'Overall' not found in RoB sheet: '", sheet_name, "'. Cannot determine Overall RoB. Skipping processing.")
         return(NULL)
    }

    rob_df_processed <- rob_df %>%
      # Clean all character columns
      mutate(across(where(is.character), clean_text)) %>%
      # Parse Study Name and Domain Indicator from the Study_RoB_ID column
      mutate(
        # Extract base study name (remove ' - p', ' - n', ' - c' suffixes if present)
        # Handle cases like "Mogg, 2007" which might not have a suffix
        Study = str_trim(sub(" - [pnc]$", "", Study_RoB_ID, ignore.case = TRUE)),
        # Extract domain indicator (P, N, C) or assign NA if none found/different format
        RoB_Domain_Indicator = case_when(
          grepl(" - p$", Study_RoB_ID, ignore.case = TRUE) ~ "p",
          grepl(" - n$", Study_RoB_ID, ignore.case = TRUE) ~ "n",
          grepl(" - c$", Study_RoB_ID, ignore.case = TRUE) ~ "c",
          TRUE ~ NA_character_ # Assign NA if no P/N/C suffix
        )
      ) %>%
      # Convert RoB levels to an ordered factor for meta-regression
      mutate(
        Overall_RoB_Level = factor(Overall, levels = c("low", "some concerns", "high"), ordered = TRUE)
      ) %>% 
      # Select necessary columns
      select(Study_RoB_ID, Study, RoB_Domain_Indicator, Overall, Overall_RoB_Level, starts_with("D")) # Keep domain columns (D1-D5) if needed
      
    return(rob_df_processed)
  }

  # Process each loaded RoB sheet
  processed_rob_data <- list()
  for (sheet in names(rob_data_list)) {
    processed_rob_data[[sheet]] <- process_rob_sheet(rob_data_list[[sheet]], sheet)
  }
  
  # Filter out NULL results from processing errors
  processed_rob_data <- processed_rob_data[!sapply(processed_rob_data, is.null)]
  
  if (length(processed_rob_data) > 0) {
      cat("\n--- Risk of Bias Data Processed ---\n")
      # Show head of the 'overall' sheet if processed
      if ("overall" %in% names(processed_rob_data)) {
          cat("Example processed RoB data (from 'overall' sheet):\n")
          print(head(processed_rob_data[["overall"]]))
      } else if (length(processed_rob_data) > 0) {
          cat("Example processed RoB data (from first available sheet):\n")
          print(head(processed_rob_data[[1]]))
      }
      
      cat("\nOverall RoB Summary (from 'overall' sheet if available):\n")
      if ("overall" %in% names(processed_rob_data)) {
        print(table(processed_rob_data[["overall"]]$Overall, useNA = "ifany"))
      } else {
        cat("No 'overall' RoB sheet processed or available.\n")
      }
      cat("----------------------------------\n")
  } else {
      warning("No RoB sheets could be processed successfully.")
      processed_rob_data <- NULL # Set to NULL if processing failed for all
  }

} else {
    # Ensure it's NULL if loading failed initially or file didn't exist
    if(!exists("processed_rob_data")) { 
       processed_rob_data <- NULL 
    }
}
## 
## --- Risk of Bias Data Processed ---
## Example processed RoB data (from 'overall' sheet):
## # A tibble: 6 × 10
##   Study_RoB_ID  Study RoB_Domain_Indicator Overall Overall_RoB_Level D1    D2   
##   <chr>         <chr> <chr>                <chr>   <ord>             <chr> <chr>
## 1 bais, 2014 -… bais… p                    low     low               low   low  
## 2 bais, 2014 -… bais… n                    low     low               low   low  
## 3 barr, 2011 -… barr… c                    some c… some concerns     low   low  
## 4 barr, 2013 -… barr… c                    some c… some concerns     low   low  
## 5 barr, 2012 -… barr… p                    high    high              low   high 
## 6 barr, 2012 -… barr… n                    high    high              low   high 
## # ℹ 3 more variables: D3 <chr>, D4 <chr>, D5 <chr>
## 
## Overall RoB Summary (from 'overall' sheet if available):
## 
##          high           low some concerns 
##           116            25            88 
## ----------------------------------
# Define mapping between analysis domains and RoB indicators (P, N, C)
# Adjust this mapping based on your RoB sheets and analysis domains
domain_rob_mapping <- c(
  "positive_symptoms" = "p",
  "negative_symptoms" = "n",
  "global_cognition" = "c",
  "total_psychopathology" = NA, # Assign NA if no specific RoB assessment exists for this domain
  "general_psychopathology" = NA, 
  "auditory_hallucinations" = "p", # Assuming AH uses the same RoB as Positive
  "processing_speed" = "c",
  "attention_vigilance" = "c",
  "working_memory" = "c",
  "verbal_learning" = "c",
  "visual_learning" = "c",
  "reasoning_problem_solving" = "c",
  "social_cognition" = "c"
  # Add mappings for other cognitive domains if needed, assuming they fall under 'C'
)
cat("\nDomain to RoB sheet mapping defined.\n")
## 
## Domain to RoB sheet mapping defined.

— Function to Prepare Data for NMA —

#' Prepare NMA data from raw baseline and outcome dataframes.
#' Calculates Mean Differences (MD) and their standard errors (seTE) 
#' for comparisons between active treatments and a single designated SHAM group within each study.
#' Handles both pre-post data and direct change scores using standardized time points.
#' Creates unique study labels for netmeta to handle multiple outcomes/comparisons per study.
#' Includes Diagnosis information.
#' @param outcomes_df Data frame containing outcome data.
#' @param baseline_df Data frame containing baseline characteristics (must include Diagnosis).
#' @param domain_filter Optional string. Filters outcomes to a specific domain.
#' @param correlation_pre_post Numeric. Assumed correlation between pre- and post-test scores.
#' @param reference_treatment_label String. Label used for the reference group (e.g., "SHAM").
#' @return A data frame formatted for use with the netmeta package, including Diagnosis.
prepare_nma_data <- function(outcomes_df, 
                             baseline_df, 
                             domain_filter = NULL, 
                             correlation_pre_post = 0.7, 
                             reference_treatment_label = "SHAM") {

  # --- Input Validation ---
  required_outcome_cols <- c("Study", "Group", "Outcome_Measure", "Time_Point_Std", "N", "Mean", "SD", "domain", "lower_is_better", "study_group_id")
  required_baseline_cols <- c("study_group_id", "Technique", "Targeting_Method") # Diagnosis check done separately
  
  if (!all(required_outcome_cols %in% names(outcomes_df))) {
    stop("Missing required columns in outcomes_df: ", paste(setdiff(required_outcome_cols, names(outcomes_df)), collapse=", "))
  }
   if (!all(required_baseline_cols %in% names(baseline_df))) {
    stop("Missing required columns in baseline_df: ", paste(setdiff(required_baseline_cols, names(baseline_df)), collapse=", "))
  }
  # Check if Diagnosis column exists *now* after cleaning/potential placeholder addition
  if (!"Diagnosis" %in% names(baseline_df)) {
      # This should ideally not happen if placeholder was added, but as a safeguard:
      warning("Diagnosis column missing in baseline_df. It will not be included in the NMA data.")
      add_diagnosis <- FALSE
  } else {
      add_diagnosis <- TRUE
  }
  if (!is.numeric(correlation_pre_post) || correlation_pre_post < -1 || correlation_pre_post > 1) {
      warning("correlation_pre_post should be between -1 and 1. Using default 0.7.")
      correlation_pre_post <- 0.7
  }

  # --- Filtering and Initialization ---
  nma_data_list <- list() 
  skipped_log <- list() 
  
  if (!is.null(domain_filter)) {
    filtered_outcomes <- outcomes_df %>% filter(domain == domain_filter)
    if (nrow(filtered_outcomes) == 0) {
        warning("No outcomes found for domain: ", domain_filter)
        return(data.frame()) # Return empty frame
    }
  } else {
    filtered_outcomes <- outcomes_df
  }
  
  # Ensure Study names are valid before proceeding
  filtered_outcomes <- filtered_outcomes %>% filter(!is.na(Study) & Study != "")
  studies_to_process <- unique(filtered_outcomes$Study)
  
  # --- Process Each Study ---
  for (study_name in studies_to_process) {
    
    study_data <- filtered_outcomes %>% filter(Study == study_name)
    study_groups <- unique(study_data$Group)
    study_groups <- study_groups[!is.na(study_groups) & study_groups != ""] 
    
    if (length(study_groups) < 2) {
      reason_text <- paste0("Fewer than 2 valid groups in study '", study_name, "'")
      skipped_log[[length(skipped_log) + 1]] <- list(comparison=study_name, reason=reason_text)
      next
    }
    
    # Standardize group names for matching (e.g., 'active 1', 'active_a' -> 'active')
    active_groups <- study_groups[grepl("active", study_groups, ignore.case = TRUE)]
    sham_groups <- study_groups[grepl("sham", study_groups, ignore.case = TRUE)]
    
    if (length(active_groups) == 0 || length(sham_groups) == 0) {
       skipped_log[[length(skipped_log) + 1]] <- list(comparison=study_name, reason="Missing active or sham group")
       next
    }
    
    # For simplicity in this NMA, assume one SHAM group acts as the comparator
    # If multiple shams exist, use the first one found. Consider implications.
    sham_group <- sham_groups[1] 
    if (length(sham_groups) > 1) {
       # Suppress warning if too noisy
       # warning("Study ", study_name, " has multiple sham groups. Using only '", sham_group, "' as reference.")
    }

    study_outcome_measures <- unique(study_data$Outcome_Measure)
    study_outcome_measures <- study_outcome_measures[!is.na(study_outcome_measures) & study_outcome_measures != ""] 

    for (outcome_measure in study_outcome_measures) {
        
      outcome_data <- study_data %>% filter(Outcome_Measure == outcome_measure)
      
      for (active_group in active_groups) {
        
        # Create a unique ID for this specific comparison within the study
        comparison_id <- paste(study_name, active_group, "vs", sham_group, outcome_measure) 
        
        active_group_id <- paste(study_name, active_group, sep = "_")
        sham_group_id <- paste(study_name, sham_group, sep = "_")

        # --- Get Baseline Info (Technique, Targeting, Diagnosis) ---
        baseline_info_active <- baseline_df %>% filter(study_group_id == active_group_id)
        # We might need baseline info for sham too if required later, but for treatment label/diagnosis, active is key
        
        if (nrow(baseline_info_active) == 0) {
            skipped_log[[length(skipped_log) + 1]] <- list(comparison=comparison_id, reason="Missing baseline info for active group")
            next
        }
        # Ensure we take the first row if multiple exist for the same study_group_id (shouldn't happen ideally)
        baseline_info <- baseline_info_active[1, ] 
        
        # Check for essential Technique/Targeting
        if (is.na(baseline_info$Technique) || baseline_info$Technique == "" ||
            is.na(baseline_info$Targeting_Method) || baseline_info$Targeting_Method == "") {
          skipped_log[[length(skipped_log) + 1]] <- list(comparison=comparison_id, reason="Missing Technique/Targeting info in baseline sheet")
          next
        }
        
        # Get Diagnosis if expected and available
        diagnosis_value <- NA_character_
        if (add_diagnosis) {
            # Check the Diagnosis column in the selected baseline_info row
            if (is.na(baseline_info$Diagnosis) || baseline_info$Diagnosis == "") {
                # Log missing diagnosis, but proceed with NA
                # warning("Missing Diagnosis for: ", comparison_id, ". Proceeding with NA for this comparison.")
                # Keep diagnosis_value as NA
            } else {
                # Assign the cleaned, uppercase diagnosis value
                diagnosis_value <- toupper(trimws(baseline_info$Diagnosis)) 
            }
        }

        # Create combined treatment label
        technique <- toupper(trimws(baseline_info$Technique))
        targeting_method <- toupper(trimws(baseline_info$Targeting_Method))
        combined_treatment_label <- paste(technique, targeting_method, sep = "_")

        # --- Get Outcome Data Points ---
        active_outcome_points <- outcome_data %>% filter(Group == active_group)
        sham_outcome_points <- outcome_data %>% filter(Group == sham_group)

        # Select T0 (baseline) and T1 (followup or change) rows
        active_t0_rows <- active_outcome_points %>% filter(Time_Point_Std == "baseline")
        active_t1_rows <- active_outcome_points %>% filter(Time_Point_Std %in% c("followup", "change"))
        sham_t0_rows <- sham_outcome_points %>% filter(Time_Point_Std == "baseline")
        sham_t1_rows <- sham_outcome_points %>% filter(Time_Point_Std %in% c("followup", "change"))

        # Helper function to select the most appropriate row if multiple exist
        select_timepoint_row <- function(df, timepoint_type, priority_std_value = NULL) {
            if (nrow(df) == 0) return(df) # Return empty if no rows
            if (nrow(df) > 1) {
                # Suppress warning if too noisy
                # warning(paste0("Multiple '", timepoint_type, "' rows found for: ", comparison_id, 
                #                ". Timepoints found: [", paste(df$Time_Point, collapse=", "), "]. Selecting one based on priority."))
                
                # Prioritize 'change' if specified and present
                if (!is.null(priority_std_value) && priority_std_value %in% df$Time_Point_Std) {
                    selected_row <- df %>% filter(Time_Point_Std == priority_std_value) %>% head(1)
                    return(selected_row)
                } else {
                    # Otherwise, just take the first row found
                    selected_row <- df %>% head(1) 
                    return(selected_row)
                }
            }
            return(df) # Return the single row if only one exists
        }

        active_t0 <- select_timepoint_row(active_t0_rows, "baseline")
        active_t1 <- select_timepoint_row(active_t1_rows, "followup/change", priority_std_value = "change") 
        sham_t0 <- select_timepoint_row(sham_t0_rows, "baseline")
        sham_t1 <- select_timepoint_row(sham_t1_rows, "followup/change", priority_std_value = "change")

        # Check if we have the necessary data points (T1 required, T0 required unless T1 is change)
        is_change_score <- if(nrow(active_t1) == 1) { active_t1$Time_Point_Std[1] == "change" } else { FALSE }
        
        has_minimal_data <- nrow(active_t1) == 1 && nrow(sham_t1) == 1
        has_pre_post_data <- has_minimal_data && nrow(active_t0) == 1 && nrow(sham_t0) == 1
        
        can_calculate <- FALSE
        if (is_change_score && has_minimal_data) {
            can_calculate <- TRUE # Change score only needs T1 data
        } else if (!is_change_score && has_pre_post_data) {
            can_calculate <- TRUE # Pre-post calculation needs T0 and T1
        }

        if (!can_calculate) {
            missing_parts <- c()
            if(nrow(active_t1)!=1) missing_parts <- c(missing_parts, "active_t1")
            if(nrow(sham_t1)!=1) missing_parts <- c(missing_parts, "sham_t1")
            if(!is_change_score && nrow(active_t0)!=1) missing_parts <- c(missing_parts, "active_t0")
            if(!is_change_score && nrow(sham_t0)!=1) missing_parts <- c(missing_parts, "sham_t0")
            
            skipped_log[[length(skipped_log) + 1]] <- list(comparison=comparison_id, reason=paste("Missing required data points:", paste(missing_parts, collapse=", ")))
            next
        }

        # --- Calculate Effect Size (MD) and SE ---
        effect_data <- tryCatch({
          
          # Extract T1 data (post-test or change score data)
          n1 <- as.numeric(active_t1$N[1]); m1_t1 <- as.numeric(active_t1$Mean[1]); sd1_t1 <- as.numeric(active_t1$SD[1])
          n2 <- as.numeric(sham_t1$N[1]);   m2_t1 <- as.numeric(sham_t1$Mean[1]);  sd2_t1 <- as.numeric(sham_t1$SD[1])
          
          # Basic checks for T1 data
          if (any(is.na(c(n1, n2, m1_t1, sd1_t1, m2_t1, sd2_t1)))) {
              stop("Missing or non-numeric N/Mean/SD in T1/Change row(s).")
          }
          if (n1 <= 0 || n2 <= 0) { stop("Invalid N values (<=0).") }
          # Allow SD == 0 for change scores if Mean is also 0 (no change, no variance), otherwise invalid.
          if (sd1_t1 < 0 || sd2_t1 < 0 || (sd1_t1 == 0 && m1_t1 != 0) || (sd2_t1 == 0 && m2_t1 != 0) ) { 
              stop("Invalid SD values (<0, or 0 with non-zero mean) in T1/Change row(s).") 
          }
          
          # Calculate Mean Change and SD of Change
          if (is_change_score) {
            # Data is already change scores
            m1_change <- m1_t1 
            sd1_change <- sd1_t1 
            m2_change <- m2_t1
            sd2_change <- sd2_t1
          } else {
            # Calculate change from pre (T0) to post (T1)
            m1_pre <- as.numeric(active_t0$Mean[1]); sd1_pre <- as.numeric(active_t0$SD[1])
            m2_pre <- as.numeric(sham_t0$Mean[1]);   sd2_pre <- as.numeric(sham_t0$SD[1])
            
            # Checks for T0 data
             if (any(is.na(c(m1_pre, sd1_pre, m2_pre, sd2_pre)))) {
                stop("Missing or non-numeric Mean/SD in T0 row(s) required for pre-post calculation.")
             }
             # Allow SD == 0 at baseline
             if (sd1_pre < 0 || sd2_pre < 0) {
                stop("Invalid SD values (<0) in T0 row(s).")
             }
            
            # Calculate mean change
            m1_change <- m1_t1 - m1_pre
            m2_change <- m2_t1 - m2_pre
            
            # Calculate SD of change scores using assumed correlation
            # Handle potential SD=0 cases by using a tiny value for calculation to avoid errors, 
            # but note this is an assumption. If SD is truly 0, variance of change might also be 0.
            sd1_pre_calc <- max(sd1_pre, 1e-9) 
            sd2_pre_calc <- max(sd2_pre, 1e-9)
            sd1_post_calc <- max(sd1_t1, 1e-9)
            sd2_post_calc <- max(sd2_t1, 1e-9)

            var1_change <- sd1_pre_calc^2 + sd1_post_calc^2 - 2 * correlation_pre_post * sd1_pre_calc * sd1_post_calc
            var2_change <- sd2_pre_calc^2 + sd2_post_calc^2 - 2 * correlation_pre_post * sd2_pre_calc * sd2_post_calc
            
            # Check for negative variance (can happen if correlation assumption is wrong or SDs are inconsistent)
            handle_negative_variance <- function(variance, sd_pre, sd_post) {
                if (variance < 0) {
                    warning("Comparison: ", comparison_id, 
                            " - Calculated variance of change is negative (cor=", correlation_pre_post, 
                            ", sd_pre=", round(sd_pre,2), ", sd_post=", round(sd_post, 2), 
                            "). Check SDs or correlation assumption. Setting SD change variance to 0 (SD=0).")
                    return(0) # Set variance to 0 if negative
                }
                return(variance)
            }
            
            var1_change <- handle_negative_variance(var1_change, sd1_pre_calc, sd1_post_calc)
            var2_change <- handle_negative_variance(var2_change, sd2_pre_calc, sd2_post_calc)

            sd1_change <- sqrt(var1_change)
            sd2_change <- sqrt(var2_change)
          }
          
          # --- Calculate Mean Difference (MD) and its SE ---
          md <- m1_change - m2_change
          
          # Calculate SE of MD: sqrt(Var(change1)/n1 + Var(change2)/n2)
          # Need variance of change (SD^2). Handle cases where SD_change might be 0.
          var1_change_final <- sd1_change^2
          var2_change_final <- sd2_change^2

          if (is.na(var1_change_final) || var1_change_final < 0 || is.na(var2_change_final) || var2_change_final < 0) {
              stop("Invalid calculated variance of change (NA or < 0).")
          }
          
          # Ensure SE is not based on division by zero or negative variance
          se_md_squared <- (var1_change_final / n1) + (var2_change_final / n2)
           if (is.na(se_md_squared) || se_md_squared < 0) {
               stop(paste0("Calculated squared standard error is invalid (NA or < 0): Var1=", round(var1_change_final,3), ", N1=", n1, ", Var2=", round(var2_change_final,3), ", N2=", n2))
           }
           se_md <- sqrt(se_md_squared)

          # Final check for calculated values
          if (is.na(md) || is.na(se_md) || !is.finite(md) || !is.finite(se_md)) {
             stop("Calculated MD or seTE is invalid (NA or non-finite).")
          }
           # If SE is exactly 0, this implies no variance in change in either group, which is unlikely unless N is huge or SDs were 0. 
           # netmeta might handle SE=0, but it's worth noting. Let's add a tiny amount if it's zero.
           if (se_md == 0) {
               # warning("Calculated seTE is exactly 0 for: ", comparison_id, ". Using a small non-zero value (1e-9).")
               se_md <- 1e-9
           }

          # --- Adjust Direction based on 'lower_is_better' ---
          lower_is_better_flag <- outcome_data$lower_is_better[1] 
          if (is.na(lower_is_better_flag)) {
              warning("Missing 'lower_is_better' flag for: ", comparison_id, ". Assuming FALSE (higher score is better).")
              lower_is_better_flag <- FALSE
          }
          # If lower scores indicate improvement, we flip the sign of MD
          # so that positive MD always favors the active treatment.
          if (lower_is_better_flag) {
            md <- -md 
          }
          
          # Return calculated TE (MD) and seTE (SE of MD)
          list(TE = md, seTE = se_md, n1 = n1, n2 = n2) 

        }, error = function(e) {
          # Log the error and return NULL
          skipped_log[[length(skipped_log) + 1]] <<- list(comparison=comparison_id, reason=paste("Error calculating effect size:", e$message))
          return(NULL) 
        }) 
        
        # If effect size calculation was successful, add to list
        if (!is.null(effect_data)) {
          # Create a unique study label for netmeta (Study + Treatment + Outcome)
          # Sanitize outcome measure name for the label
          outcome_label_safe <- gsub("[^a-zA-Z0-9_.-]", "_", outcome_measure)
          unique_studlab <- paste(study_name, combined_treatment_label, outcome_label_safe, sep = "__") 
          
          nma_entry <- data.frame(
            studlab = unique_studlab,
            # Keep original study name for merging RoB later
            study_name_orig = study_name, 
            outcome = outcome_measure,
            treat1 = combined_treatment_label, # Active treatment
            treat2 = reference_treatment_label, # Reference treatment (SHAM)
            n1 = effect_data$n1,
            n2 = effect_data$n2,
            TE = effect_data$TE,   # Mean Difference (MD)
            seTE = effect_data$seTE, # Standard Error of MD
            lower_is_better = outcome_data$lower_is_better[1], 
            stringsAsFactors = FALSE
          )
          
          # Add Diagnosis if available
          if(add_diagnosis) {
              nma_entry$Diagnosis <- diagnosis_value
          }

          nma_data_list[[length(nma_data_list) + 1]] <- nma_entry
        }
      } # End loop through active groups
    } # End loop through outcome measures
  } # End loop through studies
  
  # --- Final Output and Logging ---
  final_nma_data <- bind_rows(nma_data_list) 

  if (length(skipped_log) > 0) {
    cat("\n--- Warnings/Errors during NMA data preparation for domain:", ifelse(is.null(domain_filter), "All Domains", domain_filter), "---\n")
    skip_reasons <- sapply(skipped_log, function(x) x$reason)
    # Simplify reasons for summary table
    skip_reasons_simple <- sub(":.+", "", skip_reasons) 
    skip_summary <- table(skip_reasons_simple)
    cat("Summary of reasons for skipped comparisons/errors:\n")
    print(skip_summary)
    
    # Show detailed messages for the first few skips
    cat("\nFirst 10 detailed skip/error messages:\n")
    detailed_skips <- sapply(head(skipped_log, 10), function(x) {
        comp_id <- ifelse(is.null(x$comparison) || x$comparison == "", "[Unknown Comparison]", x$comparison)
        reason <- ifelse(is.null(x$reason) || x$reason == "", "[Unknown Reason]", x$reason)
        paste(" - Comparison:", comp_id, "| Reason:", reason)
    })
    cat(paste(detailed_skips, collapse = "\n"))
    
    if (length(skipped_log) > 10) {
      cat("\n... and", length(skipped_log) - 10, "more warnings/errors ...\n")
    }
     cat("--------------------------------------------------------------\n")
  } else {
     cat("\nNMA data preparation complete for domain:", ifelse(is.null(domain_filter), "All Domains", domain_filter), "- No comparison skipping warnings or errors reported.\n")
  }
  
  # Final check if any data was generated
  if (nrow(final_nma_data) == 0) {
     warning("No valid comparisons were generated for domain: ", ifelse(is.null(domain_filter), "All Domains", domain_filter), 
             ". Check the warnings above, the standardized time points, required columns, and your source data file.")
  }
  
  return(final_nma_data)
}

— Core NMA and Visualization Functions —

# (Includes functions: run_nma, create_forest_plot, create_network_graph, 
#  calculate_and_plot_sucra, perform_split_analysis, create_league_table, 
#  create_funnel_plot, create_rankogram_plot, perform_meta_regression)
# Note: These functions are largely based on the first code snippet provided, 
# with minor adjustments for robustness or clarity.

#' Run Network Meta-Analysis using netmeta
#' @param data Prepared NMA data frame from `prepare_nma_data`.
#' @param title Title for output messages.
#' @param reference_group The label of the reference treatment (e.g., "SHAM").
#' @param sm Summary measure ("MD" or "SMD"). Default is "MD".
#' @param use_random_effects Boolean. Use random-effects model? Default TRUE.
#' @param use_common_effects Boolean. Use common-effects model? Default FALSE.
#' @param tau_method Method for estimating tau-squared (e.g., "DL", "REML"). Default "REML".
#' @return A `netmeta` object or NULL if NMA fails or data is insufficient.
run_nma <- function(data, title, reference_group = "SHAM", sm = "MD", 
                    use_random_effects = TRUE, use_common_effects = FALSE, tau_method = "REML") {
  
  # --- Input Checks ---
  if (is.null(data) || nrow(data) == 0) {
     cat("NMA skipped for", title, "- No data provided.\n")
     return(NULL)
  }
  # Need at least 2 comparisons for netmeta to run, ideally more for a network
  if (nrow(data) < 2) { 
    cat("NMA skipped for", title, "- Insufficient data (", nrow(data), " comparisons found, need at least 2).\n")
    return(NULL)
  }
  
  treatments <- unique(c(data$treat1, data$treat2))
  if (length(treatments) < 2) {
     cat("NMA skipped for", title, "- Fewer than 2 unique treatments found.\n")
     return(NULL)
  }
   if (length(treatments) < 3 && length(unique(data$studlab)) > 1) {
     # It's not strictly an error, but NMA benefits from >= 3 treatments
     cat("Note for", title, "- Only 2 treatments. NMA provides limited advantage over standard pairwise meta-analysis.\n")
   }
   if (!reference_group %in% treatments) {
       original_reference_group <- reference_group
       # Fallback to the first treatment alphabetically if specified reference not found
       reference_group <- sort(treatments)[1] 
       warning("Reference group '", original_reference_group, "' not found in treatments for ", title, 
               ". Using '", reference_group, "' as reference instead.")
   }

  cat("\n--- Running Network Meta-Analysis for:", title, "---\n")
  cat("Number of comparisons:", nrow(data), "\n")
  cat("Number of unique studies (studlab):", length(unique(data$studlab)), "\n")
  cat("Treatments included:", paste(treatments, collapse=", "), "\n")
  cat("Reference treatment:", reference_group, "\n")
  cat("Model type:", ifelse(use_random_effects, "Random Effects", "Common Effects"), "(tau method:", tau_method, ")\n")

  # Pass the merged data (including RoB/Diagnosis if available) to netmeta
  nma_result <- tryCatch({
    netmeta(
      TE = TE,
      seTE = seTE,
      treat1 = treat1,
      treat2 = treat2,
      studlab = studlab, 
      data = data, # This now includes RoB/Diagnosis columns if merged successfully
      sm = sm,
      reference.group = reference_group,
      common = use_common_effects, 
      random = use_random_effects, 
      method.tau = tau_method,
      # Enable back-calculation for multi-arm studies if needed (often useful)
      tol.multiarm = 0.5, 
      warn = TRUE 
    )
  }, error = function(e) {
    cat("!!! Error during netmeta execution for", title, ":", e$message, "\n")
    # Provide more context if the error is about disconnected networks
    if (grepl("network is disconnected", e$message, ignore.case = TRUE)) {
        cat("  -> This often means there are groups of treatments that are not linked by any common comparators.\n")
        cat("  -> Consider visualizing the network graph to identify the disconnected components.\n")
    }
    return(NULL)
  })
  
  if (is.null(nma_result)) {
      cat("--- NMA failed for:", title, "---\n")
  } else {
      cat("--- NMA completed successfully for:", title, "---\n")
      # Print heterogeneity stats if random effects model was used
      if(use_random_effects && !is.null(nma_result$tau2)) {
          cat("Estimated heterogeneity (tau^2):", round(nma_result$tau2, 4), "\n")
          # I^2 is a measure of inconsistency in NMA, not just heterogeneity
          if (!is.null(nma_result$I2) && !is.na(nma_result$I2) && nma_result$tau2 > 0) {
             cat("I^2 statistic (overall inconsistency):", scales::percent(nma_result$I2, accuracy=0.1), "\n")
             # Also print Q statistic for heterogeneity/inconsistency
             cat("Cochran's Q:", round(nma_result$Q, 2), ", df =", nma_result$df.Q, ", p-value =", format.pval(nma_result$pval.Q, digits=3), "\n")
          } else {
             cat("I^2 / Q statistic not applicable or calculated as 0.\n")
          }
      } else if (use_common_effects) {
          # Print Q statistic for heterogeneity/inconsistency test even in common effects
          if(!is.null(nma_result$Q)) {
             cat("Test for heterogeneity/inconsistency (Cochran's Q):", round(nma_result$Q, 2), ", df =", nma_result$df.Q, ", p-value =", format.pval(nma_result$pval.Q, digits=3), "\n")
          }
      }
  }
  
  return(nma_result)
}


#' Create Forest Plot for NMA results
#' @param nma_result A `netmeta` object.
#' @param title Title for the plot.
#' @param sort_by_effect Logical. Sort treatments by effect size? Default TRUE.
#' @return Prints a forest plot. Returns NULL invisibly.
create_forest_plot <- function(nma_result, title, sort_by_effect = TRUE) {
  if (is.null(nma_result)) return(invisible(NULL))
  
  cat("\nGenerating Forest Plot for:", title, "\n")
  
  tryCatch({
    sort_var <- NULL
    # Determine sorting variable (effect size vs reference) if requested
    if (sort_by_effect) {
        ref_group <- nma_result$reference.group
        # Use the appropriate TE matrix based on the model fitted
        te_matrix <- if (nma_result$random) nma_result$TE.random else nma_result$TE.common
        
        # Check if the reference group exists in the matrix columns
        if (!is.null(te_matrix) && ref_group %in% colnames(te_matrix)) {
            sort_var <- te_matrix[, ref_group] 
            # Ensure NA values don't cause issues, maybe sort them last
            sort_var[is.na(sort_var)] <- Inf 
        } else if (!is.null(te_matrix)) {
            warning("Reference group '", ref_group, "' not found in TE matrix columns for sorting forest plot. Using default order.")
            sort_var <- NULL # Fallback to default order
        } else {
             warning("TE matrix not found for sorting forest plot. Using default order.")
             sort_var <- NULL
        }
    }

    # Define labels based on the interpretation (positive MD = favors treatment)
    label_left <- "Favors Reference" 
    label_right <- "Favors Treatment" 
    
    # Generate the forest plot
    forest(
      nma_result,
      reference.group = nma_result$reference.group,
      sortvar = sort_var, 
      smlab = paste("Effect vs.", nma_result$reference.group, "-", title, "(MD)"),
      drop.reference = TRUE, # Don't plot the reference against itself
      label.left = label_left,
      label.right = label_right,
      xlab = "Mean Difference (MD)",
      print.I2 = TRUE, # Show overall I^2 on the plot
      print.tau2 = nma_result$random, # Show tau^2 if random effects
      print.Q = TRUE # Show Q statistic details
    )
    
  }, error = function(e) {
    cat("!!! Error creating forest plot for", title, ":", e$message, "\n")
  })
  
  return(invisible(NULL))
}


#' Create Network Graph for NMA
#' @param nma_result A `netmeta` object.
#' @param title Title for the plot.
#' @param node_size_proportional_to_n Logical. Make node size proportional to total N per treatment? Default TRUE.
#' @param use_thickness Logical. Use edge thickness to represent precision or number of studies? Default TRUE.
#' @param thickness_measure Character. What should thickness represent? "se.random", "se.common", "number.of.studies". Default "number.of.studies".
#' @return Prints a network graph. Returns NULL invisibly.
create_network_graph <- function(nma_result, title, 
                                 node_size_proportional_to_n = TRUE, 
                                 use_thickness = TRUE,
                                 thickness_measure = "number.of.studies") { 
  if (is.null(nma_result)) return(invisible(NULL))
  
  cat("\nGenerating Network Graph for:", title, "\n")

  tryCatch({
      
      # Calculate node size based on total N per treatment if requested
      cex_points <- 1.5 # Default size
      if (node_size_proportional_to_n && nrow(nma_result$data) > 0) {
          # Sum N1 and N2 for each treatment across all comparisons it appears in
          n_sum <- nma_result$data %>%
            select(treat1, treat2, n1, n2) %>%
            pivot_longer(cols = c(treat1, treat2), names_to = "treat_role", values_to = "Treatment") %>%
            mutate(N = ifelse(treat_role == "treat1", n1, n2)) %>%
            group_by(Treatment) %>%
            # Summarise total N, handling potential NAs
            summarise(TotalN = sum(N, na.rm = TRUE), .groups = 'drop') 
            
          # Match total N to the order of treatments in nma_result$trts
          n_total_ordered <- n_sum$TotalN[match(nma_result$trts, n_sum$Treatment)]
          n_total_ordered[is.na(n_total_ordered)] <- 0 # Replace NA with 0 if a treatment had no N

          # Scale node size (cex) based on TotalN, ensuring a minimum size
          if(max(n_total_ordered, na.rm = TRUE) > 0) {
              # Scale from 1 (min size) up to 3 (max size) based on relative N
              cex_points <- 1 + 2 * (n_total_ordered / max(n_total_ordered, na.rm = TRUE)) 
          } else {
              # If all Ns are 0 or missing, use default size
              cex_points <- rep(1.5, length(nma_result$trts)) 
          }
      } else {
          # If not proportional or no data, use default size
          cex_points <- rep(1.5, length(nma_result$trts)) 
      }
      
      # Determine thickness argument based on user choice and model fit
      thickness_arg <- NULL
      if (use_thickness) {
          valid_thickness_options <- c("se.random", "se.common", "number.of.studies")
          if (thickness_measure %in% valid_thickness_options) {
              thickness_arg <- thickness_measure
              # Check model fit vs requested SE measure
              if (thickness_measure == "se.random" && !nma_result$random) {
                  warning("Thickness set to 'se.random' but model is common effects. Using 'se.common'.")
                  thickness_arg <- "se.common"
              }
              if (thickness_measure == "se.common" && nma_result$random) { # Use random if common requested but model is random
                  warning("Thickness set to 'se.common' but model is random effects. Using 'se.random'.")
                  thickness_arg <- "se.random"
              }
              # Check if the chosen SE measure is actually available in the results
              se_matrix_name <- if(thickness_arg == "se.random") "seTE.random" else "seTE.common"
              if (grepl("se.", thickness_arg) && is.null(nma_result[[se_matrix_name]])) {
                   warning("Thickness set to '", thickness_arg, "' but ", se_matrix_name, " not found in results. Using default thickness.")
                   thickness_arg <- NULL
              }
          } else {
              warning("Invalid 'thickness_measure' provided: '", thickness_measure, "'. Using default thickness.")
          }
      }

      # Generate the network graph
      netgraph(
        nma_result,
        col = "skyblue", # Node color
        plastic = FALSE, # Use spring layout algorithm
        thickness = thickness_arg, # Edge thickness based on selection
        points = TRUE, # Draw nodes
        cex = cex_points, # Node size based on calculation
        # Show number of studies on edges unless thickness already represents it
        number.of.studies = (is.null(thickness_arg) || thickness_arg != "number.of.studies"), 
        main = paste("Network Plot -", title) 
      )
      
  }, error = function(e) {
    cat("!!! Error creating network graph for", title, ":", e$message, "\n")
  })
  
  return(invisible(NULL))
}


#' Calculate and Plot SUCRA values (using Pscore from netrank)
#' @param nma_result A `netmeta` object.
#' @param title Title for the plot and output.
#' @return A list containing the ggplot object (`plot`) and the SUCRA data frame (`data`), or NULLs if calculation fails. Returns invisibly.
calculate_and_plot_sucra <- function(nma_result, title) { 
  if (is.null(nma_result)) return(invisible(list(plot = NULL, data = NULL)))
  
  cat("\nCalculating SUCRA/P-score values for:", title, "\n")
  
  sucra_data <- NULL
  sucra_plot <- NULL
  ranks <- NULL 
  
  tryCatch({ 
    # Calculate rankings and P-scores (SUCRA equivalent in netmeta)
    # Use the model type (random/common) that was fitted
    use_random <- nma_result$random
    ranks <- netrank(nma_result, random = use_random, common = !use_random) 
    
  }, error = function(e) {
     cat("!!! Error during netrank execution for SUCRA/P-score calculation in", title, ":", e$message, "\n")
     ranks <<- NULL # Ensure ranks is NULL on error
  })
  
  if (!is.null(ranks)) {
     tryCatch({ 
       # Extract P-scores (SUCRA equivalent) and mean ranks
       # Column names depend on whether random or common model was used
       pscore_col_name <- if (nma_result$random) "Pscore.random" else "Pscore.common" 
       # Try alternative naming conventions for mean rank if the primary one isn't found
       rank_col_name_primary <- if (nma_result$random) "ranking.random.mean" else "ranking.common.mean"
       rank_col_name_alt <- if (nma_result$random) "mean.rank.random" else "mean.rank.common"
       
       # Check if expected P-score column exists
       if (pscore_col_name %in% names(ranks)) {
         pscore_values <- ranks[[pscore_col_name]]
         
         # Convert P-score (0 to 1) to SUCRA percentage (0 to 100)
         sucra_values_pct <- as.numeric(pscore_values) * 100 
         
         # Create data frame for plotting and output
         sucra_data <- data.frame(
           Treatment = names(pscore_values),
           SUCRA = round(sucra_values_pct, 1), # Store P-score as SUCRA (%)
           stringsAsFactors = FALSE
         )
         
         # Add mean rank if available, checking both potential column names
         rank_col_name <- NULL
         if (rank_col_name_primary %in% names(ranks)) {
             rank_col_name <- rank_col_name_primary
         } else if (rank_col_name_alt %in% names(ranks)) {
             rank_col_name <- rank_col_name_alt
         }
         
         if (!is.null(rank_col_name)) {
            sucra_data$Mean_Rank <- round(as.numeric(ranks[[rank_col_name]]), 2)
         } else {
            cat("Mean rank column not found in netrank results.\n")
         }
         
         # Sort data by SUCRA score (descending) for plotting and table
         sucra_data <- sucra_data %>% arrange(desc(SUCRA))
         
         cat("SUCRA/P-score Results:\n")
         print(sucra_data)
         
         # Create SUCRA bar plot using ggplot2
         sucra_plot <- ggplot(sucra_data, aes(x = reorder(Treatment, SUCRA), y = SUCRA)) +
           geom_bar(stat = "identity", fill = "steelblue", color = "black") +
           # Add text labels for SUCRA values
           geom_text(aes(label = sprintf("%.1f%%", SUCRA)), hjust = -0.2, size = 3.5, color="black") + 
           coord_flip(ylim = c(0, 105)) + # Flip coordinates for horizontal bars, extend y-limit for labels
           labs(
             title = paste("SUCRA / P-score Plot -", title),
             subtitle = "Surface Under the Cumulative Ranking Curve / P-score",
             caption = "Higher percentage indicates higher probability of being among the best treatments",
             x = "Treatment",
             y = "SUCRA / P-score (%)"
           ) +
           theme_minimal(base_size = 12) +
           theme(
             panel.grid.major.y = element_blank(), # Remove horizontal grid lines
             panel.grid.minor.y = element_blank(),
             panel.grid.major.x = element_line(linetype = "dashed", color="grey80"), # Keep vertical grid lines
             plot.title = element_text(face = "bold", hjust = 0.5),
             plot.subtitle = element_text(hjust = 0.5),
             axis.title = element_text(face = "bold"),
             axis.text.y = element_text(size = 11), # Adjust y-axis text size if needed
             plot.margin = margin(10, 25, 10, 10) # Adjust right margin for labels
           )
           
           print(sucra_plot) # Display the plot
   
       } else {
         cat("Could not extract SUCRA/P-score values (column '", pscore_col_name, "') from netrank object.\n")
         cat("Structure of netrank object:\n")
         try(print(str(ranks)), silent = TRUE) # Print structure for debugging
       }
     
     }, error = function(e) {
          cat("!!! Error processing netrank results or plotting SUCRA for", title, ":", e$message, "\n")
          sucra_plot <<- NULL # Ensure plot is NULL on error
          sucra_data <<- NULL # Ensure data is NULL on error
     }) 
  } 
  
  return(invisible(list(plot = sucra_plot, data = sucra_data)))
}


#' Perform Split Analysis (Direct vs Indirect Evidence) and Plot
#' @param nma_result A `netmeta` object.
#' @param title Title for output and plot.
#' @param p_threshold P-value threshold to highlight potential inconsistency. Default 0.1.
#' @return The result of `netsplit` invisibly. Prints summary and potentially a plot.
perform_split_analysis <- function(nma_result, title, p_threshold = 0.1) {
  if (is.null(nma_result)) return(invisible(NULL))
  
  # Check if the network is connected, netsplit requires a connected network
# --- Revised Code inside perform_split_analysis ---
# Check if the network is connected... (keep this part)
if (length(nma_result$trts) > 1 && !is.null(nma_result$A.matrix) && netmeta::netconnection(nma_result)$n.subnets > 1) {
    cat("\nSkipping Split Analysis (Direct vs Indirect) for:", title, "- Network is disconnected.\n")
    return(invisible(NULL))
}

# Robust check for number of treatments (>= 3 required for netsplit)
skip_split <- TRUE # Default to skipping
if (!is.null(nma_result$k.trts)) {
    # Ensure k.trts is treated as a single numeric value
    num_treatments <- suppressWarnings(as.numeric(nma_result$k.trts[1])) 
    if (!is.na(num_treatments) && num_treatments >= 3) {
        skip_split <- FALSE # OK to proceed, don't skip
    }
}
if (skip_split) {
    cat("\nSkipping Split Analysis (Direct vs Indirect) for:", title, "- Requires at least 3 treatments or k.trts is missing/invalid.\n")
    return(invisible(NULL))
}


cat("\n--- Performing Split Analysis (Direct vs Indirect) for:", title, "---\n")

  split_result <- NULL
  
  tryCatch({
    # Run netsplit using the fitted model (random or common)
    split_result <- netsplit(nma_result) 
    
    cat("Summary of Direct vs Indirect Evidence:\n")
    # Print the relevant part (random or common)
    print(summary(split_result)) 
    
    # Check for inconsistency based on the p-value for the difference
    # The p-value column name depends on the model type
    p_col_name <- if(nma_result$random) "p.random" else "p.common"
    diff_col_name <- if(nma_result$random) "diff.random" else "diff.common"
    direct_col_name <- if(nma_result$random) "direct.random" else "direct.common"
    indirect_col_name <- if(nma_result$random) "indirect.random" else "indirect.common"
    
    # Check if the 'p' column exists before subsetting
    if (p_col_name %in% names(split_result)) {
        # Filter for comparisons where direct & indirect exist and p < threshold
        inconsistent_comparisons <- subset(split_result, 
                                           !is.na(split_result[[direct_col_name]]) & 
                                           !is.na(split_result[[indirect_col_name]]) & 
                                           !is.na(split_result[[p_col_name]]) & 
                                           split_result[[p_col_name]] < p_threshold)
        
        if (nrow(inconsistent_comparisons) > 0) {
          cat("\nPotential Inconsistency Detected (p <", p_threshold, ") in the following comparisons:\n")
           # Select relevant columns for printing
           cols_to_print <- c("comparison", direct_col_name, indirect_col_name, diff_col_name, p_col_name)
           print(format(inconsistent_comparisons[, cols_to_print], digits=2))
   
          # Generate the plot highlighting inconsistent comparisons
          plot(split_result, 
               show = "all", # Show all comparisons
               digits = 2, 
               highlight = "pval", # Highlight based on p-value
               threshold = p_threshold, # Use the specified threshold
               main = paste("Direct vs Indirect Evidence -", title))
          mtext(paste("Comparisons with p <", p_threshold, "highlighted"), side = 1, line = 4, cex=0.8)
   
        } else {
          cat("\nNo significant inconsistency detected between direct and indirect evidence (at p <", p_threshold, ").\n")
        }
    } else {
        cat("\n'p' value column ('", p_col_name ,"') not found in netsplit results. Cannot check for inconsistency.\n")
        cat("This might happen if there are no closed loops for indirect evidence calculation.\n")
    }
    
  }, error = function(e) {
    cat("!!! Unable to perform direct/indirect evidence split for", title, ":", e$message, "\n")
    # Provide specific advice if the error is about loops
    if (grepl("no indirect evidence|no closed loops", e$message, ignore.case = TRUE)) {
        cat("  -> This usually means the network structure doesn't allow for indirect comparisons between certain treatments.\n")
    }
    return(invisible(NULL)) 
  })
  
  return(invisible(split_result))
}


#' Create and Display League Table
#' @param nma_result A `netmeta` object.
#' @param title Title for the output.
#' @param digits Number of digits for rounding.
#' @return The league table object from `netleague` invisibly. Prints formatted table.
create_league_table <- function(nma_result, title, digits = 2) {
  if (is.null(nma_result)) return(invisible(NULL))
  
  cat("\n--- Generating League Table for:", title, "---\n")
  
  league_table_obj <- NULL
  
  tryCatch({
    use_random <- nma_result$random
    model_type <- if (use_random) "random" else "common"
      
    # Generate the league table data structure
    league_table_obj <- netleague(nma_result, 
                                  digits = digits, 
                                  random = use_random, 
                                  common = !use_random, 
                                  bracket="[", # CI bracket style
                                  separator = ", ", # CI separator
                                  seq = nma_result$trts # Ensure consistent order
                                  ) 

    cat("League Table (Model:", model_type, "):\n")
    # Extract the table matrix (random or common)
    table_to_print <- if (model_type == "random") league_table_obj$random else league_table_obj$common
    
    if (!is.null(table_to_print)) {
        # Print the table using kable for better formatting in HTML output
        print(
          kable(table_to_print, caption = paste("League Table:", title, "(", model_type, "effects)"), row.names = TRUE) %>%
          kable_styling(bootstrap_options = c("striped", "hover", "condensed", "responsive"), full_width = FALSE)
        )
    } else {
        cat("Could not extract league table data.\n")
    }
    
    cat("\nInterpretation Guide:\n")
    cat("- Comparisons are 'Column Treatment' vs 'Row Treatment'.\n")
    cat("- Cells contain: MD [95% CI].\n")
    # cat("- Lower triangle: Corresponding p-value (Note: netleague doesn't include p-values directly in the table).\n") # Correction: p-values not in standard netleague output
    cat("- Positive MD favors the column treatment (assuming positive TE = benefit after direction adjustment).\n")
    
  }, error = function(e) {
    cat("!!! Error creating league table for", title, ":", e$message, "\n")
    return(invisible(NULL)) 
  })
  
  return(invisible(league_table_obj))
}


#' Create Comparison-Adjusted Funnel Plot
#' @param nma_result A `netmeta` object.
#' @param title Title for the plot.
#' @param order Optional vector of treatment names to specify order for comparisons. If NULL, uses default order.
#' @return Prints a funnel plot. Returns NULL invisibly.
create_funnel_plot <- function(nma_result, title, order = NULL) {
    if (is.null(nma_result)) return(invisible(NULL))
    
    cat("\nGenerating Comparison-Adjusted Funnel Plot for:", title, "\n")
    
    tryCatch({
        # Use default treatment order if not specified
        if (is.null(order)) {
            order <- nma_result$trts
        }
        
        # Funnel plots are generally recommended for >= 10 studies/comparisons
        if (nrow(nma_result$data) < 10) {
             cat("Skipping funnel plot for", title, "- fewer than 10 comparisons, plot may be misleading.\n")
             return(invisible(NULL))
        }

        # Generate the funnel plot
        funnel(nma_result, 
               order = order, 
               linreg = TRUE, # Add Egger's regression line
               pch = 16, col = adjustcolor("blue", alpha.f = 0.6), # Point style
               xlab = "Mean Difference (MD)", 
               main = paste("Comparison-Adjusted Funnel Plot -", title))
        # Add a legend
        legend("topright", inset = .02, 
               legend=c("Comparison estimate", "Regression line (Egger's test)"), 
               pch=c(16, NA), lty=c(NA, 1), col=c("blue", "red"), cex=0.8, bg="white")

        # Perform Egger's test (metafor::regtest can be used on pairwise components, 
        # but netmeta's funnel implicitly runs a network version)
        # For NMA, interpreting asymmetry is complex. Visual inspection is key.
        # We can report the test result from the funnel object if needed.
        # funnel_results <- funnel(nma_result, order = order) # Re-run silently to get object
        # egger_test_p <- funnel_results$pval.linreg # Extract p-value
        # if(!is.null(egger_test_p)) {
        #    cat("\nEgger's test for funnel plot asymmetry (network adjusted) p-value:", format.pval(egger_test_p, digits=3), "\n")
        # }
        
        cat("\nVisual assessment of funnel plot asymmetry recommended.")
        cat("\nAsymmetry may suggest publication bias or other systematic differences between small and large studies.\n")

    }, error = function(e) {
        cat("!!! Error creating funnel plot for", title, ":", e$message, "\n")
    })
    
    return(invisible(NULL))
}


#' Create Rankogram Plot
#' @param nma_result A `netmeta` object.
#' @param title Title for the plot.
#' @return Prints a rankogram. Returns NULL invisibly.
create_rankogram_plot <- function(nma_result, title) { 
    if (is.null(nma_result)) return(invisible(NULL))
    
    cat("\nGenerating Rankogram for:", title, "\n")
    
    ranks <- NULL # Initialize
    tryCatch({
        # Calculate ranks based on the fitted model
        ranks <- netrank(nma_result, random = nma_result$random, common = !nma_result$random)
    }, error = function(e) {
        cat("!!! Error during netrank execution for Rankogram in", title, ":", e$message, "\n")
        ranks <<- NULL # Ensure ranks is NULL on error
    })

    if (!is.null(ranks)) {
        tryCatch({
            # Check if ranks object contains the necessary probability matrix
            # The matrix itself is needed by rankogram(), not the netrank object
            prob_matrix_name <- if(nma_result$random) "Pmatrix.random" else "Pmatrix.common"
            
            if (prob_matrix_name %in% names(ranks) && is.matrix(ranks[[prob_matrix_name]])) {
                # Pass the actual probability matrix to rankogram()
                rankogram(ranks[[prob_matrix_name]], main = paste("Rankogram -", title)) 
                mtext("Probability of each treatment achieving a certain rank (1 = best)", side = 1, line = 4, cex=0.8)
            } else {
                cat("Could not generate rankogram: Probability matrix ('", prob_matrix_name ,"') not found or invalid in netrank object.\n")
                cat("Structure of netrank object:\n")
                try(print(str(ranks)), silent = TRUE) # Print structure for debugging
            }
        }, error = function(e) {
            cat("!!! Error creating rankogram plot for", title, ":", e$message, "\n")
        })
    }
    
    return(invisible(NULL))
}

#' Perform Network Meta-Regression
#' @param nma_result A fitted `netmeta` object.
#' @param covariate_name The name of the covariate column in the merged data (e.g., "Overall_RoB_Level", "Diagnosis").
#' @param title Title for the output.
#' @param is_categorical Logical. Is the covariate categorical (factor)? Default FALSE.
#' @return The result of `netmetareg` or NULL if it fails.
perform_meta_regression <- function(nma_result, covariate_name, title, is_categorical = FALSE) {
  if (is.null(nma_result)) {
    cat("\nSkipping meta-regression for", title, "using", covariate_name, "- NMA result is NULL.\n")
    return(NULL)
  }
  
  # Check if covariate column exists in the data used by netmeta
  if (!covariate_name %in% names(nma_result$data)) {
    cat("\nSkipping meta-regression for", title, "- Covariate '", covariate_name, "' not found in NMA data.\n")
    return(NULL)
  }
  
  # Check if there is variability in the covariate (at least 2 unique non-NA values)
  unique_covariate_values <- unique(na.omit(nma_result$data[[covariate_name]]))
  if (length(unique_covariate_values) < 2) {
     cat("\nSkipping meta-regression for", title, "- Covariate '", covariate_name, "' has less than 2 unique non-NA values.\n")
     return(NULL)
  }
  # Also check if all values are NA
  if (all(is.na(nma_result$data[[covariate_name]]))) {
      cat("\nSkipping meta-regression for", title, "- Covariate '", covariate_name, "' contains only NA values.\n")
      return(NULL)
  }

  cat("\n--- Performing Network Meta-Regression for:", title, "using covariate:", covariate_name, "---\n")
  
  # Create the formula dynamically
  # If categorical, wrap in factor()
  formula_str <- if(is_categorical) {
      paste("~ factor(", covariate_name, ")")
  } else {
      paste("~", covariate_name)
  }
  
  metareg_result <- tryCatch({
    # Ensure the covariate is in the correct format within the data frame used by netmetareg
    # If it's an ordered factor (like RoB), netmetareg might handle it, or convert to numeric
    # If it's character (like Diagnosis), convert to factor explicitly
    data_for_reg <- nma_result$data
    if(is_categorical && !is.factor(data_for_reg[[covariate_name]])) {
        data_for_reg[[covariate_name]] <- factor(data_for_reg[[covariate_name]])
        cat("Converted '", covariate_name, "' to factor for regression.\n")
    }
    
    # Run netmetareg using the formula and the potentially modified data
    netmeta:::netmetareg(nma_result, as.formula(formula_str), data = data_for_reg)  
    
  }, error = function(e) {
    cat("!!! Error during netmetareg execution for", title, "with covariate", covariate_name, ":", e$message, "\n")
    # Check for common errors
    if (grepl("not found|nicht gefunden", e$message)) {
        cat("  -> Double-check if the covariate '", covariate_name, "' exists in the data frame used by the nma_result object.\n")
    }
    if (grepl("factor|numeric|contrast", e$message, ignore.case = TRUE)) {
        cat("  -> Ensure the covariate '", covariate_name, "' is in the correct format (e.g., numeric or factor).\n")
        cat("  -> Current class:", class(nma_result$data[[covariate_name]]), "\n")
        if(is_categorical && is.factor(nma_result$data[[covariate_name]])) {
             cat("  -> Factor levels:", paste(levels(nma_result$data[[covariate_name]]), collapse=", "), "\n")
        }
    }
    if (grepl("system is computationally singular", e$message, ignore.case = TRUE)) {
         cat("  -> This might indicate perfect collinearity or insufficient data within covariate levels.\n")
    }
    return(NULL)
  })
  
  if (!is.null(metareg_result)) {
    cat("Meta-regression summary (Covariate:", covariate_name, "):\n")
    print(summary(metareg_result))
    
    # Optional: Plot bubble plot for continuous covariates
    if (!is_categorical) {
        tryCatch({
            # Create data subset without NAs for plotting
            plot_data_reg <- nma_result$data %>% 
                                filter(!is.na(.data[[covariate_name]]) & !is.na(TE) & !is.na(seTE) & seTE > 0)
            if(nrow(plot_data_reg) > 5) { # Only plot if enough points
                bubble_plot <- ggplot(plot_data_reg, aes(x = .data[[covariate_name]], y = TE, size = 1/seTE)) +
                  geom_hline(yintercept = 0, linetype = "dashed", color = "darkgray") +
                  geom_point(alpha = 0.6, shape=21, fill="lightblue") + # Use filled points
                  # Add regression line if model converged (optional, interpretation complex in NMA context)
                  # geom_smooth(method = "lm", aes(weight = 1/seTE^2), se = TRUE, color = "red", linetype="dotted") + 
                  scale_size(range = c(1, 8)) + # Adjust point size range
                  labs(title = paste("Meta-Regression Bubble Plot -", title),
                       subtitle = paste("Covariate:", covariate_name),
                       x = covariate_name,
                       y = "Mean Difference (MD)",
                       size = "Precision\n(1/SE)") +
                  theme_minimal()
                print(bubble_plot)
            } else {
                 cat("Skipping bubble plot for", covariate_name, "- insufficient data points.\n")
            }
        }, error = function(e_plot) {
             cat("Could not generate bubble plot for", covariate_name, ":", e_plot$message, "\n")
        })
    }
    
  } else {
    cat("--- Meta-regression failed for:", title, "using covariate:", covariate_name, "---\n")
  }
  
  return(metareg_result)
}

— Complete NMA Workflow Function —

#' Runs the full NMA workflow for specified domains.
#' Prepares data, runs NMA, generates standard plots (Forest, Network, SUCRA), 
#' performs advanced analyses (Split, League Table, Funnel, Rankogram, Meta-Regression on RoB & Diagnosis),
#' compares results across domains, and provides summary recommendations.
#' @param outcomes_df The pre-processed outcomes dataframe.
#' @param baseline_df The pre-processed baseline dataframe (including Diagnosis).
#' @param rob_data_processed_list A list of processed Risk of Bias data frames (e.g., named 'p', 'n', 'c'). Can be NULL.
#' @param domain_rob_map A named vector mapping analysis domain names to RoB indicators (e.g., c("positive_symptoms" = "p")).
#' @param domains_to_analyze A character vector of domain names to analyze.
#' @param correlation_pre_post Assumed pre-post correlation for `prepare_nma_data`.
#' @param reference_group Reference treatment label (e.g., "SHAM").
#' @return A list containing the results for each analyzed domain.
run_nma_workflow <- function(outcomes_df, baseline_df, rob_data_processed_list, domain_rob_map,
                             domains_to_analyze = c("positive_symptoms", "negative_symptoms", "total_psychopathology", "global_cognition"),
                             correlation_pre_post = 0.7,
                             reference_group = "SHAM") {
  
  all_results <- list() 
  
  # --- 1. Prepare Data for Each Domain ---
  cat("\n--- Preparing NMA Data for Specified Domains ---\n")
  prepared_data <- list()
  for (domain_name in domains_to_analyze) {
     cat("\n--- Preparing data for domain:", domain_name, "---\n")
     prep_data <- prepare_nma_data(
       outcomes_df = outcomes_df,
       baseline_df = baseline_df, # Pass baseline with Diagnosis
       domain_filter = if (domain_name == "all") NULL else domain_name, 
       correlation_pre_post = correlation_pre_post,
       reference_treatment_label = reference_group
     )
     
     # Check if data preparation yielded any results
     if (!is.null(prep_data) && nrow(prep_data) > 0) {
         
         # --- Merge RoB Data ---
         # Check if RoB data list exists and is not empty
         if (!is.null(rob_data_processed_list) && length(rob_data_processed_list) > 0) {
             rob_indicator <- domain_rob_map[domain_name] # Get indicator ('p', 'n', 'c')
             
             # Check if a valid indicator exists for this domain and the corresponding sheet was processed
             if (!is.na(rob_indicator) && rob_indicator %in% names(rob_data_processed_list)) {
                 cat("   Merging RoB data using indicator:", rob_indicator, "\n")
                 
                 # Select the appropriate processed RoB data frame
                 rob_subset <- rob_data_processed_list[[rob_indicator]]
                 
                 if (!is.null(rob_subset) && nrow(rob_subset) > 0) {
                     # Merge based on the original study name (parsed from RoB sheet)
                     # Ensure RoB subset has the necessary columns ('Study', 'Overall_RoB_Level')
                     if(all(c("Study", "Overall_RoB_Level") %in% names(rob_subset))) {
                         
                         # Select only needed RoB columns to avoid name clashes
                         rob_to_merge <- rob_subset %>% select(Study, Overall, Overall_RoB_Level) 
                         
                         prep_data_merged <- left_join(prep_data, 
                                                       rob_to_merge,
                                                       # Join on the parsed study names (case-insensitive just in case)
                                                       by = c("study_name_orig" = "Study")) 
                         
                         # Check merge results
                         merged_count <- sum(!is.na(prep_data_merged$Overall_RoB_Level))
                         cat("   Successfully merged RoB data for", merged_count, "out of", nrow(prep_data), "comparisons.\n")
                         if(merged_count < nrow(prep_data)) {
                             # Identify studies that didn't merge (for debugging)
                             unmerged_studies <- prep_data %>% 
                                                  anti_join(rob_to_merge, by = c("study_name_orig" = "Study")) %>%
                                                  distinct(study_name_orig)
                             cat("   -> Note: Some comparisons did not have matching RoB entries based on study name. Examples:", 
                                 paste(head(unmerged_studies$study_name_orig, 5), collapse=", "), "...\n")
                         }
                         prepared_data[[domain_name]] <- prep_data_merged
                     } else {
                          cat("   -> Warning: RoB subset for '", rob_indicator, "' is missing required columns ('Study', 'Overall_RoB_Level'). Skipping RoB merge.\n")
                          prepared_data[[domain_name]] <- prep_data # Use unmerged data
                     }
                 } else {
                     cat("   -> Warning: Processed RoB data for indicator '", rob_indicator, "' is empty. Skipping RoB merge.\n")
                     prepared_data[[domain_name]] <- prep_data # Use unmerged data
                 }
             } else {
                 cat("   -> RoB indicator ('", rob_indicator,"') not found for this domain or corresponding RoB sheet not processed. Skipping RoB merge.\n")
                 prepared_data[[domain_name]] <- prep_data # Use unmerged data
             }
         } else {
             cat("   -> RoB data list not available or empty. Skipping RoB merge for this domain.\n")
             prepared_data[[domain_name]] <- prep_data # Use unmerged data
         }
         cat("   Prepared", nrow(prepared_data[[domain_name]]), "comparisons for domain:", domain_name, "\n")
         # Check if Diagnosis column is present after preparation
         if ("Diagnosis" %in% names(prepared_data[[domain_name]])) {
             cat("   Diagnosis information included.\n")
         } else {
              cat("   Diagnosis information NOT included.\n")
         }
     } else {
         cat("No valid data prepared for domain:", domain_name, "- Skipping analysis for this domain.\n")
     }
  }
  cat("--- Finished Data Preparation ---\n")
  
  # --- 2. Run NMA and Generate Outputs for Each Domain ---
  valid_domains <- names(prepared_data) 
  
  if (length(valid_domains) == 0) {
     cat("\n!!! No domains had sufficient data prepared. Stopping workflow. !!!\n")
     cat("Please review data preparation warnings and standardized time points.\n")
     return(NULL)
  }
  
  for (domain in valid_domains) {
    cat("\n\n==========================================================\n")
    cat("   Starting NMA Workflow for Domain:", domain, "\n")
    cat("==========================================================\n")
    
    domain_data <- prepared_data[[domain]]
    domain_results <- list() 
    
    # Run NMA
    # Use REML as default for tau estimation, often preferred over DL
    nma_result <- run_nma(domain_data, title = domain, reference_group = reference_group, tau_method = "REML") 
    domain_results$nma_object <- nma_result
    
    if (!is.null(nma_result)) {
      
      cat("\n--- NMA Summary ---\n")

nma_summary_obj <- summary(nma_result) # Get the summary object

cat("\nResults (", nma_summary_obj$model, " effects model):\n", sep="")
cat("Number of studies: k =", nma_summary_obj$k, "\n")
cat("Number of pairwise comparisons: m =", nma_summary_obj$m, "\n")
cat("Number of treatments: n =", nma_summary_obj$n, "\n")
cat("Number of designs: d =", nma_summary_obj$d, "\n")

cat("\nTreatment estimates (sm = '", nma_summary_obj$sm, "', comparison: other treatments vs '", nma_summary_obj$reference.group, "'):\n", sep="")
# Print the comparison table (random or common)
if(!is.null(nma_summary_obj$random)) {
    print(nma_summary_obj$random)
} else if (!is.null(nma_summary_obj$common)) {
    print(nma_summary_obj$common)
}

cat("\nQuantifying heterogeneity / inconsistency:\n")
if (!is.null(nma_summary_obj$tau2)) {
    cat("tau^2 = ", round(nma_summary_obj$tau2, 4), "; tau = ", round(nma_summary_obj$tau, 4), "; ", sep="")
}
if (!is.null(nma_summary_obj$I2)) {
   cat("I^2 = ", scales::percent(nma_summary_obj$I2, accuracy=0.1), 
       " [", scales::percent(nma_summary_obj$lower.I2, accuracy=0.1),"; ", 
       scales::percent(nma_summary_obj$upper.I2, accuracy=0.1), "]\n", sep="")
} else {
   cat("I^2 not calculated.\n")
}

cat("\nTests of heterogeneity (within designs) and inconsistency (between designs):\n")
if(!is.null(nma_summary_obj$Q.hete)) { # Check if Q.hete exists
  print(nma_summary_obj$Q.hete)
} else if (!is.null(nma_summary_obj$Q.inconsistency)) { # Fallback for older versions or different structures
  print(nma_summary_obj$Q.inconsistency)
} else if (!is.null(nma_summary_obj$Q)) { # General Q if others missing
   cat("Overall Q =", round(nma_summary_obj$Q, 2), ", df =", nma_summary_obj$df.Q, ", p-value =", format.pval(nma_summary_obj$pval.Q, digits=3), "\n")
} else {
   cat("Q statistic details not found in summary object.\n")
}

cat("\nDetails of network meta-analysis methods:\n")
cat("- ", nma_summary_obj$method.nma, "\n") # Print method description
if (!is.null(nma_summary_obj$method.tau)) {
   cat("- ", nma_summary_obj$method.tau, " estimator for tau^2\n")
}
cat("- Calculation of I^2 based on Q\n")

      
      # Generate standard plots
      create_forest_plot(nma_result, title = domain)
      create_network_graph(nma_result, title = domain, thickness_measure = "number.of.studies") 
      
      # Calculate and plot SUCRA
      sucra_output <- calculate_and_plot_sucra(nma_result, title = domain)
      domain_results$sucra_data <- sucra_output$data
      
      # Run netsplit once for reuse in inconsistency check and potentially netheat
      split_result <- perform_split_analysis(nma_result, title = domain)
      domain_results$split_analysis <- split_result 
      
      # Generate league table
      domain_results$league_table <- create_league_table(nma_result, title = domain)
      
      # Generate funnel plot
      create_funnel_plot(nma_result, title = domain) 
      
      # Generate rankogram
      create_rankogram_plot(nma_result, title = domain)
      
      # --- Meta-regression using RoB ---
      # Check if the RoB level column exists after merging
      if ("Overall_RoB_Level" %in% names(nma_result$data)) {
         domain_results$metareg_rob <- perform_meta_regression(nma_result, 
                                                               covariate_name = "Overall_RoB_Level", 
                                                               title = domain,
                                                               is_categorical = TRUE) # RoB level is ordered factor
      } else {
         cat("\nSkipping meta-regression for RoB - 'Overall_RoB_Level' column not found after merge.\n")
      }
      
      # --- Meta-regression using Diagnosis ---
      # Check if the Diagnosis column exists and has data
      if ("Diagnosis" %in% names(nma_result$data) && !all(is.na(nma_result$data$Diagnosis))) {
         domain_results$metareg_diagnosis <- perform_meta_regression(nma_result, 
                                                                     covariate_name = "Diagnosis", 
                                                                     title = domain,
                                                                     is_categorical = TRUE) # Diagnosis is categorical
      } else {
         cat("\nSkipping meta-regression for Diagnosis - 'Diagnosis' column not found or contains only NA values.\n")
      }
      
      # Note: Net Heat plot was removed in previous version due to errors, keeping it removed.
      # create_netheat_plot(nma_result, split_result = split_result, title = domain) 
      
    } else {
      cat("\n--- Skipping further analysis for domain:", domain, "due to NMA failure or insufficient data. ---\n")
    }
    
    all_results[[domain]] <- domain_results 
    cat("\n==========================================================\n")
    cat("   Finished NMA Workflow for Domain:", domain, "\n")
    cat("==========================================================\n")
    
  } # End loop through domains
  
  # --- 3. Cross-Domain Comparison (using SUCRA) ---
  cat("\n\n==========================================================\n")
  cat("   Cross-Domain Comparison (Based on SUCRA/P-score) \n") 
  cat("==========================================================\n")
  
  all_sucra_data <- list()
  if (length(all_results) > 0) {
     for (domain in names(all_results)) {
       # Check if sucra_data exists and is not NULL within the domain's results
       if (!is.null(all_results[[domain]]) && !is.null(all_results[[domain]]$sucra_data)) {
         sucra_df <- all_results[[domain]]$sucra_data
         # Ensure it's a dataframe and has rows before adding Domain column
         if(is.data.frame(sucra_df) && nrow(sucra_df) > 0) {
             sucra_df$Domain <- domain 
             all_sucra_data[[domain]] <- sucra_df
         }
       }
     }
  }
  
  # Proceed only if we have SUCRA data from at least two domains
  if (length(all_sucra_data) > 1) { 
    combined_sucra <- bind_rows(all_sucra_data)
    # Find treatments present in more than one domain (excluding reference)
    treatment_counts <- combined_sucra %>% 
                          filter(Treatment != reference_group) %>%
                          count(Treatment)
    multi_domain_treatments <- treatment_counts %>% filter(n > 1) %>% pull(Treatment)
    
    if (length(multi_domain_treatments) > 0) { 
      comparison_data <- combined_sucra %>% 
          filter(Treatment %in% multi_domain_treatments) 
          # No need to filter out reference group here, it won't be in multi_domain_treatments

      if(nrow(comparison_data) > 0) {
        # SUCRA Comparison Plot
        sucra_comparison_plot <- ggplot(comparison_data, aes(x = Domain, y = SUCRA, group = Treatment, color = Treatment)) +
          geom_line(linewidth = 1.1) + geom_point(size = 2.5) +
          labs( title = "Cross-Domain Treatment Performance Comparison", subtitle = "SUCRA / P-score (%) - Higher is generally better", x = "Symptom/Outcome Domain", y = "SUCRA / P-score (%)", color = "Treatment") + 
          theme_minimal(base_size = 12) + 
          theme( axis.text.x = element_text(angle = 45, hjust = 1), 
                 legend.position = "right", 
                 plot.title = element_text(face = "bold", hjust = 0.5), 
                 plot.subtitle = element_text(hjust = 0.5)) +
          scale_y_continuous(limits = c(0, 100)) 
        print(sucra_comparison_plot)
   
        # Rank Comparison Plot (if Mean_Rank column exists)
        if ("Mean_Rank" %in% names(comparison_data)) {
            rank_comparison_plot <- ggplot(comparison_data, aes(x = Domain, y = Mean_Rank, group = Treatment, color = Treatment)) +
              geom_line(linewidth = 1.1) + geom_point(size = 2.5) + 
              scale_y_reverse() + # Reverse y-axis because lower rank is better
              labs( title = "Cross-Domain Treatment Rank Comparison", subtitle = "Mean Rank - Lower is better", x = "Symptom/Outcome Domain", y = "Mean Rank", color = "Treatment") +
              theme_minimal(base_size = 12) + 
              theme( axis.text.x = element_text(angle = 45, hjust = 1), 
                     legend.position = "right", 
                     plot.title = element_text(face = "bold", hjust = 0.5), 
                     plot.subtitle = element_text(hjust = 0.5))
            print(rank_comparison_plot)
        }
        
        # Summary Table (Wide format)
        # Define columns to pivot (SUCRA and Mean_Rank if it exists)
        pivot_cols <- c("SUCRA", if("Mean_Rank" %in% names(comparison_data)) "Mean_Rank" else NULL)
        if (!is.null(pivot_cols)) { # Ensure pivot_cols is not empty
            summary_table_wide <- comparison_data %>%
              select(Treatment, Domain, all_of(pivot_cols)) %>%
              # Pivot wider, creating columns like 'SUCRA - positive_symptoms', 'Mean_Rank - positive_symptoms'
              pivot_wider( id_cols = Treatment, 
                           names_from = Domain, 
                           values_from = all_of(pivot_cols), 
                           names_sep = " - ") %>%
              arrange(Treatment) 
              
            cat("\n--- Summary Table: Treatment Performance Across Domains ---\n")
            print( 
              kable(summary_table_wide, caption = "Cross-Domain Treatment Performance Summary (SUCRA % / Mean Rank)", digits = 1) %>% 
              kable_styling(bootstrap_options = c("striped", "hover", "condensed", "responsive"), full_width = FALSE) %>% 
              column_spec(1, bold = TRUE) # Make Treatment names bold
            )
        } else {
             cat("\nCould not create summary table - required columns (SUCRA) not found.\n")
        }
      } else {
         cat("\nNo treatments (excluding reference) were found across multiple domains for comparison.\n")
      }
    } else {
      cat("\nInsufficient overlap in treatments across domains for a meaningful comparison plot/table.\n")
    }
  } else {
    cat("\nNot enough domains with successful SUCRA/P-score calculations for cross-domain comparison.\n") 
  }
  
  # --- 4. Generate Summary Recommendations ---
   cat("\n\n==========================================================\n")
  cat("   Summary Recommendations (Based on SUCRA/P-score) \n") 
  cat("==========================================================\n")
  
  if (length(all_results) > 0) {
     recommendations_made <- FALSE
     for (domain in names(all_results)) {
       # Check if sucra_data exists and is not NULL within the domain's results
       if (!is.null(all_results[[domain]]) && !is.null(all_results[[domain]]$sucra_data) && nrow(all_results[[domain]]$sucra_data) > 0) {
         cat("\n--- Domain:", domain, "---\n")
         recommendations_made <- TRUE
         
         # Get top 5 treatments (excluding reference) based on SUCRA
         sucra_domain_data <- all_results[[domain]]$sucra_data %>%
            filter(Treatment != reference_group) %>% 
            arrange(desc(SUCRA)) %>% 
            head(5) 
            
          if (nrow(sucra_domain_data) > 0) {
             cat("Top Treatments (ranked by SUCRA/P-score):\n") 
             for(i in 1:nrow(sucra_domain_data)) {
                 treat_info <- sucra_domain_data[i, ]
                 # Add Mean Rank to output if available
                 rank_text <- if("Mean_Rank" %in% names(treat_info) && !is.na(treat_info$Mean_Rank)) paste0(", Mean Rank: ", treat_info$Mean_Rank) else ""
                 
                 # Check significance vs reference from the NMA object
                 significance_text <- ""
                 nma_obj <- all_results[[domain]]$nma_object
                 if (!is.null(nma_obj)) {
                     # Use tryCatch for safety, comparison might not exist if network changed
                     comp_res <- tryCatch(summary(nma_obj)$comparisons %>% 
                                            filter(Reference == reference_group, Comparison == treat_info$Treatment) %>% 
                                            head(1), # Get the specific comparison vs reference
                                          error = function(e) NULL)
                     
                     if (!is.null(comp_res) && nrow(comp_res) == 1) {
                         # Get the p-value based on the model type
                         p_val <- if(nma_obj$random) comp_res$p.random else comp_res$p.common
                         if(!is.null(p_val) && !is.na(p_val) && p_val < 0.05) {
                             significance_text <- " (*p < 0.05 vs Ref)"
                         }
                     } 
                 }
                 cat(sprintf("  %d. %s (SUCRA: %.1f%%%s)%s\n", i, treat_info$Treatment, treat_info$SUCRA, rank_text, significance_text))
             }
          } else {
             cat("No active treatments found in SUCRA/P-score results for this domain.\n") 
          }
       }
     }
      if (!recommendations_made) {
         cat("No SUCRA/P-score results available to generate recommendations.\n") 
      }
  } else {
       cat("No analysis results available to generate recommendations.\n")
  }
  
  # --- 5. Targeting Method Analysis (Optional Add-on - kept from original code) ---
  cat("\n\n==========================================================\n")
  cat("   Targeting Method Analysis (Exploratory) \n")
  cat("==========================================================\n")
  
  if (length(all_sucra_data) > 0) { 
     # Use the combined SUCRA data generated earlier
     combined_sucra_for_targeting <- bind_rows(all_sucra_data) %>%
         filter(Treatment != reference_group) %>%
         # Attempt to parse Technique and Targeting Method from combined label
         mutate( 
           Technique = toupper(sub("_.*$", "", Treatment)), 
           Targeting_Method = toupper(sub("^[^_]*_", "", Treatment)) 
         ) %>%
         # Filter out cases where parsing failed (no underscore) or method is empty
         filter(Targeting_Method != "" & !is.na(Targeting_Method) & Targeting_Method != Treatment) 

     if (nrow(combined_sucra_for_targeting) > 0) {
         # Calculate average SUCRA per targeting method within each domain
         targeting_summary <- combined_sucra_for_targeting %>%
            group_by(Domain, Targeting_Method) %>%
            summarise( Avg_SUCRA = mean(SUCRA, na.rm = TRUE), 
                       Num_Treatments = n(), # Count how many treatments use this method in this domain
                       .groups = 'drop' ) %>%
            arrange(Domain, desc(Avg_SUCRA))

         cat("Average SUCRA/P-score by Targeting Method within each Domain:\n") 
         # Print table for each domain
         for(d in unique(targeting_summary$Domain)) {
             cat("\n Domain:", d, "\n")
             domain_targeting_data <- targeting_summary %>% filter(Domain == d)
             if(nrow(domain_targeting_data) > 0) {
                 print( 
                   kable(domain_targeting_data[, c("Targeting_Method", "Avg_SUCRA", "Num_Treatments")], digits=1) %>% 
                   kable_styling(bootstrap_options = c("condensed"), full_width = FALSE) 
                 )
             } else {
                 cat("  No targeting method data available for this domain.\n")
             }
         }
         
         # Create a faceted bar plot
         targeting_plot <- ggplot(targeting_summary, aes(x=reorder(Targeting_Method, -Avg_SUCRA), y=Avg_SUCRA, fill=Targeting_Method)) +
            geom_bar(stat="identity", position="dodge", color="black") + 
            facet_wrap(~Domain, scales="free_x") + # Separate plot for each domain
            labs(title="Average Treatment SUCRA/P-score by Targeting Method (Exploratory)", 
                 x="Targeting Method", 
                 y="Average SUCRA / P-score (%)") + 
            theme(axis.text.x = element_text(angle=60, hjust=1, size=9), # Angle x-axis labels
                  legend.position = "none", # Remove legend if fill is same as x-axis
                  strip.text = element_text(face="bold")) + # Bold facet titles
            scale_y_continuous(limits = c(0, 100))
         print(targeting_plot)

     } else {
         cat("Could not extract sufficient targeting method information from treatment names (expected format: TECHNIQUE_TARGETINGMETHOD).\n")
     }
  } else {
     cat("No SUCRA/P-score data available to analyze targeting methods.\n") 
  }
  
  cat("\n--- End of Workflow ---\n")
  return(all_results)
}

— Execute the Full Workflow —

library(netmeta) 

# Define the domains you want to analyze explicitly
# Adjust these based on the domains present in your 'outcomes' data and RoB mapping
domains <- c("positive_symptoms", "negative_symptoms", "total_psychopathology", "global_cognition") 

# Ensure the required dataframes are loaded and processed
# ... (rest of the chunk remains the same) ...
if (exists("outcomes") && exists("baseline") && exists("domain_rob_mapping")) {

  # Check if processed_rob_data exists, otherwise pass NULL
  rob_data_to_pass <- if (exists("processed_rob_data")) processed_rob_data else NULL

  cat("\n--- Starting Full NMA Workflow Execution ---\n")
  # Run the workflow, passing the RoB data list and mapping
  nma_results_output <- run_nma_workflow(
    outcomes_df = outcomes,
    baseline_df = baseline,
    rob_data_processed_list = rob_data_to_pass, # Pass the list (or NULL)
    domain_rob_map = domain_rob_mapping,       # Pass the mapping
    domains_to_analyze = domains,
    correlation_pre_post = 0.7, # Assumed correlation for pre-post calculations
    reference_group = "SHAM"    # Define the reference treatment label
  )
  cat("\n--- Full NMA Workflow Execution Finished ---\n")

} else {
  cat("\n\n!!! Error: Required data objects ('outcomes', 'baseline', 'domain_rob_mapping') not found. !!!\n")
  cat("Please ensure data loading and preprocessing chunks ran successfully.\n")
  # Set output to NULL if prerequisites are missing
  nma_results_output <- NULL 
}

— Starting Full NMA Workflow Execution —

— Preparing NMA Data for Specified Domains —

— Preparing data for domain: positive_symptoms —

— Warnings/Errors during NMA data preparation for domain: positive_symptoms — Summary of reasons for skipped comparisons/errors: skip_reasons_simple Fewer than 2 valid groups in study ‘kumar, 2020’ 1 Missing baseline info for active group 1 Missing required data points 2

First 10 detailed skip/error messages: - Comparison: hua, 2024 active vs sham p_ahrs | Reason: Missing required data points: active_t0, sham_t0 - Comparison: hua, 2024 active vs sham p_panss | Reason: Missing required data points: active_t0, sham_t0 - Comparison: kumar, 2020 | Reason: Fewer than 2 valid groups in study ‘kumar, 2020’ - Comparison: walther-lft, 2024 active vs sham p_panss | Reason: Missing baseline info for active group————————————————————– Merging RoB data using indicator: p Successfully merged RoB data for 68 out of 121 comparisons. -> Note: Some comparisons did not have matching RoB entries based on study name. Examples: bais, 2014 - l, bais, 2014 - bi, blumberger-prm, 2012, chauhan, 2021, de jesus, 2011 … Prepared 121 comparisons for domain: positive_symptoms Diagnosis information included.

— Preparing data for domain: negative_symptoms —

— Warnings/Errors during NMA data preparation for domain: negative_symptoms — Summary of reasons for skipped comparisons/errors: skip_reasons_simple Missing baseline info for active group Missing required data points 2 4

First 10 detailed skip/error messages: - Comparison: chang-b, 2021 active vs sham n_panss | Reason: Missing required data points: active_t0, sham_t0 - Comparison: hua, 2024 active vs sham n_panss | Reason: Missing required data points: active_t0, sham_t0 - Comparison: kumar, 2020 active vs sham n_sans | Reason: Missing required data points: sham_t1, sham_t0 - Comparison: kumar, 2020 active vs sham sans | Reason: Missing required data points: active_t1, active_t0 - Comparison: walther-lft, 2024 active vs sham n_panss | Reason: Missing baseline info for active group - Comparison: walther-lft, 2024 active vs sham n_bnss | Reason: Missing baseline info for active group————————————————————– Merging RoB data using indicator: n Successfully merged RoB data for 64 out of 110 comparisons. -> Note: Some comparisons did not have matching RoB entries based on study name. Examples: bais, 2014 - l, bais, 2014 - bi, chang-a, 2021, chauhan, 2021, de jesus, 2011 … Prepared 110 comparisons for domain: negative_symptoms Diagnosis information included.

— Preparing data for domain: total_psychopathology —

— Warnings/Errors during NMA data preparation for domain: total_psychopathology — Summary of reasons for skipped comparisons/errors: skip_reasons_simple Error calculating effect size 1 Fewer than 2 valid groups in study ‘kumar, 2020’ 1 Missing baseline info for active group 1 Missing required data points 2

First 10 detailed skip/error messages: - Comparison: chang-b, 2021 active vs sham t_panss | Reason: Missing required data points: active_t0, sham_t0 - Comparison: hou-dlpfc, 2024 active vs sham t_panss | Reason: Error calculating effect size: Invalid SD values (<0, or 0 with non-zero mean) in T1/Change row(s). - Comparison: hua, 2024 active vs sham t_panss | Reason: Missing required data points: active_t0, sham_t0 - Comparison: kumar, 2020 | Reason: Fewer than 2 valid groups in study ‘kumar, 2020’ - Comparison: walther-lft, 2024 active vs sham t_panss | Reason: Missing baseline info for active group————————————————————– -> RoB indicator (’ NA ’) not found for this domain or corresponding RoB sheet not processed. Skipping RoB merge. Prepared 74 comparisons for domain: total_psychopathology Diagnosis information included.

— Preparing data for domain: global_cognition —

— Warnings/Errors during NMA data preparation for domain: global_cognition — Summary of reasons for skipped comparisons/errors: skip_reasons_simple Missing required data points 1

First 10 detailed skip/error messages: - Comparison: schifani, 2024 active vs sham gc_mccb | Reason: Missing required data points: active_t0, sham_t0————————————————————– Merging RoB data using indicator: c Successfully merged RoB data for 13 out of 32 comparisons. -> Note: Some comparisons did not have matching RoB entries based on study name. Examples: francis, 2019, guan, 2020, hou-dlpfc, 2024, hou-ppc, 2024, hu, 2023 … Prepared 32 comparisons for domain: global_cognition Diagnosis information included. — Finished Data Preparation —

========================================================== Starting NMA Workflow for Domain: positive_symptoms ==========================================================

— Running Network Meta-Analysis for: positive_symptoms — Number of comparisons: 121 Number of unique studies (studlab): 121 Treatments included: LF-RTMS_10-20EEG, HF-RTMS_NEURONAV, ITBS_NEURONAV, LF-RTMS_NEURONAV, PRM-RTMS_NEURONAV, TDCS_10-20EEG, ITBS_10-20EEG, HD-TDCS_10-10EEG, HF-RTMS_10-20EEG, LF-RTMS_CM, DTMS_CM, HF-RTMS_CM, HD-TDCS_10-20EEG, LF-RTMS_10-10EEG, ITBS_NA, CTBS_CM, CTBS_10-20EEG, HF-RTMS_NA, TACS_10-20EEG, TDCS_10-20EG, CTBS_NEURONAV, ITBS_CM, SHAM Reference treatment: SHAM Model type: Random Effects (tau method: REML ) — NMA completed successfully for: positive_symptoms — Estimated heterogeneity (tau^2): 10.9797 I^2 statistic (overall inconsistency): 86.0% Cochran’s Q: 707.05 , df = 99 , p-value = <2e-16

— NMA Summary —

Results ( effects model): Number of studies: k = 121 Number of pairwise comparisons: m = 121 Number of treatments: n = 23 Number of designs: d = 22

Treatment estimates (sm = ‘MD’, comparison: other treatments vs ‘SHAM’): $TE CTBS_10-20EEG CTBS_CM CTBS_NEURONAV DTMS_CM CTBS_10-20EEG 0.000000 -4.8055031 -3.83698780 -4.3033470 CTBS_CM 4.805503 0.0000000 0.96851529 0.5021560 CTBS_NEURONAV 3.836988 -0.9685153 0.00000000 -0.4663592 DTMS_CM 4.303347 -0.5021560 0.46635925 0.0000000 HD-TDCS_10-10EEG 3.556988 -1.2485153 -0.28000000 -0.7463592 HD-TDCS_10-20EEG 3.715343 -1.0901597 -0.12164438 -0.5880036 HF-RTMS_10-20EEG 3.321657 -1.4838464 -0.51533114 -0.9816904 HF-RTMS_CM 4.026074 -0.7794293 0.18908599 -0.2772733 HF-RTMS_NA 2.776988 -2.0285153 -1.06000000 -1.5263592 HF-RTMS_NEURONAV 3.428532 -1.3769708 -0.40845549 -0.8748147 ITBS_10-20EEG 2.136513 -2.6689897 -1.70047436 -2.1668336 ITBS_CM 4.686988 -0.1185153 0.85000000 0.3836408 ITBS_NA 3.326988 -1.4785153 -0.51000000 -0.9763592 ITBS_NEURONAV 6.137113 1.3316101 2.30012535 1.8337661 LF-RTMS_10-10EEG 5.026988 0.2214847 1.19000000 0.7236408 LF-RTMS_10-20EEG 5.824689 1.0191855 1.98770082 1.5213416 LF-RTMS_CM 1.446276 -3.3592267 -2.39071140 -2.8570706 LF-RTMS_NEURONAV 3.065263 -1.7402398 -0.77172450 -1.2380837 PRM-RTMS_NEURONAV 3.778406 -1.0270969 -0.05858159 -0.5249408 SHAM 2.986988 -1.8185153 -0.85000000 -1.3163592 TACS_10-20EEG 3.045358 -1.7601454 -0.79163015 -1.2579894 TDCS_10-20EEG 3.554848 -1.2506548 -0.28213947 -0.7484987 TDCS_10-20EG 5.258738 0.4532346 1.42174988 0.9553906 HD-TDCS_10-10EEG HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM CTBS_10-20EEG -3.556987799 -3.71534342 -3.321656663 -4.0260738 CTBS_CM 1.248515287 1.09015967 1.483846424 0.7794293 CTBS_NEURONAV 0.280000000 0.12164438 0.515331137 -0.1890860 DTMS_CM 0.746359247 0.58800363 0.981690384 0.2772733 HD-TDCS_10-10EEG 0.000000000 -0.15835562 0.235331137 -0.4690860 HD-TDCS_10-20EEG 0.158355620 0.00000000 0.393686757 -0.3107304 HF-RTMS_10-20EEG -0.235331137 -0.39368676 0.000000000 -0.7044171 HF-RTMS_CM 0.469085991 0.31073037 0.704417128 0.0000000 HF-RTMS_NA -0.780000000 -0.93835562 -0.544668863 -1.2490860 HF-RTMS_NEURONAV -0.128455485 -0.28681111 0.106875651 -0.5975415 ITBS_10-20EEG -1.420474364 -1.57882998 -1.185143227 -1.8895604 ITBS_CM 1.130000000 0.97164438 1.365331137 0.6609140 ITBS_NA -0.230000000 -0.38835562 0.005331137 -0.6990860 ITBS_NEURONAV 2.580125347 2.42176973 2.815456484 2.1110394 LF-RTMS_10-10EEG 1.470000000 1.31164438 1.705331137 1.0009140 LF-RTMS_10-20EEG 2.267700819 2.10934520 2.503031956 1.7986148 LF-RTMS_CM -2.110711402 -2.26906702 -1.875380266 -2.5797974 LF-RTMS_NEURONAV -0.491724501 -0.65008012 -0.256393364 -0.9608105 PRM-RTMS_NEURONAV 0.221418407 0.06306279 0.456749544 -0.2476676 SHAM -0.570000000 -0.72835562 -0.334668863 -1.0390860 TACS_10-20EEG -0.511630152 -0.66998577 -0.276299015 -0.9807161 TDCS_10-20EEG -0.002139465 -0.16049509 0.233191672 -0.4712255 TDCS_10-20EG 1.701749878 1.54339426 1.937081015 1.2326639 HF-RTMS_NA HF-RTMS_NEURONAV ITBS_10-20EEG ITBS_CM CTBS_10-20EEG -2.7769878 -3.4285323 -2.1365134 -4.6869878 CTBS_CM 2.0285153 1.3769708 2.6689897 0.1185153 CTBS_NEURONAV 1.0600000 0.4084555 1.7004744 -0.8500000 DTMS_CM 1.5263592 0.8748147 2.1668336 -0.3836408 HD-TDCS_10-10EEG 0.7800000 0.1284555 1.4204744 -1.1300000 HD-TDCS_10-20EEG 0.9383556 0.2868111 1.5788300 -0.9716444 HF-RTMS_10-20EEG 0.5446689 -0.1068757 1.1851432 -1.3653311 HF-RTMS_CM 1.2490860 0.5975415 1.8895604 -0.6609140 HF-RTMS_NA 0.0000000 -0.6515445 0.6404744 -1.9100000 HF-RTMS_NEURONAV 0.6515445 0.0000000 1.2920189 -1.2584555 ITBS_10-20EEG -0.6404744 -1.2920189 0.0000000 -2.5504744 ITBS_CM 1.9100000 1.2584555 2.5504744 0.0000000 ITBS_NA 0.5500000 -0.1015445 1.1904744 -1.3600000 ITBS_NEURONAV 3.3601253 2.7085808 4.0005997 1.4501253 LF-RTMS_10-10EEG 2.2500000 1.5984555 2.8904744 0.3400000 LF-RTMS_10-20EEG 3.0477008 2.3961563 3.6881752 1.1377008 LF-RTMS_CM -1.3307114 -1.9822559 -0.6902370 -3.2407114 LF-RTMS_NEURONAV 0.2882755 -0.3632690 0.9287499 -1.6217245 PRM-RTMS_NEURONAV 1.0014184 0.3498739 1.6418928 -0.9085816 SHAM 0.2100000 -0.4415445 0.8504744 -1.7000000 TACS_10-20EEG 0.2683698 -0.3831747 0.9088442 -1.6416302 TDCS_10-20EEG 0.7778605 0.1263160 1.4183349 -1.1321395 TDCS_10-20EG 2.4817499 1.8302054 3.1222242 0.5717499 ITBS_NA ITBS_NEURONAV LF-RTMS_10-10EEG LF-RTMS_10-20EEG CTBS_10-20EEG -3.326987799 -6.1371131 -5.0269878 -5.8246886 CTBS_CM 1.478515287 -1.3316101 -0.2214847 -1.0191855 CTBS_NEURONAV 0.510000000 -2.3001253 -1.1900000 -1.9877008 DTMS_CM 0.976359247 -1.8337661 -0.7236408 -1.5213416 HD-TDCS_10-10EEG 0.230000000 -2.5801253 -1.4700000 -2.2677008 HD-TDCS_10-20EEG 0.388355620 -2.4217697 -1.3116444 -2.1093452 HF-RTMS_10-20EEG -0.005331137 -2.8154565 -1.7053311 -2.5030320 HF-RTMS_CM 0.699085991 -2.1110394 -1.0009140 -1.7986148 HF-RTMS_NA -0.550000000 -3.3601253 -2.2500000 -3.0477008 HF-RTMS_NEURONAV 0.101544515 -2.7085808 -1.5984555 -2.3961563 ITBS_10-20EEG -1.190474364 -4.0005997 -2.8904744 -3.6881752 ITBS_CM 1.360000000 -1.4501253 -0.3400000 -1.1377008 ITBS_NA 0.000000000 -2.8101253 -1.7000000 -2.4977008 ITBS_NEURONAV 2.810125347 0.0000000 1.1101253 0.3124245 LF-RTMS_10-10EEG 1.700000000 -1.1101253 0.0000000 -0.7977008 LF-RTMS_10-20EEG 2.497700819 -0.3124245 0.7977008 0.0000000 LF-RTMS_CM -1.880711402 -4.6908367 -3.5807114 -4.3784122 LF-RTMS_NEURONAV -0.261724501 -3.0718498 -1.9617245 -2.7594253 PRM-RTMS_NEURONAV 0.451418407 -2.3587069 -1.2485816 -2.0462824 SHAM -0.340000000 -3.1501253 -2.0400000 -2.8377008 TACS_10-20EEG -0.281630152 -3.0917555 -1.9816302 -2.7793310 TDCS_10-20EEG 0.227860535 -2.5822648 -1.4721395 -2.2698403 TDCS_10-20EG 1.931749878 -0.8783755 0.2317499 -0.5659509 LF-RTMS_CM LF-RTMS_NEURONAV PRM-RTMS_NEURONAV SHAM CTBS_10-20EEG -1.446276 -3.06526330 -3.77840621 -2.98698780 CTBS_CM 3.359227 1.74023979 1.02709688 1.81851529 CTBS_NEURONAV 2.390711 0.77172450 0.05858159 0.85000000 DTMS_CM 2.857071 1.23808375 0.52494084 1.31635925 HD-TDCS_10-10EEG 2.110711 0.49172450 -0.22141841 0.57000000 HD-TDCS_10-20EEG 2.269067 0.65008012 -0.06306279 0.72835562 HF-RTMS_10-20EEG 1.875380 0.25639336 -0.45674954 0.33466886 HF-RTMS_CM 2.579797 0.96081049 0.24766758 1.03908599 HF-RTMS_NA 1.330711 -0.28827550 -1.00141841 -0.21000000 HF-RTMS_NEURONAV 1.982256 0.36326902 -0.34987389 0.44154451 ITBS_10-20EEG 0.690237 -0.92874986 -1.64189277 -0.85047436 ITBS_CM 3.240711 1.62172450 0.90858159 1.70000000 ITBS_NA 1.880711 0.26172450 -0.45141841 0.34000000 ITBS_NEURONAV 4.690837 3.07184985 2.35870694 3.15012535 LF-RTMS_10-10EEG 3.580711 1.96172450 1.24858159 2.04000000 LF-RTMS_10-20EEG 4.378412 2.75942532 2.04628241 2.83770082 LF-RTMS_CM 0.000000 -1.61898690 -2.33212981 -1.54071140 LF-RTMS_NEURONAV 1.618987 0.00000000 -0.71314291 0.07827550 PRM-RTMS_NEURONAV 2.332130 0.71314291 0.00000000 0.79141841 SHAM 1.540711 -0.07827550 -0.79141841 0.00000000 TACS_10-20EEG 1.599081 -0.01990565 -0.73304856 0.05836985 TDCS_10-20EEG 2.108572 0.48958504 -0.22355787 0.56786053 TDCS_10-20EG 3.812461 2.19347438 1.48033147 2.27174988 TACS_10-20EEG TDCS_10-20EEG TDCS_10-20EG CTBS_10-20EEG -3.04535765 -3.554848334 -5.2587377 CTBS_CM 1.76014544 1.250654752 -0.4532346 CTBS_NEURONAV 0.79163015 0.282139465 -1.4217499 DTMS_CM 1.25798940 0.748498712 -0.9553906 HD-TDCS_10-10EEG 0.51163015 0.002139465 -1.7017499 HD-TDCS_10-20EEG 0.66998577 0.160495085 -1.5433943 HF-RTMS_10-20EEG 0.27629902 -0.233191672 -1.9370810 HF-RTMS_CM 0.98071614 0.471225456 -1.2326639 HF-RTMS_NA -0.26836985 -0.777860535 -2.4817499 HF-RTMS_NEURONAV 0.38317467 -0.126316020 -1.8302054 ITBS_10-20EEG -0.90884421 -1.418334899 -3.1222242 ITBS_CM 1.64163015 1.132139465 -0.5717499 ITBS_NA 0.28163015 -0.227860535 -1.9317499 ITBS_NEURONAV 3.09175550 2.582264812 0.8783755 LF-RTMS_10-10EEG 1.98163015 1.472139465 -0.2317499 LF-RTMS_10-20EEG 2.77933097 2.269840285 0.5659509 LF-RTMS_CM -1.59908125 -2.108571937 -3.8124613 LF-RTMS_NEURONAV 0.01990565 -0.489585036 -2.1934744 PRM-RTMS_NEURONAV 0.73304856 0.223557872 -1.4803315 SHAM -0.05836985 -0.567860535 -2.2717499 TACS_10-20EEG 0.00000000 -0.509490687 -2.2133800 TDCS_10-20EEG 0.50949069 0.000000000 -1.7038893 TDCS_10-20EG 2.21338003 1.703889343 0.0000000

$seTE CTBS_10-20EEG CTBS_CM CTBS_NEURONAV DTMS_CM CTBS_10-20EEG 0.000000 3.155643 3.903786 2.975398 CTBS_CM 3.155643 0.000000 4.594247 3.836737 CTBS_NEURONAV 3.903786 4.594247 0.000000 4.472361 DTMS_CM 2.975398 3.836737 4.472361 0.000000 HD-TDCS_10-10EEG 3.689608 4.413703 4.976166 4.286686 HD-TDCS_10-20EEG 2.449719 3.445096 4.141274 3.280792 HF-RTMS_10-20EEG 1.853661 3.050183 3.819042 2.863307 HF-RTMS_CM 1.748203 2.987269 3.768984 2.796191 HF-RTMS_NA 3.909766 4.599330 5.141527 4.477582 HF-RTMS_NEURONAV 1.916265 3.088629 3.849817 2.904228 ITBS_10-20EEG 2.251096 3.306810 4.026966 3.135268 ITBS_CM 3.619442 4.355217 4.924366 4.226444 ITBS_NA 3.647784 4.378800 4.945235 4.250741 ITBS_NEURONAV 2.245147 3.302764 4.023644 3.130999 LF-RTMS_10-10EEG 3.677338 4.403450 4.967075 4.276129 LF-RTMS_10-20EEG 1.662586 2.937984 3.730042 2.743476 LF-RTMS_CM 2.390238 3.403057 4.106368 3.236620 LF-RTMS_NEURONAV 2.091102 3.200042 3.939763 3.022445 PRM-RTMS_NEURONAV 2.587420 3.544334 4.224188 3.384850 SHAM 1.430126 2.812974 3.632394 2.609163 TACS_10-20EEG 2.384081 3.398735 4.102788 3.232075 TDCS_10-20EEG 1.627513 2.918280 3.714542 2.722364 TDCS_10-20EG 3.089938 3.926229 4.549367 3.782881 HD-TDCS_10-10EEG HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM CTBS_10-20EEG 3.689608 2.449719 1.853661 1.748203 CTBS_CM 4.413703 3.445096 3.050183 2.987269 CTBS_NEURONAV 4.976166 4.141274 3.819042 3.768984 DTMS_CM 4.286686 3.280792 2.863307 2.796191 HD-TDCS_10-10EEG 0.000000 3.940027 3.599826 3.546674 HD-TDCS_10-20EEG 3.940027 0.000000 2.312285 2.228635 HF-RTMS_10-20EEG 3.599826 2.312285 0.000000 1.549757 HF-RTMS_CM 3.546674 2.228635 1.549757 0.000000 HF-RTMS_NA 4.980859 4.146912 3.825155 3.775177 HF-RTMS_NEURONAV 3.632459 2.362768 1.737126 1.624118 ITBS_10-20EEG 3.819701 2.641597 2.100707 2.008264 ITBS_CM 4.756369 3.874398 3.527874 3.473622 ITBS_NA 4.777972 3.900888 3.556946 3.503144 ITBS_NEURONAV 3.816199 2.636530 2.094331 2.001594 LF-RTMS_10-10EEG 4.800573 3.928539 3.587248 3.533908 LF-RTMS_10-20EEG 3.505264 2.162127 1.452490 1.315250 LF-RTMS_CM 3.903322 2.761130 2.249172 2.163083 LF-RTMS_NEURONAV 3.727653 2.506653 1.928274 1.827128 PRM-RTMS_NEURONAV 4.027087 2.933487 2.457697 2.379166 SHAM 3.401169 1.988935 1.179320 1.005461 TACS_10-20EEG 3.899555 2.755802 2.242627 2.156277 TDCS_10-20EEG 3.488766 2.135275 1.412209 1.270625 TDCS_10-20EG 4.366967 3.385014 2.982156 2.917774 HF-RTMS_NA HF-RTMS_NEURONAV ITBS_10-20EEG ITBS_CM ITBS_NA CTBS_10-20EEG 3.909766 1.916265 2.251096 3.619442 3.647784 CTBS_CM 4.599330 3.088629 3.306810 4.355217 4.378800 CTBS_NEURONAV 5.141527 3.849817 4.026966 4.924366 4.945235 DTMS_CM 4.477582 2.904228 3.135268 4.226444 4.250741 HD-TDCS_10-10EEG 4.980859 3.632459 3.819701 4.756369 4.777972 HD-TDCS_10-20EEG 4.146912 2.362768 2.641597 3.874398 3.900888 HF-RTMS_10-20EEG 3.825155 1.737126 2.100707 3.527874 3.556946 HF-RTMS_CM 3.775177 1.624118 2.008264 3.473622 3.503144 HF-RTMS_NA 0.000000 3.855881 4.032764 4.929108 4.949957 HF-RTMS_NEURONAV 3.855881 0.000000 2.156149 3.561166 3.589969 ITBS_10-20EEG 4.032764 2.156149 0.000000 3.751969 3.779317 ITBS_CM 4.929108 3.561166 3.751969 0.000000 4.723999 ITBS_NA 4.949957 3.589969 3.779317 4.723999 0.000000 ITBS_NEURONAV 4.029446 2.149938 2.453079 3.748403 3.775777 LF-RTMS_10-10EEG 4.971777 3.619995 3.807850 4.746857 4.768503 LF-RTMS_10-20EEG 3.736301 1.531581 1.934193 3.431330 3.461213 LF-RTMS_CM 4.112054 2.301040 2.586532 3.837066 3.863812 LF-RTMS_NEURONAV 3.945689 1.988531 2.312924 3.658216 3.686260 PRM-RTMS_NEURONAV 4.229715 2.505252 2.769775 3.962900 3.988803 SHAM 3.638820 1.275464 1.738439 3.324921 3.355751 TACS_10-20EEG 4.108478 2.294644 2.580843 3.833233 3.860006 TDCS_10-20EEG 3.720827 1.493435 1.904130 3.414474 3.444503 TDCS_10-20EG 4.554500 3.021467 3.244168 4.307848 4.331688 ITBS_NEURONAV LF-RTMS_10-10EEG LF-RTMS_10-20EEG LF-RTMS_CM CTBS_10-20EEG 2.245147 3.677338 1.6625858 2.390238 CTBS_CM 3.302764 4.403450 2.9379845 3.403057 CTBS_NEURONAV 4.023644 4.967075 3.7300423 4.106368 DTMS_CM 3.130999 4.276129 2.7434762 3.236620 HD-TDCS_10-10EEG 3.816199 4.800573 3.5052644 3.903322 HD-TDCS_10-20EEG 2.636530 3.928539 2.1621271 2.761130 HF-RTMS_10-20EEG 2.094331 3.587248 1.4524901 2.249172 HF-RTMS_CM 2.001594 3.533908 1.3152498 2.163083 HF-RTMS_NA 4.029446 4.971777 3.7363007 4.112054 HF-RTMS_NEURONAV 2.149938 3.619995 1.5315807 2.301040 ITBS_10-20EEG 2.453079 3.807850 1.9341929 2.586532 ITBS_CM 3.748403 4.746857 3.4313303 3.837066 ITBS_NA 3.775777 4.768503 3.4612132 3.863812 ITBS_NEURONAV 0.000000 3.804337 1.9272667 2.581357 LF-RTMS_10-10EEG 3.804337 0.000000 3.4923464 3.891726 LF-RTMS_10-20EEG 1.927267 3.492346 0.0000000 2.094494 LF-RTMS_CM 2.581357 3.891726 2.0944943 0.000000 LF-RTMS_NEURONAV 2.307135 3.715508 1.7453872 2.448555 PRM-RTMS_NEURONAV 2.764942 4.015848 2.3169831 2.884000 SHAM 1.730730 3.387854 0.8478978 1.915196 TACS_10-20EEG 2.575657 3.887947 2.0874652 2.703064 TDCS_10-20EEG 1.897094 3.475786 1.1499862 2.066764 TDCS_10-20EG 3.240043 4.356605 2.8672960 3.342220 LF-RTMS_NEURONAV PRM-RTMS_NEURONAV SHAM TACS_10-20EEG CTBS_10-20EEG 2.091102 2.587420 1.4301261 2.384081 CTBS_CM 3.200042 3.544334 2.8129739 3.398735 CTBS_NEURONAV 3.939763 4.224188 3.6323939 4.102788 DTMS_CM 3.022445 3.384850 2.6091628 3.232075 HD-TDCS_10-10EEG 3.727653 4.027087 3.4011686 3.899555 HD-TDCS_10-20EEG 2.506653 2.933487 1.9889351 2.755802 HF-RTMS_10-20EEG 1.928274 2.457697 1.1793205 2.242627 HF-RTMS_CM 1.827128 2.379166 1.0054608 2.156277 HF-RTMS_NA 3.945689 4.229715 3.6388202 4.108478 HF-RTMS_NEURONAV 1.988531 2.505252 1.2754642 2.294644 ITBS_10-20EEG 2.312924 2.769775 1.7384394 2.580843 ITBS_CM 3.658216 3.962900 3.3249206 3.833233 ITBS_NA 3.686260 3.988803 3.3557512 3.860006 ITBS_NEURONAV 2.307135 2.764942 1.7307299 2.575657 LF-RTMS_10-10EEG 3.715508 4.015848 3.3878537 3.887947 LF-RTMS_10-20EEG 1.745387 2.316983 0.8478978 2.087465 LF-RTMS_CM 2.448555 2.884000 1.9151961 2.703064 LF-RTMS_NEURONAV 0.000000 2.641387 1.5255968 2.442545 PRM-RTMS_NEURONAV 2.641387 0.000000 2.1562653 2.878899 SHAM 1.525597 2.156265 0.0000000 1.907506 TACS_10-20EEG 2.442545 2.878899 1.9075064 0.000000 TDCS_10-20EEG 1.712011 2.291946 0.7768769 2.059640 TDCS_10-20EG 3.135267 3.485963 2.7390611 3.337819 TDCS_10-20EEG TDCS_10-20EG CTBS_10-20EEG 1.6275130 3.089938 CTBS_CM 2.9182803 3.926229 CTBS_NEURONAV 3.7145421 4.549367 DTMS_CM 2.7223645 3.782881 HD-TDCS_10-10EEG 3.4887656 4.366967 HD-TDCS_10-20EEG 2.1352753 3.385014 HF-RTMS_10-20EEG 1.4122091 2.982156 HF-RTMS_CM 1.2706255 2.917774 HF-RTMS_NA 3.7208266 4.554500 HF-RTMS_NEURONAV 1.4934345 3.021467 ITBS_10-20EEG 1.9041295 3.244168 ITBS_CM 3.4144743 4.307848 ITBS_NA 3.4445034 4.331688 ITBS_NEURONAV 1.8970935 3.240043 LF-RTMS_10-10EEG 3.4757863 4.356605 LF-RTMS_10-20EEG 1.1499862 2.867296 LF-RTMS_CM 2.0667640 3.342220 LF-RTMS_NEURONAV 1.7120115 3.135267 PRM-RTMS_NEURONAV 2.2919463 3.485963 SHAM 0.7768769 2.739061 TACS_10-20EEG 2.0596403 3.337819 TDCS_10-20EEG 0.0000000 2.847103 TDCS_10-20EG 2.8471026 0.000000

$lower CTBS_10-20EEG CTBS_CM CTBS_NEURONAV DTMS_CM CTBS_10-20EEG 0.0000000 -10.990450 -11.488268 -10.135019 CTBS_CM -1.3794436 0.000000 -8.036044 -7.017711 CTBS_NEURONAV -3.8142924 -9.973074 0.000000 -9.232026 DTMS_CM -1.5283253 -8.022023 -8.299308 0.000000 HD-TDCS_10-10EEG -3.6745113 -9.899213 -10.033107 -9.148110 HD-TDCS_10-20EEG -1.0860178 -7.842423 -8.238392 -7.018237 HF-RTMS_10-20EEG -0.3114513 -7.462096 -8.000516 -6.593669 HF-RTMS_CM 0.5996597 -6.634368 -7.197986 -5.757706 HF-RTMS_NA -4.8860136 -11.043036 -11.137207 -10.302259 HF-RTMS_NEURONAV -0.3272771 -7.430573 -7.953959 -6.566997 ITBS_10-20EEG -2.2755533 -9.150219 -9.593183 -8.311845 ITBS_CM -2.4069875 -8.654585 -8.801580 -7.900037 ITBS_NA -3.8225371 -10.060805 -10.202483 -9.307658 ITBS_NEURONAV 1.7367051 -5.141688 -5.586072 -4.302880 LF-RTMS_10-10EEG -2.1804619 -8.409119 -8.545289 -7.657419 LF-RTMS_10-20EEG 2.5660804 -4.739158 -5.323048 -3.855773 LF-RTMS_CM -3.2385036 -10.029096 -10.439046 -9.200729 LF-RTMS_NEURONAV -1.0332208 -8.012207 -8.493518 -7.161968 PRM-RTMS_NEURONAV -1.2928433 -7.973864 -8.337838 -7.159125 SHAM 0.1839921 -7.331843 -7.969361 -6.430224 TACS_10-20EEG -1.6273549 -8.421545 -8.832946 -7.592741 TDCS_10-20EEG 0.3649815 -6.970379 -7.562508 -6.084235 TDCS_10-20EG -0.7974293 -7.242034 -7.494846 -6.458919 HD-TDCS_10-10EEG HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM CTBS_10-20EEG -10.788487 -8.516705 -6.9547646 -7.4524879 CTBS_CM -7.402183 -5.662104 -4.4944032 -5.0755095 CTBS_NEURONAV -9.473107 -7.995103 -6.9698537 -7.5761579 DTMS_CM -7.655391 -5.842230 -4.6302884 -5.2031597 HD-TDCS_10-10EEG 0.000000 -7.880666 -6.8201974 -7.4204400 HD-TDCS_10-20EEG -7.563955 0.000000 -4.1383076 -4.6787749 HF-RTMS_10-20EEG -7.290860 -4.925681 0.0000000 -3.7418859 HF-RTMS_CM -6.482268 -4.057314 -2.3330517 0.0000000 HF-RTMS_NA -10.542305 -9.066153 -8.0418345 -8.6482976 HF-RTMS_NEURONAV -7.247944 -4.917751 -3.2978282 -3.7807549 ITBS_10-20EEG -8.906952 -6.756265 -5.3024526 -5.8256848 ITBS_CM -8.192312 -6.622036 -5.5491745 -6.1472596 ITBS_NA -9.594653 -8.033956 -6.9661544 -7.5651220 ITBS_NEURONAV -4.899487 -2.745734 -1.2893571 -1.8120123 LF-RTMS_10-10EEG -7.938950 -6.388150 -5.3255461 -5.9254179 LF-RTMS_10-20EEG -4.602491 -2.128346 -0.3437963 -0.7792274 LF-RTMS_CM -9.761082 -7.680782 -6.2836755 -6.8193618 LF-RTMS_NEURONAV -7.797789 -5.563029 -4.0357419 -4.5419158 PRM-RTMS_NEURONAV -7.671527 -5.686465 -4.3602490 -4.9107475 SHAM -7.236168 -4.626597 -2.6460945 -3.0097529 TACS_10-20EEG -8.154617 -6.071258 -4.6717678 -5.2069420 TDCS_10-20EEG -6.839994 -4.345558 -2.5346873 -2.9616056 TDCS_10-20EG -6.857349 -5.091111 -3.9078366 -4.4860687 HF-RTMS_NA HF-RTMS_NEURONAV ITBS_10-20EEG ITBS_CM CTBS_10-20EEG -10.439989 -7.1843418 -6.5485802 -11.780963 CTBS_CM -6.986006 -4.6766315 -3.8122393 -8.417554 CTBS_NEURONAV -9.017207 -7.1370480 -6.1922344 -10.501580 DTMS_CM -7.249541 -4.8173674 -3.9781778 -8.667319 HD-TDCS_10-10EEG -8.982305 -6.9910329 -6.0660029 -10.452312 HD-TDCS_10-20EEG -7.189442 -4.3441288 -3.5986049 -8.565325 HF-RTMS_10-20EEG -6.952497 -3.5115795 -2.9321661 -8.279837 HF-RTMS_CM -6.150126 -2.5856720 -2.0465641 -7.469088 HF-RTMS_NA 0.000000 -8.2089332 -7.2635975 -11.570875 HF-RTMS_NEURONAV -6.905844 0.0000000 -2.9339564 -8.238213 ITBS_10-20EEG -8.544546 -5.5179942 0.0000000 -9.904198 ITBS_CM -7.750875 -5.7213024 -4.8032490 0.000000 ITBS_NA -9.151738 -7.1377538 -6.2168510 -10.618867 ITBS_NEURONAV -4.537445 -1.5052210 -0.8073472 -5.896609 LF-RTMS_10-10EEG -7.494504 -5.4966037 -4.5727752 -8.963668 LF-RTMS_10-20EEG -4.275314 -0.6056868 -0.1027733 -5.587583 LF-RTMS_CM -9.390189 -6.4922113 -5.7597465 -10.761222 LF-RTMS_NEURONAV -7.445132 -4.2607177 -3.6044978 -8.791696 PRM-RTMS_NEURONAV -7.288672 -4.5603304 -3.7867658 -8.675723 SHAM -6.921957 -2.9414084 -2.5568043 -8.216725 TACS_10-20EEG -7.784099 -4.8805936 -4.1495157 -9.154629 TDCS_10-20EEG -6.514826 -2.8007618 -2.3136904 -7.824386 TDCS_10-20EG -6.444906 -4.0917617 -3.2362285 -7.871477 ITBS_NA ITBS_NEURONAV LF-RTMS_10-10EEG LF-RTMS_10-20EEG CTBS_10-20EEG -10.476513 -10.537521 -12.234437 -9.083297 CTBS_CM -7.103775 -7.804908 -8.852089 -6.777529 CTBS_NEURONAV -9.182483 -10.186323 -10.925289 -9.298449 DTMS_CM -7.354940 -7.970412 -9.104701 -6.898456 HD-TDCS_10-10EEG -9.134653 -10.059738 -10.878950 -9.137893 HD-TDCS_10-20EEG -7.257245 -7.589273 -9.011439 -6.347036 HF-RTMS_10-20EEG -6.976817 -6.920270 -8.736208 -5.349860 HF-RTMS_CM -6.166950 -6.034091 -7.927246 -4.376457 HF-RTMS_NA -10.251738 -11.257695 -11.994504 -10.370716 HF-RTMS_NEURONAV -6.934665 -6.922383 -8.693515 -5.397999 ITBS_10-20EEG -8.597800 -8.808547 -10.353724 -7.479124 ITBS_CM -7.898867 -8.796860 -9.643668 -7.862985 ITBS_NA 0.000000 -10.210512 -11.046094 -9.281554 ITBS_NEURONAV -4.590262 0.000000 -6.346238 -3.464949 LF-RTMS_10-10EEG -7.646094 -8.566489 0.000000 -7.642574 LF-RTMS_10-20EEG -4.286152 -4.089798 -6.047172 0.000000 LF-RTMS_CM -9.453643 -9.750203 -11.208354 -8.483546 LF-RTMS_NEURONAV -7.486661 -7.593751 -9.243986 -6.180321 PRM-RTMS_NEURONAV -7.366491 -7.777894 -9.119498 -6.587486 SHAM -6.917151 -6.542294 -8.680071 -4.499550 TACS_10-20EEG -7.847103 -8.139950 -9.601867 -6.870688 TDCS_10-20EEG -6.523242 -6.300500 -8.284555 -4.523772 TDCS_10-20EG -6.558203 -7.228744 -8.307039 -6.185748 LF-RTMS_CM LF-RTMS_NEURONAV PRM-RTMS_NEURONAV SHAM CTBS_10-20EEG -6.1310564 -7.1637474 -8.849656 -5.7899835 CTBS_CM -3.3106428 -4.5317270 -5.919670 -3.6948123 CTBS_NEURONAV -5.6576227 -6.9500687 -8.220675 -6.2693612 DTMS_CM -3.4865873 -4.6858005 -6.109244 -3.7975060 HD-TDCS_10-10EEG -5.5396594 -6.8143402 -8.114363 -6.0961679 HD-TDCS_10-20EEG -3.1426483 -4.2628692 -5.812591 -3.1698856 HF-RTMS_10-20EEG -2.5329150 -3.5229552 -5.273748 -1.9767568 HF-RTMS_CM -1.6597670 -2.6202948 -4.415412 -0.9315810 HF-RTMS_NA -6.7287664 -8.0216830 -9.291508 -7.3419566 HF-RTMS_NEURONAV -2.5276995 -3.5341797 -5.260078 -2.0583194 ITBS_10-20EEG -4.3792724 -5.4619975 -7.070551 -4.2577530 ITBS_CM -4.2797991 -5.5482467 -6.858560 -4.8167247 ITBS_NA -5.6922207 -6.9632121 -8.269328 -6.2371515 ITBS_NEURONAV -0.3685293 -1.4500516 -3.060480 -0.2420430 LF-RTMS_10-10EEG -4.0469307 -5.3205370 -6.622335 -4.6000712 LF-RTMS_10-20EEG 0.2732787 -0.6614706 -2.494921 1.1758517 LF-RTMS_CM 0.0000000 -6.4180665 -7.984666 -5.2944267 LF-RTMS_NEURONAV -3.1800927 0.0000000 -5.890166 -2.9118393 PRM-RTMS_NEURONAV -3.3204063 -4.4638807 0.000000 -3.4347839 SHAM -2.2130039 -3.0683903 -5.017621 0.0000000 TACS_10-20EEG -3.6988274 -4.8072059 -6.375587 -3.6802739 TDCS_10-20EEG -1.9422112 -2.8658958 -4.715690 -0.9547902 TDCS_10-20EG -2.7381686 -3.9515366 -5.352030 -3.0967112 TACS_10-20EEG TDCS_10-20EEG TDCS_10-20EG CTBS_10-20EEG -7.718070 -6.74471515 -11.314905 CTBS_CM -4.901254 -4.46906952 -8.148503 CTBS_NEURONAV -7.249686 -6.99822925 -10.338345 DTMS_CM -5.076762 -4.58723766 -8.369701 HD-TDCS_10-10EEG -7.131357 -6.83571547 -10.260848 HD-TDCS_10-20EEG -4.731286 -4.02456764 -8.177899 HF-RTMS_10-20EEG -4.119170 -3.00107061 -7.781999 HF-RTMS_CM -3.245510 -2.01915473 -6.951396 HF-RTMS_NA -8.320839 -8.07054660 -11.408405 HF-RTMS_NEURONAV -4.114244 -3.05339388 -7.752172 ITBS_10-20EEG -5.967204 -5.15036021 -9.480677 ITBS_CM -5.871369 -5.56010720 -9.014976 ITBS_NA -7.283843 -6.97896319 -10.421703 ITBS_NEURONAV -1.956439 -1.13597018 -5.471993 LF-RTMS_10-10EEG -5.638606 -5.34027649 -8.770539 LF-RTMS_10-20EEG -1.312026 0.01590867 -5.053846 LF-RTMS_CM -6.896990 -6.15935503 -10.363091 LF-RTMS_NEURONAV -4.767395 -3.84506591 -8.338485 PRM-RTMS_NEURONAV -4.909490 -4.26857431 -8.312693 SHAM -3.797014 -2.09051127 -7.640211 TACS_10-20EEG 0.000000 -4.54631152 -8.755385 TDCS_10-20EEG -3.527330 0.00000000 -7.284108 TDCS_10-20EG -4.328625 -3.87632921 0.000000

$upper CTBS_10-20EEG CTBS_CM CTBS_NEURONAV DTMS_CM CTBS_10-20EEG 0.000000 1.379444 3.814292 1.528325 CTBS_CM 10.990450 0.000000 9.973074 8.022023 CTBS_NEURONAV 11.488268 8.036044 0.000000 8.299308 DTMS_CM 10.135019 7.017711 9.232026 0.000000 HD-TDCS_10-10EEG 10.788487 7.402183 9.473107 7.655391 HD-TDCS_10-20EEG 8.516705 5.662104 7.995103 5.842230 HF-RTMS_10-20EEG 6.954765 4.494403 6.969854 4.630288 HF-RTMS_CM 7.452488 5.075510 7.576158 5.203160 HF-RTMS_NA 10.439989 6.986006 9.017207 7.249541 HF-RTMS_NEURONAV 7.184342 4.676631 7.137048 4.817367 ITBS_10-20EEG 6.548580 3.812239 6.192234 3.978178 ITBS_CM 11.780963 8.417554 10.501580 8.667319 ITBS_NA 10.476513 7.103775 9.182483 7.354940 ITBS_NEURONAV 10.537521 7.804908 10.186323 7.970412 LF-RTMS_10-10EEG 12.234437 8.852089 10.925289 9.104701 LF-RTMS_10-20EEG 9.083297 6.777529 9.298449 6.898456 LF-RTMS_CM 6.131056 3.310643 5.657623 3.486587 LF-RTMS_NEURONAV 7.163747 4.531727 6.950069 4.685800 PRM-RTMS_NEURONAV 8.849656 5.919670 8.220675 6.109244 SHAM 5.789984 3.694812 6.269361 3.797506 TACS_10-20EEG 7.718070 4.901254 7.249686 5.076762 TDCS_10-20EEG 6.744715 4.469070 6.998229 4.587238 TDCS_10-20EG 11.314905 8.148503 10.338345 8.369701 HD-TDCS_10-10EEG HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM CTBS_10-20EEG 3.674511 1.086018 0.3114513 -0.5996597 CTBS_CM 9.899213 7.842423 7.4620961 6.6343681 CTBS_NEURONAV 10.033107 8.238392 8.0005160 7.1979859 DTMS_CM 9.148110 7.018237 6.5936692 5.7577062 HD-TDCS_10-10EEG 0.000000 7.563955 7.2908597 6.4822681 HD-TDCS_10-20EEG 7.880666 0.000000 4.9256812 4.0573142 HF-RTMS_10-20EEG 6.820197 4.138308 0.0000000 2.3330517 HF-RTMS_CM 7.420440 4.678775 3.7418859 0.0000000 HF-RTMS_NA 8.982305 7.189442 6.9524968 6.1501257 HF-RTMS_NEURONAV 6.991033 4.344129 3.5115795 2.5856720 ITBS_10-20EEG 6.066003 3.598605 2.9321661 2.0465641 ITBS_CM 10.452312 8.565325 8.2798368 7.4690877 ITBS_NA 9.134653 7.257245 6.9768167 6.1669500 ITBS_NEURONAV 10.059738 7.589273 6.9202701 6.0340910 LF-RTMS_10-10EEG 10.878950 9.011439 8.7362084 7.9272459 LF-RTMS_10-20EEG 9.137893 6.347036 5.3498602 4.3764571 LF-RTMS_CM 5.539659 3.142648 2.5329150 1.6597670 LF-RTMS_NEURONAV 6.814340 4.262869 3.5229552 2.6202948 PRM-RTMS_NEURONAV 8.114363 5.812591 5.2737481 4.4154124 SHAM 6.096168 3.169886 1.9767568 0.9315810 TACS_10-20EEG 7.131357 4.731286 4.1191698 3.2455098 TDCS_10-20EEG 6.835715 4.024568 3.0010706 2.0191547 TDCS_10-20EG 10.260848 8.177899 7.7819987 6.9513964 HF-RTMS_NA HF-RTMS_NEURONAV ITBS_10-20EEG ITBS_CM ITBS_NA CTBS_10-20EEG 4.886014 0.3272771 2.275553 2.406987 3.822537 CTBS_CM 11.043036 7.4305730 9.150219 8.654585 10.060805 CTBS_NEURONAV 11.137207 7.9539590 9.593183 8.801580 10.202483 DTMS_CM 10.302259 6.5669968 8.311845 7.900037 9.307658 HD-TDCS_10-10EEG 10.542305 7.2479438 8.906952 8.192312 9.594653 HD-TDCS_10-20EEG 9.066153 4.9177510 6.756265 6.622036 8.033956 HF-RTMS_10-20EEG 8.041835 3.2978282 5.302453 5.549175 6.966154 HF-RTMS_CM 8.648298 3.7807549 5.825685 6.147260 7.565122 HF-RTMS_NA 0.000000 6.9058442 8.544546 7.750875 9.151738 HF-RTMS_NEURONAV 8.208933 0.0000000 5.517994 5.721302 7.137754 ITBS_10-20EEG 7.263598 2.9339564 0.000000 4.803249 6.216851 ITBS_CM 11.570875 8.2382133 9.904198 0.000000 10.618867 ITBS_NA 10.251738 6.9346648 8.597800 7.898867 0.000000 ITBS_NEURONAV 11.257695 6.9223827 8.808547 8.796860 10.210512 LF-RTMS_10-10EEG 11.994504 8.6935147 10.353724 9.643668 11.046094 LF-RTMS_10-20EEG 10.370716 5.3979994 7.479124 7.862985 9.281554 LF-RTMS_CM 6.728766 2.5276995 4.379272 4.279799 5.692221 LF-RTMS_NEURONAV 8.021683 3.5341797 5.461998 5.548247 6.963212 PRM-RTMS_NEURONAV 9.291508 5.2600782 7.070551 6.858560 8.269328 SHAM 7.341957 2.0583194 4.257753 4.816725 6.237151 TACS_10-20EEG 8.320839 4.1142442 5.967204 5.871369 7.283843 TDCS_10-20EEG 8.070547 3.0533939 5.150360 5.560107 6.978963 TDCS_10-20EG 11.408405 7.7521724 9.480677 9.014976 10.421703 ITBS_NEURONAV LF-RTMS_10-10EEG LF-RTMS_10-20EEG LF-RTMS_CM CTBS_10-20EEG -1.7367051 2.180462 -2.56608040 3.238504 CTBS_CM 5.1416879 8.409119 4.73915824 10.029096 CTBS_NEURONAV 5.5860721 8.545289 5.32304783 10.439046 DTMS_CM 4.3028799 7.657419 3.85577288 9.200729 HD-TDCS_10-10EEG 4.8994870 7.938950 4.60249112 9.761082 HD-TDCS_10-20EEG 2.7457336 6.388150 2.12834606 7.680782 HF-RTMS_10-20EEG 1.2893571 5.325546 0.34379628 6.283676 HF-RTMS_CM 1.8120123 5.925418 0.77922743 6.819362 HF-RTMS_NA 4.5374446 7.494504 4.27531408 9.390189 HF-RTMS_NEURONAV 1.5052210 5.496604 0.60568680 6.492211 ITBS_10-20EEG 0.8073472 4.572775 0.10277326 5.759746 ITBS_CM 5.8966091 8.963668 5.58758301 10.761222 ITBS_NA 4.5902617 7.646094 4.28615238 9.453643 ITBS_NEURONAV 0.0000000 8.566489 4.08979778 9.750203 LF-RTMS_10-10EEG 6.3462378 0.000000 6.04717232 11.208354 LF-RTMS_10-20EEG 3.4649487 7.642574 0.00000000 8.483546 LF-RTMS_CM 0.3685293 4.046931 -0.27327874 0.000000 LF-RTMS_NEURONAV 1.4500516 5.320537 0.66147063 6.418067 PRM-RTMS_NEURONAV 3.0604805 6.622335 2.49492104 7.984666 SHAM 0.2420430 4.600071 -1.17585171 5.294427 TACS_10-20EEG 1.9564386 5.638606 1.31202573 6.896990 TDCS_10-20EEG 1.1359702 5.340276 -0.01590867 6.159355 TDCS_10-20EG 5.4719930 8.770539 5.05384588 10.363091 LF-RTMS_NEURONAV PRM-RTMS_NEURONAV SHAM TACS_10-20EEG CTBS_10-20EEG 1.033221 1.292843 -0.1839921 1.627355 CTBS_CM 8.012207 7.973864 7.3318428 8.421545 CTBS_NEURONAV 8.493518 8.337838 7.9693612 8.832946 DTMS_CM 7.161968 7.159125 6.4302245 7.592741 HD-TDCS_10-10EEG 7.797789 7.671527 7.2361679 8.154617 HD-TDCS_10-20EEG 5.563029 5.686465 4.6265969 6.071258 HF-RTMS_10-20EEG 4.035742 4.360249 2.6460945 4.671768 HF-RTMS_CM 4.541916 4.910748 3.0097529 5.206942 HF-RTMS_NA 7.445132 7.288672 6.9219566 7.784099 HF-RTMS_NEURONAV 4.260718 4.560330 2.9414084 4.880594 ITBS_10-20EEG 3.604498 3.786766 2.5568043 4.149516 ITBS_CM 8.791696 8.675723 8.2167247 9.154629 ITBS_NA 7.486661 7.366491 6.9171515 7.847103 ITBS_NEURONAV 7.593751 7.777894 6.5422937 8.139950 LF-RTMS_10-10EEG 9.243986 9.119498 8.6800712 9.601867 LF-RTMS_10-20EEG 6.180321 6.587486 4.4995499 6.870688 LF-RTMS_CM 3.180093 3.320406 2.2130039 3.698827 LF-RTMS_NEURONAV 0.000000 4.463881 3.0683903 4.807206 PRM-RTMS_NEURONAV 5.890166 0.000000 5.0176208 6.375587 SHAM 2.911839 3.434784 0.0000000 3.680274 TACS_10-20EEG 4.767395 4.909490 3.7970136 0.000000 TDCS_10-20EEG 3.845066 4.268574 2.0905113 4.546312 TDCS_10-20EG 8.338485 8.312693 7.6402109 8.755385 TDCS_10-20EEG TDCS_10-20EG CTBS_10-20EEG -0.3649815 0.7974293 CTBS_CM 6.9703790 7.2420337 CTBS_NEURONAV 7.5625082 7.4948457 DTMS_CM 6.0842351 6.4589193 HD-TDCS_10-10EEG 6.8399944 6.8573487 HD-TDCS_10-20EEG 4.3455578 5.0911109 HF-RTMS_10-20EEG 2.5346873 3.9078366 HF-RTMS_CM 2.9616056 4.4860687 HF-RTMS_NA 6.5148255 6.4449056 HF-RTMS_NEURONAV 2.8007618 4.0917617 ITBS_10-20EEG 2.3136904 3.2362285 ITBS_CM 7.8243861 7.8714766 ITBS_NA 6.5232421 6.5582028 ITBS_NEURONAV 6.3004998 7.2287440 LF-RTMS_10-10EEG 8.2845554 8.3070392 LF-RTMS_10-20EEG 4.5237719 6.1857478 LF-RTMS_CM 1.9422112 2.7381686 LF-RTMS_NEURONAV 2.8658958 3.9515366 PRM-RTMS_NEURONAV 4.7156901 5.3520298 SHAM 0.9547902 3.0967112 TACS_10-20EEG 3.5273301 4.3286251 TDCS_10-20EEG 0.0000000 3.8763292 TDCS_10-20EG 7.2841079 0.0000000

$statistic CTBS_10-20EEG CTBS_CM CTBS_NEURONAV DTMS_CM CTBS_10-20EEG NaN -1.52282848 -0.98288884 -1.44630986 CTBS_CM 1.5228285 NaN 0.21081044 0.13088101 CTBS_NEURONAV 0.9828888 -0.21081044 NaN -0.10427584 DTMS_CM 1.4463099 -0.13088101 0.10427584 NaN HD-TDCS_10-10EEG 0.9640557 -0.28287255 -0.05626821 -0.17411101 HD-TDCS_10-20EEG 1.5166406 -0.31643813 -0.02937366 -0.17922614 HF-RTMS_10-20EEG 1.7919444 -0.48647777 -0.13493728 -0.34285194 HF-RTMS_CM 2.3029790 -0.26091705 0.05016896 -0.09916107 HF-RTMS_NA 0.7102695 -0.44104584 -0.20616444 -0.34088915 HF-RTMS_NEURONAV 1.7891749 -0.44581937 -0.10609737 -0.30122110 ITBS_10-20EEG 0.9490993 -0.80711909 -0.42227182 -0.69111602 ITBS_CM 1.2949477 -0.02721225 0.17261105 0.09077152 ITBS_NA 0.9120573 -0.33765309 -0.10312957 -0.22969155 ITBS_NEURONAV 2.7335012 0.40318054 0.57165229 0.58568077 LF-RTMS_10-10EEG 1.3670182 0.05029799 0.23957760 0.16922798 LF-RTMS_10-20EEG 3.5033914 0.34689956 0.53288961 0.55453063 LF-RTMS_CM 0.6050764 -0.98712026 -0.58219604 -0.88273290 LF-RTMS_NEURONAV 1.4658604 -0.54381782 -0.19588096 -0.40962981 PRM-RTMS_NEURONAV 1.4602989 -0.28978559 -0.01386813 -0.15508540 SHAM 2.0886184 -0.64647428 -0.23400546 -0.50451402 TACS_10-20EEG 1.2773718 -0.51788245 -0.19294934 -0.38922032 TDCS_10-20EEG 2.1842212 -0.42855882 -0.07595538 -0.27494434 TDCS_10-20EG 1.7018911 0.11543762 0.31251597 0.25255637 HD-TDCS_10-10EEG HD-TDCS_10-20EEG HF-RTMS_10-20EEG CTBS_10-20EEG -0.9640557012 -1.51664058 -1.791944378 CTBS_CM 0.2828725503 0.31643813 0.486477767 CTBS_NEURONAV 0.0562682138 0.02937366 0.134937278 DTMS_CM 0.1741110066 0.17922614 0.342851937 HD-TDCS_10-10EEG NaN -0.04019151 0.065372927 HD-TDCS_10-20EEG 0.0401915090 NaN 0.170258786 HF-RTMS_10-20EEG -0.0653729268 -0.17025879 NaN HF-RTMS_CM 0.1322608002 0.13942631 0.454533786 HF-RTMS_NA -0.1565994816 -0.22627818 -0.142391325 HF-RTMS_NEURONAV -0.0353632330 -0.12138776 0.061524420 ITBS_10-20EEG -0.3718809901 -0.59768012 -0.564164081 ITBS_CM 0.2375761913 0.25078590 0.387012461 ITBS_NA -0.0481375808 -0.09955569 0.001498796 ITBS_NEURONAV 0.6760982408 0.91854443 1.344322505 LF-RTMS_10-10EEG 0.3062134508 0.33387590 0.475386998 LF-RTMS_10-20EEG 0.6469414497 0.97558797 1.723269573 LF-RTMS_CM -0.5407474282 -0.82178927 -0.833809346 LF-RTMS_NEURONAV -0.1319126440 -0.25934190 -0.132965181 PRM-RTMS_NEURONAV 0.0549822788 0.02149755 0.185844494 SHAM -0.1675894582 -0.36620381 -0.283781102 TACS_10-20EEG -0.1312021931 -0.24311827 -0.123203268 TDCS_10-20EEG -0.0006132441 -0.07516365 0.165125458 TDCS_10-20EG 0.3896868855 0.45594918 0.649557316 HF-RTMS_CM HF-RTMS_NA HF-RTMS_NEURONAV ITBS_10-20EEG CTBS_10-20EEG -2.30297900 -0.71026949 -1.78917486 -0.9490993 CTBS_CM 0.26091705 0.44104584 0.44581937 0.8071191 CTBS_NEURONAV -0.05016896 0.20616444 0.10609737 0.4222718 DTMS_CM 0.09916107 0.34088915 0.30122110 0.6911160 HD-TDCS_10-10EEG -0.13226080 0.15659948 0.03536323 0.3718810 HD-TDCS_10-20EEG -0.13942631 0.22627818 0.12138776 0.5976801 HF-RTMS_10-20EEG -0.45453379 0.14239132 -0.06152442 0.5641641 HF-RTMS_CM NaN 0.33086816 0.36791745 0.9408926 HF-RTMS_NA -0.33086816 NaN -0.16897421 0.1588177 HF-RTMS_NEURONAV -0.36791745 0.16897421 NaN 0.5992251 ITBS_10-20EEG -0.94089256 -0.15881772 -0.59922510 NaN ITBS_CM 0.19026654 0.38749401 0.35338295 0.6797696 ITBS_NA -0.19955960 0.11111207 -0.02828563 0.3149972 ITBS_NEURONAV 1.05467923 0.83389254 1.25984114 1.6308481 LF-RTMS_10-10EEG 0.28323150 0.45255450 0.44156294 0.7590830 LF-RTMS_10-20EEG 1.36750814 0.81570008 1.56449884 1.9068290 LF-RTMS_CM -1.19264845 -0.32361233 -0.86146089 -0.2668581 LF-RTMS_NEURONAV -0.52585831 0.07306089 -0.18268212 0.4015479 PRM-RTMS_NEURONAV -0.10409848 0.23675787 0.13965615 0.5927893 SHAM -1.03344257 0.05771101 -0.34618338 0.4892171 TACS_10-20EEG -0.45481911 0.06532099 -0.16698657 0.3521501 TDCS_10-20EEG -0.37086101 0.20905584 0.08458089 0.7448731 TDCS_10-20EG 0.42246718 0.54490065 0.60573397 0.9624113 ITBS_CM ITBS_NA ITBS_NEURONAV LF-RTMS_10-10EEG CTBS_10-20EEG -1.29494774 -0.912057279 -2.7335012 -1.36701822 CTBS_CM 0.02721225 0.337653086 -0.4031805 -0.05029799 CTBS_NEURONAV -0.17261105 0.103129574 -0.5716523 -0.23957760 DTMS_CM -0.09077152 0.229691554 -0.5856808 -0.16922798 HD-TDCS_10-10EEG -0.23757619 0.048137581 -0.6760982 -0.30621345 HD-TDCS_10-20EEG -0.25078590 0.099555690 -0.9185444 -0.33387590 HF-RTMS_10-20EEG -0.38701246 -0.001498796 -1.3443225 -0.47538700 HF-RTMS_CM -0.19026654 0.199559596 -1.0546792 -0.28323150 HF-RTMS_NA -0.38749401 -0.111112066 -0.8338925 -0.45255450 HF-RTMS_NEURONAV -0.35338295 0.028285627 -1.2598411 -0.44156294 ITBS_10-20EEG -0.67976964 -0.314997216 -1.6308481 -0.75908297 ITBS_CM NaN 0.287891700 -0.3868649 -0.07162634 ITBS_NA -0.28789170 NaN -0.7442509 -0.35650603 ITBS_NEURONAV 0.38686487 0.744250870 NaN 0.29180522 LF-RTMS_10-10EEG 0.07162634 0.356506031 -0.2918052 NaN LF-RTMS_10-20EEG 0.33156261 0.721625823 -0.1621076 0.22841400 LF-RTMS_CM -0.84458065 -0.486750254 -1.8171982 -0.92008320 LF-RTMS_NEURONAV -0.44331024 -0.071000014 -1.3314565 -0.52798288 PRM-RTMS_NEURONAV -0.22927189 0.113171408 -0.8530764 -0.31091358 SHAM -0.51129040 -0.101318596 -1.8201137 -0.60215115 TACS_10-20EEG -0.42826252 -0.072961065 -1.2003757 -0.50968546 TDCS_10-20EEG -0.33157065 0.066151926 -1.3611690 -0.42354142 TDCS_10-20EG 0.13272286 0.445957752 -0.2710999 0.05319506 LF-RTMS_10-20EEG LF-RTMS_CM LF-RTMS_NEURONAV CTBS_10-20EEG -3.5033914 -0.6050764 -1.465860439 CTBS_CM -0.3468996 0.9871203 0.543817822 CTBS_NEURONAV -0.5328896 0.5821960 0.195880956 DTMS_CM -0.5545306 0.8827329 0.409629810 HD-TDCS_10-10EEG -0.6469414 0.5407474 0.131912644 HD-TDCS_10-20EEG -0.9755880 0.8217893 0.259341901 HF-RTMS_10-20EEG -1.7232696 0.8338093 0.132965181 HF-RTMS_CM -1.3675081 1.1926485 0.525858310 HF-RTMS_NA -0.8157001 0.3236123 -0.073060885 HF-RTMS_NEURONAV -1.5644988 0.8614609 0.182682120 ITBS_10-20EEG -1.9068290 0.2668581 -0.401547945 ITBS_CM -0.3315626 0.8445806 0.443310235 ITBS_NA -0.7216258 0.4867503 0.071000014 ITBS_NEURONAV 0.1621076 1.8171982 1.331456494 LF-RTMS_10-10EEG -0.2284140 0.9200832 0.527982876 LF-RTMS_10-20EEG NaN 2.0904388 1.580981801 LF-RTMS_CM -2.0904388 NaN -0.661200955 LF-RTMS_NEURONAV -1.5809818 0.6612010 NaN PRM-RTMS_NEURONAV -0.8831667 0.8086442 0.269988035 SHAM -3.3467487 0.8044667 -0.051308116 TACS_10-20EEG -1.3314382 0.5915809 -0.008149553 TDCS_10-20EEG -1.9737978 1.0202287 0.285970647 TDCS_10-20EG -0.1973814 1.1406974 0.699613193 PRM-RTMS_NEURONAV SHAM TACS_10-20EEG TDCS_10-20EEG CTBS_10-20EEG -1.46029891 -2.08861842 -1.277371824 -2.1842211912 CTBS_CM 0.28978559 0.64647428 0.517882449 0.4285588173 CTBS_NEURONAV 0.01386813 0.23400546 0.192949340 0.0759553825 DTMS_CM 0.15508540 0.50451402 0.389220316 0.2749443407 HD-TDCS_10-10EEG -0.05498228 0.16758946 0.131202193 0.0006132441 HD-TDCS_10-20EEG -0.02149755 0.36620381 0.243118273 0.0751636493 HF-RTMS_10-20EEG -0.18584449 0.28378110 0.123203268 -0.1651254584 HF-RTMS_CM 0.10409848 1.03344257 0.454819113 0.3708610142 HF-RTMS_NA -0.23675787 -0.05771101 -0.065320986 -0.2090558431 HF-RTMS_NEURONAV -0.13965615 0.34618338 0.166986568 -0.0845808900 ITBS_10-20EEG -0.59278930 -0.48921714 -0.352150096 -0.7448731156 ITBS_CM 0.22927189 0.51129040 0.428262519 0.3315706500 ITBS_NA -0.11317141 0.10131860 0.072961065 -0.0661519258 ITBS_NEURONAV 0.85307635 1.82011374 1.200375688 1.3611689536 LF-RTMS_10-10EEG 0.31091358 0.60215115 0.509685463 0.4235414208 LF-RTMS_10-20EEG 0.88316674 3.34674873 1.331438201 1.9737977749 LF-RTMS_CM -0.80864418 -0.80446668 -0.591580922 -1.0202286719 LF-RTMS_NEURONAV -0.26998803 0.05130812 0.008149553 -0.2859706473 PRM-RTMS_NEURONAV NaN 0.36703202 0.254628074 0.0975406244 SHAM -0.36703202 NaN -0.030600081 -0.7309530501 TACS_10-20EEG -0.25462807 0.03060008 NaN -0.2473687683 TDCS_10-20EEG -0.09754062 0.73095305 0.247368768 NaN TDCS_10-20EG 0.42465500 0.82939001 0.663121637 0.5984643279 TDCS_10-20EG CTBS_10-20EEG -1.70189105 CTBS_CM -0.11543762 CTBS_NEURONAV -0.31251597 DTMS_CM -0.25255637 HD-TDCS_10-10EEG -0.38968689 HD-TDCS_10-20EEG -0.45594918 HF-RTMS_10-20EEG -0.64955732 HF-RTMS_CM -0.42246718 HF-RTMS_NA -0.54490065 HF-RTMS_NEURONAV -0.60573397 ITBS_10-20EEG -0.96241134 ITBS_CM -0.13272286 ITBS_NA -0.44595775 ITBS_NEURONAV 0.27109990 LF-RTMS_10-10EEG -0.05319506 LF-RTMS_10-20EEG 0.19738142 LF-RTMS_CM -1.14069744 LF-RTMS_NEURONAV -0.69961319 PRM-RTMS_NEURONAV -0.42465500 SHAM -0.82939001 TACS_10-20EEG -0.66312164 TDCS_10-20EEG -0.59846433 TDCS_10-20EG NaN

$p CTBS_10-20EEG CTBS_CM CTBS_NEURONAV DTMS_CM CTBS_10-20EEG NaN 0.1278016 0.3256622 0.1480903 CTBS_CM 0.127801623 NaN 0.8330352 0.8958694 CTBS_NEURONAV 0.325662151 0.8330352 NaN 0.9169504 DTMS_CM 0.148090312 0.8958694 0.9169504 NaN HD-TDCS_10-10EEG 0.335018000 0.7772745 0.9551281 0.8617782 HD-TDCS_10-20EEG 0.129357455 0.7516700 0.9765666 0.8577601 HF-RTMS_10-20EEG 0.073141876 0.6266285 0.8926615 0.7317099 HF-RTMS_CM 0.021280025 0.7941565 0.9599877 0.9210104 HF-RTMS_NA 0.477537035 0.6591798 0.8366625 0.7331870 HF-RTMS_NEURONAV 0.073586659 0.6557277 0.9155051 0.7632459 ITBS_10-20EEG 0.342570116 0.4195979 0.6728266 0.4894926 ITBS_CM 0.195338257 0.9782904 0.8629572 0.9276741 ITBS_NA 0.361738566 0.7356246 0.9178601 0.8183315 ITBS_NEURONAV 0.006266490 0.6868154 0.5675576 0.5580901 LF-RTMS_10-10EEG 0.171619595 0.9598849 0.8106577 0.8656173 LF-RTMS_10-20EEG 0.000459374 0.7286668 0.5941100 0.5792157 LF-RTMS_CM 0.545128257 0.3235837 0.5604346 0.3773806 LF-RTMS_NEURONAV 0.142686312 0.5865668 0.8447033 0.6820775 PRM-RTMS_NEURONAV 0.144207942 0.7719803 0.9889352 0.8767540 SHAM 0.036742086 0.5179722 0.8149807 0.6139002 TACS_10-20EEG 0.201471007 0.6045403 0.8469986 0.6971132 TDCS_10-20EEG 0.028945998 0.6682443 0.9394546 0.7833590 TDCS_10-20EG 0.088775794 0.9080983 0.7546484 0.8006110 HD-TDCS_10-10EEG HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM CTBS_10-20EEG 0.3350180 0.1293575 0.07314188 0.02128002 CTBS_CM 0.7772745 0.7516700 0.62662846 0.79415648 CTBS_NEURONAV 0.9551281 0.9765666 0.89266147 0.95998774 DTMS_CM 0.8617782 0.8577601 0.73170985 0.92101038 HD-TDCS_10-10EEG NaN 0.9679404 0.94787708 0.89477801 HD-TDCS_10-20EEG 0.9679404 NaN 0.86480662 0.88911328 HF-RTMS_10-20EEG 0.9478771 0.8648066 NaN 0.64944468 HF-RTMS_CM 0.8947780 0.8891133 0.64944468 NaN HF-RTMS_NA 0.8755605 0.8209851 0.88677091 0.74074407 HF-RTMS_NEURONAV 0.9717901 0.9033839 0.95094157 0.71293479 ITBS_10-20EEG 0.7099815 0.5500534 0.57264247 0.34675992 ITBS_CM 0.8122098 0.8019796 0.69874698 0.84910027 ITBS_NA 0.9616066 0.9206971 0.99880413 0.84182503 ITBS_NEURONAV 0.4989783 0.3583339 0.17884412 0.29157206 LF-RTMS_10-10EEG 0.7594421 0.7384732 0.63451116 0.77699938 LF-RTMS_10-20EEG 0.5176698 0.3292687 0.08483979 0.17146609 LF-RTMS_CM 0.5886817 0.4111968 0.40438843 0.23300708 LF-RTMS_NEURONAV 0.8950534 0.7953715 0.89422092 0.59898666 PRM-RTMS_NEURONAV 0.9561526 0.9828488 0.85256671 0.91709120 SHAM 0.8669063 0.7142130 0.77657814 0.30139683 TACS_10-20EEG 0.8956154 0.8079138 0.90194614 0.64923938 TDCS_10-20EEG 0.9995107 0.9400845 0.86884524 0.71074105 TDCS_10-20EG 0.6967681 0.6484265 0.51597821 0.67268405 HF-RTMS_NA HF-RTMS_NEURONAV ITBS_10-20EEG ITBS_CM ITBS_NA CTBS_10-20EEG 0.4775370 0.07358666 0.34257012 0.1953383 0.3617386 CTBS_CM 0.6591798 0.65572773 0.41959787 0.9782904 0.7356246 CTBS_NEURONAV 0.8366625 0.91550510 0.67282662 0.8629572 0.9178601 DTMS_CM 0.7331870 0.76324590 0.48949263 0.9276741 0.8183315 HD-TDCS_10-10EEG 0.8755605 0.97179010 0.70998146 0.8122098 0.9616066 HD-TDCS_10-20EEG 0.8209851 0.90338391 0.55005340 0.8019796 0.9206971 HF-RTMS_10-20EEG 0.8867709 0.95094157 0.57264247 0.6987470 0.9988041 HF-RTMS_CM 0.7407441 0.71293479 0.34675992 0.8491003 0.8418250 HF-RTMS_NA NaN 0.86581693 0.87381249 0.6983905 0.9115275 HF-RTMS_NEURONAV 0.8658169 NaN 0.54902279 0.7238014 0.9774343 ITBS_10-20EEG 0.8738125 0.54902279 NaN 0.4966503 0.7527638 ITBS_CM 0.6983905 0.72380137 0.49665033 NaN 0.7734296 ITBS_NA 0.9115275 0.97743434 0.75276377 0.7734296 NaN ITBS_NEURONAV 0.4043415 0.20772668 0.10292237 0.6988562 0.4567247 LF-RTMS_10-10EEG 0.6508696 0.65880551 0.44780292 0.9428993 0.7214616 LF-RTMS_10-20EEG 0.4146717 0.11770047 0.05654273 0.7402196 0.4705246 LF-RTMS_CM 0.7462316 0.38898425 0.78957841 0.3983450 0.6264353 LF-RTMS_NEURONAV 0.9417577 0.85504745 0.68801675 0.6575414 0.9433977 PRM-RTMS_NEURONAV 0.8128446 0.88893167 0.55332217 0.8186576 0.9098947 SHAM 0.9539788 0.72920490 0.62468797 0.6091477 0.9192976 TACS_10-20EEG 0.9479184 0.86738062 0.72472570 0.6684600 0.9418371 TDCS_10-20EEG 0.8344046 0.93259459 0.45634843 0.7402135 0.9472569 TDCS_10-20EG 0.5858219 0.54469142 0.33584302 0.8944126 0.6556278 ITBS_NEURONAV LF-RTMS_10-10EEG LF-RTMS_10-20EEG LF-RTMS_CM CTBS_10-20EEG 0.00626649 0.1716196 0.0004593740 0.54512826 CTBS_CM 0.68681542 0.9598849 0.7286667751 0.32358368 CTBS_NEURONAV 0.56755756 0.8106577 0.5941099959 0.56043464 DTMS_CM 0.55809006 0.8656173 0.5792157463 0.37738060 HD-TDCS_10-10EEG 0.49897827 0.7594421 0.5176698381 0.58868168 HD-TDCS_10-20EEG 0.35833391 0.7384732 0.3292686873 0.41119684 HF-RTMS_10-20EEG 0.17884412 0.6345112 0.0848397874 0.40438843 HF-RTMS_CM 0.29157206 0.7769994 0.1714660863 0.23300708 HF-RTMS_NA 0.40434154 0.6508696 0.4146716932 0.74623155 HF-RTMS_NEURONAV 0.20772668 0.6588055 0.1177004653 0.38898425 ITBS_10-20EEG 0.10292237 0.4478029 0.0565427316 0.78957841 ITBS_CM 0.69885625 0.9428993 0.7402195601 0.39834502 ITBS_NA 0.45672472 0.7214616 0.4705245583 0.62643533 ITBS_NEURONAV NaN 0.7704356 0.8712211400 0.06918676 LF-RTMS_10-10EEG 0.77043555 NaN 0.8193244041 0.35752928 LF-RTMS_10-20EEG 0.87122114 0.8193244 NaN 0.03657840 LF-RTMS_CM 0.06918676 0.3575293 0.0365784015 NaN LF-RTMS_NEURONAV 0.18303885 0.5975112 0.1138821990 0.50848345 PRM-RTMS_NEURONAV 0.39361696 0.7558663 0.3771461910 0.41871985 SHAM 0.06874169 0.5470735 0.0008176529 0.42112751 TACS_10-20EEG 0.22999347 0.6102718 0.1830448666 0.55413125 TDCS_10-20EEG 0.17346030 0.6719003 0.0484047420 0.30762002 TDCS_10-20EG 0.78631420 0.9575765 0.8435290704 0.25399585 LF-RTMS_NEURONAV PRM-RTMS_NEURONAV SHAM TACS_10-20EEG CTBS_10-20EEG 0.1426863 0.1442079 0.0367420860 0.2014710 CTBS_CM 0.5865668 0.7719803 0.5179722467 0.6045403 CTBS_NEURONAV 0.8447033 0.9889352 0.8149807395 0.8469986 DTMS_CM 0.6820775 0.8767540 0.6139002097 0.6971132 HD-TDCS_10-10EEG 0.8950534 0.9561526 0.8669062650 0.8956154 HD-TDCS_10-20EEG 0.7953715 0.9828488 0.7142130011 0.8079138 HF-RTMS_10-20EEG 0.8942209 0.8525667 0.7765781380 0.9019461 HF-RTMS_CM 0.5989867 0.9170912 0.3013968336 0.6492394 HF-RTMS_NA 0.9417577 0.8128446 0.9539788215 0.9479184 HF-RTMS_NEURONAV 0.8550474 0.8889317 0.7292049018 0.8673806 ITBS_10-20EEG 0.6880167 0.5533222 0.6246879727 0.7247257 ITBS_CM 0.6575414 0.8186576 0.6091477240 0.6684600 ITBS_NA 0.9433977 0.9098947 0.9192975547 0.9418371 ITBS_NEURONAV 0.1830389 0.3936170 0.0687416863 0.2299935 LF-RTMS_10-10EEG 0.5975112 0.7558663 0.5470735287 0.6102718 LF-RTMS_10-20EEG 0.1138822 0.3771462 0.0008176529 0.1830449 LF-RTMS_CM 0.5084834 0.4187198 0.4211275069 0.5541313 LF-RTMS_NEURONAV NaN 0.7871695 0.9590800008 0.9934977 PRM-RTMS_NEURONAV 0.7871695 NaN 0.7135951356 0.7990104 SHAM 0.9590800 0.7135951 NaN 0.9755885 TACS_10-20EEG 0.9934977 0.7990104 0.9755884779 NaN TDCS_10-20EEG 0.7749006 0.9222971 0.4648078308 0.8046228 TDCS_10-20EG 0.4841689 0.6710882 0.4068837533 0.5072527 TDCS_10-20EEG TDCS_10-20EG CTBS_10-20EEG 0.02894600 0.08877579 CTBS_CM 0.66824432 0.90809826 CTBS_NEURONAV 0.93945460 0.75464843 DTMS_CM 0.78335900 0.80061105 HD-TDCS_10-10EEG 0.99951070 0.69676810 HD-TDCS_10-20EEG 0.94008451 0.64842653 HF-RTMS_10-20EEG 0.86884524 0.51597821 HF-RTMS_CM 0.71074105 0.67268405 HF-RTMS_NA 0.83440465 0.58582185 HF-RTMS_NEURONAV 0.93259459 0.54469142 ITBS_10-20EEG 0.45634843 0.33584302 ITBS_CM 0.74021348 0.89441256 ITBS_NA 0.94725687 0.65562776 ITBS_NEURONAV 0.17346030 0.78631420 LF-RTMS_10-10EEG 0.67190028 0.95757649 LF-RTMS_10-20EEG 0.04840474 0.84352907 LF-RTMS_CM 0.30762002 0.25399585 LF-RTMS_NEURONAV 0.77490060 0.48416890 PRM-RTMS_NEURONAV 0.92229707 0.67108819 SHAM 0.46480783 0.40688375 TACS_10-20EEG 0.80462284 0.50725265 TDCS_10-20EEG NaN 0.54953015 TDCS_10-20EG 0.54953015 NaN

Quantifying heterogeneity / inconsistency: I^2 = 86.0% [83.5%; 88.1%]

Tests of heterogeneity (within designs) and inconsistency (between designs): [1] 707.0534

Details of network meta-analysis methods:

  • Calculation of I^2 based on Q

Generating Forest Plot for: positive_symptoms Generating Network Graph for: positive_symptoms Calculating SUCRA/P-score values for: positive_symptoms Mean rank column not found in netrank results. SUCRA/P-score Results: Treatment SUCRA 1 CTBS_10-20EEG 91.0 2 LF-RTMS_CM 76.7 3 ITBS_10-20EEG 69.8 4 SHAM 61.4 5 HF-RTMS_NA 58.0 6 LF-RTMS_NEURONAV 58.0 7 TACS_10-20EEG 57.7 8 HF-RTMS_10-20EEG 54.6 9 ITBS_NA 53.1 10 HF-RTMS_NEURONAV 52.9 11 HD-TDCS_10-10EEG 50.8 12 TDCS_10-20EEG 50.6 13 HD-TDCS_10-20EEG 48.8 14 CTBS_NEURONAV 48.2 15 PRM-RTMS_NEURONAV 48.1 16 HF-RTMS_CM 43.2 17 DTMS_CM 42.4 18 ITBS_CM 39.7 19 CTBS_CM 37.4 20 LF-RTMS_10-10EEG 36.7 21 TDCS_10-20EG 32.5 22 ITBS_NEURONAV 19.5 23 LF-RTMS_10-20EEG 19.0 — Performing Split Analysis (Direct vs Indirect) for: positive_symptoms — Summary of Direct vs Indirect Evidence: Length Class Mode
comparison 253 -none- character k 253 -none- numeric
show 1 -none- character overall 1 -none- logical
direct 1 -none- logical
indirect 1 -none- logical
ci 1 -none- logical
test 1 -none- logical
only.reference 1 -none- logical
prop.common 253 -none- numeric
common 7 data.frame list
direct.common 12 data.frame list
indirect.common 7 data.frame list
compare.common 8 data.frame list
prop.random 253 -none- numeric
random 7 data.frame list
direct.random 12 data.frame list
indirect.random 7 data.frame list
compare.random 8 data.frame list
predict 3 data.frame list
method 1 -none- character sm 1 -none- character level.ma 1 -none- numeric
prediction 1 -none- logical
level.predict 1 -none- numeric
tau 1 -none- numeric
reference.group 1 -none- character baseline.reference 1 -none- logical
order 0 -none- NULL
sep.trts 1 -none- character quote.trts 1 -none- character nchar.trts 1 -none- numeric
tol.direct 1 -none- numeric
backtransf 1 -none- logical
x 198 netmeta list
version 1 -none- character prop.fixed 253 -none- numeric
fixed 7 data.frame list
direct.fixed 12 data.frame list
indirect.fixed 7 data.frame list
compare.fixed 8 data.frame list

‘p’ value column (’ p.random ’) not found in netsplit results. Cannot check for inconsistency. This might happen if there are no closed loops for indirect evidence calculation.

— Generating League Table for: positive_symptoms — League Table (Model: random ):
League Table: positive_symptoms ( random effects)
CTBS_10-20EEG CTBS_CM CTBS_NEURONAV DTMS_CM HD-TDCS_10-10EEG HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM HF-RTMS_NA HF-RTMS_NEURONAV ITBS_10-20EEG ITBS_CM ITBS_NA ITBS_NEURONAV LF-RTMS_10-10EEG LF-RTMS_10-20EEG LF-RTMS_CM LF-RTMS_NEURONAV PRM-RTMS_NEURONAV SHAM TACS_10-20EEG TDCS_10-20EEG TDCS_10-20EG
CTBS_10-20EEG CTBS_10-20EEG . . . . . . . . . . . . . . . . . . -2.99 [-5.79, -0.18] . . .
CTBS_CM -4.81 [-10.99, 1.38] CTBS_CM . . . . . . . . . . . . . . . . . 1.82 [-3.69, 7.33] . . .
CTBS_NEURONAV -3.84 [-11.49, 3.81] 0.97 [ -8.04, 9.97] CTBS_NEURONAV . . . . . . . . . . . . . . . . 0.85 [-6.27, 7.97] . . .
DTMS_CM -4.30 [-10.14, 1.53] 0.50 [ -7.02, 8.02] -0.47 [ -9.23, 8.30] DTMS_CM . . . . . . . . . . . . . . . 1.32 [-3.80, 6.43] . . .
HD-TDCS_10-10EEG -3.56 [-10.79, 3.67] 1.25 [ -7.40, 9.90] 0.28 [ -9.47, 10.03] 0.75 [ -7.66, 9.15] HD-TDCS_10-10EEG . . . . . . . . . . . . . . 0.57 [-6.10, 7.24] . . .
HD-TDCS_10-20EEG -3.72 [ -8.52, 1.09] 1.09 [ -5.66, 7.84] 0.12 [ -8.00, 8.24] 0.59 [ -5.84, 7.02] -0.16 [ -7.88, 7.56] HD-TDCS_10-20EEG . . . . . . . . . . . . . 0.73 [-3.17, 4.63] . . .
HF-RTMS_10-20EEG -3.32 [ -6.95, 0.31] 1.48 [ -4.49, 7.46] 0.52 [ -6.97, 8.00] 0.98 [ -4.63, 6.59] 0.24 [ -6.82, 7.29] 0.39 [ -4.14, 4.93] HF-RTMS_10-20EEG . . . . . . . . . . . . 0.33 [-1.98, 2.65] . . .
HF-RTMS_CM -4.03 [ -7.45, -0.60] 0.78 [ -5.08, 6.63] -0.19 [ -7.58, 7.20] 0.28 [ -5.20, 5.76] -0.47 [ -7.42, 6.48] -0.31 [ -4.68, 4.06] -0.70 [ -3.74, 2.33] HF-RTMS_CM . . . . . . . . . . . 1.04 [-0.93, 3.01] . . .
HF-RTMS_NA -2.78 [-10.44, 4.89] 2.03 [ -6.99, 11.04] 1.06 [ -9.02, 11.14] 1.53 [ -7.25, 10.30] 0.78 [ -8.98, 10.54] 0.94 [ -7.19, 9.07] 0.54 [ -6.95, 8.04] 1.25 [ -6.15, 8.65] HF-RTMS_NA . . . . . . . . . . -0.21 [-7.34, 6.92] . . .
HF-RTMS_NEURONAV -3.43 [ -7.18, 0.33] 1.38 [ -4.68, 7.43] 0.41 [ -7.14, 7.95] 0.87 [ -4.82, 6.57] 0.13 [ -6.99, 7.25] 0.29 [ -4.34, 4.92] -0.11 [ -3.51, 3.30] 0.60 [ -2.59, 3.78] -0.65 [ -8.21, 6.91] HF-RTMS_NEURONAV . . . . . . . . . 0.44 [-2.06, 2.94] . . .
ITBS_10-20EEG -2.14 [ -6.55, 2.28] 2.67 [ -3.81, 9.15] 1.70 [ -6.19, 9.59] 2.17 [ -3.98, 8.31] 1.42 [ -6.07, 8.91] 1.58 [ -3.60, 6.76] 1.19 [ -2.93, 5.30] 1.89 [ -2.05, 5.83] 0.64 [ -7.26, 8.54] 1.29 [ -2.93, 5.52] ITBS_10-20EEG . . . . . . . . -0.85 [-4.26, 2.56] . . .
ITBS_CM -4.69 [-11.78, 2.41] 0.12 [ -8.42, 8.65] -0.85 [-10.50, 8.80] -0.38 [ -8.67, 7.90] -1.13 [-10.45, 8.19] -0.97 [ -8.57, 6.62] -1.37 [ -8.28, 5.55] -0.66 [ -7.47, 6.15] -1.91 [-11.57, 7.75] -1.26 [ -8.24, 5.72] -2.55 [ -9.90, 4.80] ITBS_CM . . . . . . . 1.70 [-4.82, 8.22] . . .
ITBS_NA -3.33 [-10.48, 3.82] 1.48 [ -7.10, 10.06] 0.51 [ -9.18, 10.20] 0.98 [ -7.35, 9.31] 0.23 [ -9.13, 9.59] 0.39 [ -7.26, 8.03] -0.01 [ -6.98, 6.97] 0.70 [ -6.17, 7.57] -0.55 [-10.25, 9.15] 0.10 [ -6.93, 7.14] -1.19 [ -8.60, 6.22] 1.36 [ -7.90, 10.62] ITBS_NA . . . . . . 0.34 [-6.24, 6.92] . . .
ITBS_NEURONAV -6.14 [-10.54, -1.74] -1.33 [ -7.80, 5.14] -2.30 [-10.19, 5.59] -1.83 [ -7.97, 4.30] -2.58 [-10.06, 4.90] -2.42 [ -7.59, 2.75] -2.82 [ -6.92, 1.29] -2.11 [ -6.03, 1.81] -3.36 [-11.26, 4.54] -2.71 [ -6.92, 1.51] -4.00 [ -8.81, 0.81] -1.45 [ -8.80, 5.90] -2.81 [-10.21, 4.59] ITBS_NEURONAV . . . . . 3.15 [-0.24, 6.54] . . .
LF-RTMS_10-10EEG -5.03 [-12.23, 2.18] -0.22 [ -8.85, 8.41] -1.19 [-10.93, 8.55] -0.72 [ -9.10, 7.66] -1.47 [-10.88, 7.94] -1.31 [ -9.01, 6.39] -1.71 [ -8.74, 5.33] -1.00 [ -7.93, 5.93] -2.25 [-11.99, 7.49] -1.60 [ -8.69, 5.50] -2.89 [-10.35, 4.57] -0.34 [ -9.64, 8.96] -1.70 [-11.05, 7.65] 1.11 [ -6.35, 8.57] LF-RTMS_10-10EEG . . . . 2.04 [-4.60, 8.68] . . .
LF-RTMS_10-20EEG -5.82 [ -9.08, -2.57] -1.02 [ -6.78, 4.74] -1.99 [ -9.30, 5.32] -1.52 [ -6.90, 3.86] -2.27 [ -9.14, 4.60] -2.11 [ -6.35, 2.13] -2.50 [ -5.35, 0.34] -1.80 [ -4.38, 0.78] -3.05 [-10.37, 4.28] -2.40 [ -5.40, 0.61] -3.69 [ -7.48, 0.10] -1.14 [ -7.86, 5.59] -2.50 [ -9.28, 4.29] 0.31 [ -3.46, 4.09] -0.80 [ -7.64, 6.05] LF-RTMS_10-20EEG . . . 2.84 [ 1.18, 4.50] . . .
LF-RTMS_CM -1.45 [ -6.13, 3.24] 3.36 [ -3.31, 10.03] 2.39 [ -5.66, 10.44] 2.86 [ -3.49, 9.20] 2.11 [ -5.54, 9.76] 2.27 [ -3.14, 7.68] 1.88 [ -2.53, 6.28] 2.58 [ -1.66, 6.82] 1.33 [ -6.73, 9.39] 1.98 [ -2.53, 6.49] 0.69 [ -4.38, 5.76] 3.24 [ -4.28, 10.76] 1.88 [ -5.69, 9.45] 4.69 [ -0.37, 9.75] 3.58 [ -4.05, 11.21] 4.38 [ 0.27, 8.48] LF-RTMS_CM . . -1.54 [-5.29, 2.21] . . .
LF-RTMS_NEURONAV -3.07 [ -7.16, 1.03] 1.74 [ -4.53, 8.01] 0.77 [ -6.95, 8.49] 1.24 [ -4.69, 7.16] 0.49 [ -6.81, 7.80] 0.65 [ -4.26, 5.56] 0.26 [ -3.52, 4.04] 0.96 [ -2.62, 4.54] -0.29 [ -8.02, 7.45] 0.36 [ -3.53, 4.26] -0.93 [ -5.46, 3.60] 1.62 [ -5.55, 8.79] 0.26 [ -6.96, 7.49] 3.07 [ -1.45, 7.59] 1.96 [ -5.32, 9.24] 2.76 [ -0.66, 6.18] -1.62 [ -6.42, 3.18] LF-RTMS_NEURONAV . 0.08 [-2.91, 3.07] . . .
PRM-RTMS_NEURONAV -3.78 [ -8.85, 1.29] 1.03 [ -5.92, 7.97] 0.06 [ -8.22, 8.34] 0.52 [ -6.11, 7.16] -0.22 [ -8.11, 7.67] -0.06 [ -5.81, 5.69] -0.46 [ -5.27, 4.36] 0.25 [ -4.42, 4.91] -1.00 [ -9.29, 7.29] -0.35 [ -5.26, 4.56] -1.64 [ -7.07, 3.79] 0.91 [ -6.86, 8.68] -0.45 [ -8.27, 7.37] 2.36 [ -3.06, 7.78] 1.25 [ -6.62, 9.12] 2.05 [ -2.49, 6.59] -2.33 [ -7.98, 3.32] -0.71 [ -5.89, 4.46] PRM-RTMS_NEURONAV 0.79 [-3.43, 5.02] . . .
SHAM -2.99 [ -5.79, -0.18] 1.82 [ -3.69, 7.33] 0.85 [ -6.27, 7.97] 1.32 [ -3.80, 6.43] 0.57 [ -6.10, 7.24] 0.73 [ -3.17, 4.63] 0.33 [ -1.98, 2.65] 1.04 [ -0.93, 3.01] -0.21 [ -7.34, 6.92] 0.44 [ -2.06, 2.94] -0.85 [ -4.26, 2.56] 1.70 [ -4.82, 8.22] 0.34 [ -6.24, 6.92] 3.15 [ -0.24, 6.54] 2.04 [ -4.60, 8.68] 2.84 [ 1.18, 4.50] -1.54 [ -5.29, 2.21] 0.08 [ -2.91, 3.07] 0.79 [ -3.43, 5.02] SHAM -0.06 [-3.80, 3.68] -0.57 [-2.09, 0.95] -2.27 [-7.64, 3.10]
TACS_10-20EEG -3.05 [ -7.72, 1.63] 1.76 [ -4.90, 8.42] 0.79 [ -7.25, 8.83] 1.26 [ -5.08, 7.59] 0.51 [ -7.13, 8.15] 0.67 [ -4.73, 6.07] 0.28 [ -4.12, 4.67] 0.98 [ -3.25, 5.21] -0.27 [ -8.32, 7.78] 0.38 [ -4.11, 4.88] -0.91 [ -5.97, 4.15] 1.64 [ -5.87, 9.15] 0.28 [ -7.28, 7.85] 3.09 [ -1.96, 8.14] 1.98 [ -5.64, 9.60] 2.78 [ -1.31, 6.87] -1.60 [ -6.90, 3.70] 0.02 [ -4.77, 4.81] 0.73 [ -4.91, 6.38] -0.06 [ -3.80, 3.68] TACS_10-20EEG . .
TDCS_10-20EEG -3.55 [ -6.74, -0.36] 1.25 [ -4.47, 6.97] 0.28 [ -7.00, 7.56] 0.75 [ -4.59, 6.08] 0.00 [ -6.84, 6.84] 0.16 [ -4.02, 4.35] -0.23 [ -3.00, 2.53] 0.47 [ -2.02, 2.96] -0.78 [ -8.07, 6.51] -0.13 [ -3.05, 2.80] -1.42 [ -5.15, 2.31] 1.13 [ -5.56, 7.82] -0.23 [ -6.98, 6.52] 2.58 [ -1.14, 6.30] 1.47 [ -5.34, 8.28] 2.27 [ 0.02, 4.52] -2.11 [ -6.16, 1.94] -0.49 [ -3.85, 2.87] 0.22 [ -4.27, 4.72] -0.57 [ -2.09, 0.95] -0.51 [ -4.55, 3.53] TDCS_10-20EEG .
TDCS_10-20EG -5.26 [-11.31, 0.80] -0.45 [ -8.15, 7.24] -1.42 [-10.34, 7.49] -0.96 [ -8.37, 6.46] -1.70 [-10.26, 6.86] -1.54 [ -8.18, 5.09] -1.94 [ -7.78, 3.91] -1.23 [ -6.95, 4.49] -2.48 [-11.41, 6.44] -1.83 [ -7.75, 4.09] -3.12 [ -9.48, 3.24] -0.57 [ -9.01, 7.87] -1.93 [-10.42, 6.56] 0.88 [ -5.47, 7.23] -0.23 [ -8.77, 8.31] 0.57 [ -5.05, 6.19] -3.81 [-10.36, 2.74] -2.19 [ -8.34, 3.95] -1.48 [ -8.31, 5.35] -2.27 [ -7.64, 3.10] -2.21 [ -8.76, 4.33] -1.70 [ -7.28, 3.88] TDCS_10-20EG

Interpretation Guide: - Comparisons are ‘Column Treatment’ vs ‘Row Treatment’. - Cells contain: MD [95% CI]. - Positive MD favors the column treatment (assuming positive TE = benefit after direction adjustment).

Generating Comparison-Adjusted Funnel Plot for: positive_symptoms Visual assessment of funnel plot asymmetry recommended. Asymmetry may suggest publication bias or other systematic differences between small and large studies.

Generating Rankogram for: positive_symptoms

— Performing Network Meta-Regression for: positive_symptoms using covariate: Overall_RoB_Level — !!! Error during netmetareg execution for positive_symptoms with covariate Overall_RoB_Level : object ‘netmetareg’ not found -> Double-check if the covariate ’ Overall_RoB_Level ’ exists in the data frame used by the nma_result object. — Meta-regression failed for: positive_symptoms using covariate: Overall_RoB_Level —

Skipping meta-regression for Diagnosis - ‘Diagnosis’ column not found or contains only NA values.

========================================================== Finished NMA Workflow for Domain: positive_symptoms ==========================================================

========================================================== Starting NMA Workflow for Domain: negative_symptoms ==========================================================

— Running Network Meta-Analysis for: negative_symptoms — Number of comparisons: 110 Number of unique studies (studlab): 110 Treatments included: LF-RTMS_10-20EEG, HF-RTMS_NEURONAV, ITBS_NEURONAV, ITBS_CM, TDCS_10-20EEG, TACS_10-20EEG, ITBS_10-20EEG, HD-TDCS_10-10EEG, HF-RTMS_10-20EEG, LF-RTMS_CM, DTMS_CM, HF-RTMS_CM, HD-TDCS_10-20EEG, LF-RTMS_10-10EEG, ITBS_NA, CTBS_CM, HF-RTMS_NA, TDCS_10-20EG, LF-RTMS_NEURONAV, CTBS_NEURONAV, CTBS_10-20EEG, SHAM Reference treatment: SHAM Model type: Random Effects (tau method: REML ) — NMA completed successfully for: negative_symptoms — Estimated heterogeneity (tau^2): 13.2148 I^2 statistic (overall inconsistency): 82.1% Cochran’s Q: 496.63 , df = 89 , p-value = <2e-16

— NMA Summary —

Results ( effects model): Number of studies: k = 110 Number of pairwise comparisons: m = 110 Number of treatments: n = 22 Number of designs: d = 21

Treatment estimates (sm = ‘MD’, comparison: other treatments vs ‘SHAM’): $TE CTBS_10-20EEG CTBS_CM CTBS_NEURONAV DTMS_CM CTBS_10-20EEG 0.0000000 0.26000000 -0.70000000 -1.9891037632 CTBS_CM -0.2600000 0.00000000 -0.96000000 -2.2491037632 CTBS_NEURONAV 0.7000000 0.96000000 0.00000000 -1.2891037632 DTMS_CM 1.9891038 2.24910376 1.28910376 0.0000000000 HD-TDCS_10-10EEG 3.4384162 3.69841621 2.73841621 1.4493124452 HD-TDCS_10-20EEG 0.5737902 0.83379021 -0.12620979 -1.4153135511 HF-RTMS_10-20EEG 4.2337142 4.49371421 3.53371421 2.2446104438 HF-RTMS_CM 4.6380455 4.89804547 3.93804547 2.6489417110 HF-RTMS_NA 1.1800000 1.44000000 0.48000000 -0.8091037632 HF-RTMS_NEURONAV -0.1900805 0.06991953 -0.89008047 -2.1791842342 ITBS_10-20EEG 7.4365160 7.69651600 6.73651600 5.4474122350 ITBS_CM 0.4205771 0.68057708 -0.27942292 -1.5685266880 ITBS_NA 1.2800000 1.54000000 0.58000000 -0.7091037632 ITBS_NEURONAV 4.6686491 4.92864908 3.96864908 2.6795453129 LF-RTMS_10-10EEG 1.9900000 2.25000000 1.29000000 0.0008962368 LF-RTMS_10-20EEG 0.7719635 1.03196345 0.07196345 -1.2171403123 LF-RTMS_CM 0.6611241 0.92112412 -0.03887588 -1.3279796407 LF-RTMS_NEURONAV -2.9500000 -2.69000000 -3.65000000 -4.9391037632 SHAM -0.3200000 -0.06000000 -1.02000000 -2.3091037632 TACS_10-20EEG 1.4778250 1.73782501 0.77782501 -0.5112787536 TDCS_10-20EEG 0.2098078 0.46980778 -0.49019222 -1.7792959837 TDCS_10-20EG 2.6800000 2.94000000 1.98000000 0.6908962368 HD-TDCS_10-10EEG HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM CTBS_10-20EEG -3.4384162 -0.57379021 -4.2337142 -4.6380455 CTBS_CM -3.6984162 -0.83379021 -4.4937142 -4.8980455 CTBS_NEURONAV -2.7384162 0.12620979 -3.5337142 -3.9380455 DTMS_CM -1.4493124 1.41531355 -2.2446104 -2.6489417 HD-TDCS_10-10EEG 0.0000000 2.86462600 -0.7952980 -1.1996293 HD-TDCS_10-20EEG -2.8646260 0.00000000 -3.6599240 -4.0642553 HF-RTMS_10-20EEG 0.7952980 3.65992399 0.0000000 -0.4043313 HF-RTMS_CM 1.1996293 4.06425526 0.4043313 0.0000000 HF-RTMS_NA -2.2584162 0.60620979 -3.0537142 -3.4580455 HF-RTMS_NEURONAV -3.6284967 -0.76387068 -4.4237947 -4.8281259 ITBS_10-20EEG 3.9980998 6.86272579 3.2028018 2.7984705 ITBS_CM -3.0178391 -0.15321314 -3.8131371 -4.2174684 ITBS_NA -2.1584162 0.70620979 -2.9537142 -3.3580455 ITBS_NEURONAV 1.2302329 4.09485886 0.4349349 0.0306036 LF-RTMS_10-10EEG -1.4484162 1.41620979 -2.2437142 -2.6480455 LF-RTMS_10-20EEG -2.6664528 0.19817324 -3.4617508 -3.8660820 LF-RTMS_CM -2.7772921 0.08733391 -3.5725901 -3.9769214 LF-RTMS_NEURONAV -6.3884162 -3.52379021 -7.1837142 -7.5880455 SHAM -3.7584162 -0.89379021 -4.5537142 -4.9580455 TACS_10-20EEG -1.9605912 0.90403480 -2.7558892 -3.1602205 TDCS_10-20EEG -3.2286084 -0.36398243 -4.0239064 -4.4282377 TDCS_10-20EG -0.7584162 2.10620979 -1.5537142 -1.9580455 HF-RTMS_NA HF-RTMS_NEURONAV ITBS_10-20EEG ITBS_CM CTBS_10-20EEG -1.1800000 0.19008047 -7.436516 -0.4205771 CTBS_CM -1.4400000 -0.06991953 -7.696516 -0.6805771 CTBS_NEURONAV -0.4800000 0.89008047 -6.736516 0.2794229 DTMS_CM 0.8091038 2.17918423 -5.447412 1.5685267 HD-TDCS_10-10EEG 2.2584162 3.62849668 -3.998100 3.0178391 HD-TDCS_10-20EEG -0.6062098 0.76387068 -6.862726 0.1532131 HF-RTMS_10-20EEG 3.0537142 4.42379468 -3.202802 3.8131371 HF-RTMS_CM 3.4580455 4.82812595 -2.798471 4.2174684 HF-RTMS_NA 0.0000000 1.37008047 -6.256516 0.7594229 HF-RTMS_NEURONAV -1.3700805 0.00000000 -7.626596 -0.6106575 ITBS_10-20EEG 6.2565160 7.62659647 0.000000 7.0159389 ITBS_CM -0.7594229 0.61065755 -7.015939 0.0000000 ITBS_NA 0.1000000 1.47008047 -6.156516 0.8594229 ITBS_NEURONAV 3.4886491 4.85872955 -2.767867 4.2480720 LF-RTMS_10-10EEG 0.8100000 2.18008047 -5.446516 1.5694229 LF-RTMS_10-20EEG -0.4080365 0.96204392 -6.664553 0.3513864 LF-RTMS_CM -0.5188759 0.85120459 -6.775392 0.2405470 LF-RTMS_NEURONAV -4.1300000 -2.75991953 -10.386516 -3.3705771 SHAM -1.5000000 -0.12991953 -7.756516 -0.7405771 TACS_10-20EEG 0.2978250 1.66790548 -5.958691 1.0572479 TDCS_10-20EEG -0.9701922 0.39988825 -7.226708 -0.2107693 TDCS_10-20EG 1.5000000 2.87008047 -4.756516 2.2594229 ITBS_NA ITBS_NEURONAV LF-RTMS_10-10EEG LF-RTMS_10-20EEG CTBS_10-20EEG -1.2800000 -4.6686491 -1.9900000000 -0.77196345 CTBS_CM -1.5400000 -4.9286491 -2.2500000000 -1.03196345 CTBS_NEURONAV -0.5800000 -3.9686491 -1.2900000000 -0.07196345 DTMS_CM 0.7091038 -2.6795453 -0.0008962368 1.21714031 HD-TDCS_10-10EEG 2.1584162 -1.2302329 1.4484162084 2.66645276 HD-TDCS_10-20EEG -0.7062098 -4.0948589 -1.4162097879 -0.19817324 HF-RTMS_10-20EEG 2.9537142 -0.4349349 2.2437142071 3.46175076 HF-RTMS_CM 3.3580455 -0.0306036 2.6480454743 3.86608202 HF-RTMS_NA -0.1000000 -3.4886491 -0.8100000000 0.40803655 HF-RTMS_NEURONAV -1.4700805 -4.8587295 -2.1800804709 -0.96204392 ITBS_10-20EEG 6.1565160 2.7678669 5.4465159982 6.66455255 ITBS_CM -0.8594229 -4.2480720 -1.5694229248 -0.35138638 ITBS_NA 0.0000000 -3.3886491 -0.7100000000 0.50803655 ITBS_NEURONAV 3.3886491 0.0000000 2.6786490761 3.89668563 LF-RTMS_10-10EEG 0.7100000 -2.6786491 0.0000000000 1.21803655 LF-RTMS_10-20EEG -0.5080365 -3.8966856 -1.2180365491 0.00000000 LF-RTMS_CM -0.6188759 -4.0075250 -1.3288758775 -0.11083933 LF-RTMS_NEURONAV -4.2300000 -7.6186491 -4.9400000000 -3.72196345 SHAM -1.6000000 -4.9886491 -2.3100000000 -1.09196345 TACS_10-20EEG 0.1978250 -3.1908241 -0.5121749904 0.70586156 TDCS_10-20EEG -1.0701922 -4.4588413 -1.7801922205 -0.56215567 TDCS_10-20EG 1.4000000 -1.9886491 0.6900000000 1.90803655 LF-RTMS_CM LF-RTMS_NEURONAV SHAM TACS_10-20EEG CTBS_10-20EEG -0.66112412 2.950000 0.3200000 -1.4778250 CTBS_CM -0.92112412 2.690000 0.0600000 -1.7378250 CTBS_NEURONAV 0.03887588 3.650000 1.0200000 -0.7778250 DTMS_CM 1.32797964 4.939104 2.3091038 0.5112788 HD-TDCS_10-10EEG 2.77729209 6.388416 3.7584162 1.9605912 HD-TDCS_10-20EEG -0.08733391 3.523790 0.8937902 -0.9040348 HF-RTMS_10-20EEG 3.57259008 7.183714 4.5537142 2.7558892 HF-RTMS_CM 3.97692135 7.588045 4.9580455 3.1602205 HF-RTMS_NA 0.51887588 4.130000 1.5000000 -0.2978250 HF-RTMS_NEURONAV -0.85120459 2.759920 0.1299195 -1.6679055 ITBS_10-20EEG 6.77539188 10.386516 7.7565160 5.9586910 ITBS_CM -0.24054705 3.370577 0.7405771 -1.0572479 ITBS_NA 0.61887588 4.230000 1.6000000 -0.1978250 ITBS_NEURONAV 4.00752495 7.618649 4.9886491 3.1908241 LF-RTMS_10-10EEG 1.32887588 4.940000 2.3100000 0.5121750 LF-RTMS_10-20EEG 0.11083933 3.721963 1.0919635 -0.7058616 LF-RTMS_CM 0.00000000 3.611124 0.9811241 -0.8167009 LF-RTMS_NEURONAV -3.61112412 0.000000 -2.6300000 -4.4278250 SHAM -0.98112412 2.630000 0.0000000 -1.7978250 TACS_10-20EEG 0.81670089 4.427825 1.7978250 0.0000000 TDCS_10-20EEG -0.45131634 3.159808 0.5298078 -1.2680172 TDCS_10-20EG 2.01887588 5.630000 3.0000000 1.2021750 TDCS_10-20EEG TDCS_10-20EG CTBS_10-20EEG -0.2098078 -2.6800000 CTBS_CM -0.4698078 -2.9400000 CTBS_NEURONAV 0.4901922 -1.9800000 DTMS_CM 1.7792960 -0.6908962 HD-TDCS_10-10EEG 3.2286084 0.7584162 HD-TDCS_10-20EEG 0.3639824 -2.1062098 HF-RTMS_10-20EEG 4.0239064 1.5537142 HF-RTMS_CM 4.4282377 1.9580455 HF-RTMS_NA 0.9701922 -1.5000000 HF-RTMS_NEURONAV -0.3998883 -2.8700805 ITBS_10-20EEG 7.2267082 4.7565160 ITBS_CM 0.2107693 -2.2594229 ITBS_NA 1.0701922 -1.4000000 ITBS_NEURONAV 4.4588413 1.9886491 LF-RTMS_10-10EEG 1.7801922 -0.6900000 LF-RTMS_10-20EEG 0.5621557 -1.9080365 LF-RTMS_CM 0.4513163 -2.0188759 LF-RTMS_NEURONAV -3.1598078 -5.6300000 SHAM -0.5298078 -3.0000000 TACS_10-20EEG 1.2680172 -1.2021750 TDCS_10-20EEG 0.0000000 -2.4701922 TDCS_10-20EG 2.4701922 0.0000000

$seTE CTBS_10-20EEG CTBS_CM CTBS_NEURONAV DTMS_CM HD-TDCS_10-10EEG CTBS_10-20EEG 0.000000 5.511886 5.652804 4.393795 5.446978 CTBS_CM 5.511886 0.000000 5.787178 4.565377 5.586305 CTBS_NEURONAV 5.652804 5.787178 0.000000 4.734551 5.725392 DTMS_CM 4.393795 4.565377 4.734551 0.000000 4.486797 HD-TDCS_10-10EEG 5.446978 5.586305 5.725392 4.486797 0.000000 HD-TDCS_10-20EEG 4.234430 4.412214 4.587041 2.896926 4.330856 HF-RTMS_10-20EEG 3.976844 4.165636 4.350383 2.505408 4.079364 HF-RTMS_CM 3.985142 4.173558 4.357970 2.518558 4.087453 HF-RTMS_NA 5.446550 5.585887 5.724985 4.486278 5.521850 HF-RTMS_NEURONAV 4.075874 4.260279 4.441091 2.659798 4.175963 ITBS_10-20EEG 4.133359 4.315309 4.493907 2.747078 4.232089 ITBS_CM 4.259845 4.436611 4.610512 2.933950 4.355709 ITBS_NA 5.289763 5.433123 5.576032 4.294575 5.367263 ITBS_NEURONAV 4.223849 4.402060 4.577275 2.881437 4.320511 LF-RTMS_10-10EEG 5.342359 5.484344 5.625952 4.359195 5.419106 LF-RTMS_10-20EEG 3.976877 4.165667 4.350413 2.505460 4.079395 LF-RTMS_CM 4.351183 4.524381 4.695033 3.065057 4.445077 LF-RTMS_NEURONAV 9.681019 9.760090 9.840359 9.175179 9.723582 SHAM 3.797608 3.994879 4.187167 2.209888 3.904836 TACS_10-20EEG 4.312159 4.486864 4.658890 3.009401 4.406885 TDCS_10-20EEG 3.911903 4.103683 4.291099 2.400993 4.016080 TDCS_10-20EG 5.572149 5.708422 5.844603 4.637955 5.645774 HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM HF-RTMS_NA CTBS_10-20EEG 4.234430 3.976844 3.985142 5.446550 CTBS_CM 4.412214 4.165636 4.173558 5.585887 CTBS_NEURONAV 4.587041 4.350383 4.357970 5.724985 DTMS_CM 2.896926 2.505408 2.518558 4.486278 HD-TDCS_10-10EEG 4.330856 4.079364 4.087453 5.521850 HD-TDCS_10-20EEG 0.000000 2.214055 2.228925 4.330318 HF-RTMS_10-20EEG 2.214055 0.000000 1.689081 4.078792 HF-RTMS_CM 2.228925 1.689081 0.000000 4.086883 HF-RTMS_NA 4.330318 4.078792 4.086883 0.000000 HF-RTMS_NEURONAV 2.387362 1.893247 1.910616 4.175404 ITBS_10-20EEG 2.484232 2.014025 2.030360 4.231538 ITBS_CM 2.689430 2.262282 2.276837 4.355174 ITBS_NA 4.131385 3.866941 3.875474 5.366829 ITBS_NEURONAV 2.632043 2.193750 2.208756 4.319971 LF-RTMS_10-10EEG 4.198517 3.938583 3.946961 5.418676 LF-RTMS_10-20EEG 2.214113 1.669487 1.689158 4.078824 LF-RTMS_CM 2.831880 2.429903 2.443460 4.444552 LF-RTMS_NEURONAV 9.099938 8.982971 8.986647 9.723342 SHAM 1.873119 1.180451 1.208110 3.904239 TACS_10-20EEG 2.771546 2.359312 2.373272 4.406356 TDCS_10-20EEG 2.095169 1.508185 1.529931 4.015500 TDCS_10-20EG 4.487270 4.245054 4.252828 5.645361 HF-RTMS_NEURONAV ITBS_10-20EEG ITBS_CM ITBS_NA ITBS_NEURONAV CTBS_10-20EEG 4.075874 4.133359 4.259845 5.289763 4.223849 CTBS_CM 4.260279 4.315309 4.436611 5.433123 4.402060 CTBS_NEURONAV 4.441091 4.493907 4.610512 5.576032 4.577275 DTMS_CM 2.659798 2.747078 2.933950 4.294575 2.881437 HD-TDCS_10-10EEG 4.175963 4.232089 4.355709 5.367263 4.320511 HD-TDCS_10-20EEG 2.387362 2.484232 2.689430 4.131385 2.632043 HF-RTMS_10-20EEG 1.893247 2.014025 2.262282 3.866941 2.193750 HF-RTMS_CM 1.910616 2.030360 2.276837 3.875474 2.208756 HF-RTMS_NA 4.175404 4.231538 4.355174 5.366829 4.319971 HF-RTMS_NEURONAV 0.000000 2.203124 2.432155 3.968714 2.368543 ITBS_10-20EEG 2.203124 0.000000 2.527309 4.027729 2.466152 ITBS_CM 2.432155 2.527309 0.000000 4.157430 2.672738 ITBS_NA 3.968714 4.027729 4.157430 0.000000 4.120539 ITBS_NEURONAV 2.368543 2.466152 2.672738 4.120539 0.000000 LF-RTMS_10-10EEG 4.038551 4.096560 4.224148 5.261059 4.187845 LF-RTMS_10-20EEG 1.893316 2.014089 2.262339 3.866975 2.193809 LF-RTMS_CM 2.588801 2.678395 2.869743 4.250969 2.816033 LF-RTMS_NEURONAV 9.027249 9.053349 9.111792 9.636393 9.095019 SHAM 1.480176 1.631819 1.929885 3.682359 1.849074 TACS_10-20EEG 2.522660 2.614522 2.810222 4.211016 2.755352 TDCS_10-20EEG 1.752735 1.882549 2.146070 3.800122 2.073700 TDCS_10-20EG 4.337965 4.392021 4.511261 5.494250 4.477286 LF-RTMS_10-10EEG LF-RTMS_10-20EEG LF-RTMS_CM LF-RTMS_NEURONAV CTBS_10-20EEG 5.342359 3.976877 4.351183 9.681019 CTBS_CM 5.484344 4.165667 4.524381 9.760090 CTBS_NEURONAV 5.625952 4.350413 4.695033 9.840359 DTMS_CM 4.359195 2.505460 3.065057 9.175179 HD-TDCS_10-10EEG 5.419106 4.079395 4.445077 9.723582 HD-TDCS_10-20EEG 4.198517 2.214113 2.831880 9.099938 HF-RTMS_10-20EEG 3.938583 1.669487 2.429903 8.982971 HF-RTMS_CM 3.946961 1.689158 2.443460 8.986647 HF-RTMS_NA 5.418676 4.078824 4.444552 9.723342 HF-RTMS_NEURONAV 4.038551 1.893316 2.588801 9.027249 ITBS_10-20EEG 4.096560 2.014089 2.678395 9.053349 ITBS_CM 4.224148 2.262339 2.869743 9.111792 ITBS_NA 5.261059 3.866975 4.250969 9.636393 ITBS_NEURONAV 4.187845 2.193809 2.816033 9.095019 LF-RTMS_10-10EEG 0.000000 3.938616 4.316241 9.665364 LF-RTMS_10-20EEG 3.938616 0.000000 2.429957 8.982985 LF-RTMS_CM 4.316241 2.429957 0.000000 9.154849 LF-RTMS_NEURONAV 9.665364 8.982985 9.154849 0.000000 SHAM 3.757522 1.180560 2.123904 8.905072 TACS_10-20EEG 4.276899 2.359367 2.946838 9.136366 TDCS_10-20EEG 3.873000 1.508271 2.322095 8.954410 TDCS_10-20EG 5.544907 4.245084 4.597606 9.794249 SHAM TACS_10-20EEG TDCS_10-20EEG TDCS_10-20EG CTBS_10-20EEG 3.7976080 4.312159 3.9119030 5.572149 CTBS_CM 3.9948790 4.486864 4.1036834 5.708422 CTBS_NEURONAV 4.1871671 4.658890 4.2910986 5.844603 DTMS_CM 2.2098883 3.009401 2.4009925 4.637955 HD-TDCS_10-10EEG 3.9048358 4.406885 4.0160803 5.645774 HD-TDCS_10-20EEG 1.8731191 2.771546 2.0951691 4.487270 HF-RTMS_10-20EEG 1.1804507 2.359312 1.5081852 4.245054 HF-RTMS_CM 1.2081102 2.373272 1.5299310 4.252828 HF-RTMS_NA 3.9042387 4.406356 4.0154998 5.645361 HF-RTMS_NEURONAV 1.4801762 2.522660 1.7527350 4.337965 ITBS_10-20EEG 1.6318190 2.614522 1.8825493 4.392021 ITBS_CM 1.9298851 2.810222 2.1460697 4.511261 ITBS_NA 3.6823593 4.211016 3.8001221 5.494250 ITBS_NEURONAV 1.8490738 2.755352 2.0737002 4.477286 LF-RTMS_10-10EEG 3.7575220 4.276899 3.8730001 5.544907 LF-RTMS_10-20EEG 1.1805604 2.359367 1.5082710 4.245084 LF-RTMS_CM 2.1239037 2.946838 2.3220950 4.597606 LF-RTMS_NEURONAV 8.9050716 9.136366 8.9544100 9.794249 SHAM 0.0000000 2.042765 0.9387004 4.077624 TACS_10-20EEG 2.0427653 0.000000 2.2481211 4.560692 TDCS_10-20EEG 0.9387004 2.248121 0.0000000 4.184277 TDCS_10-20EG 4.0776241 4.560692 4.1842773 0.000000

$lower CTBS_10-20EEG CTBS_CM CTBS_NEURONAV DTMS_CM CTBS_10-20EEG 0.0000000 -10.5430976 -11.779293 -10.60078335 CTBS_CM -11.0630976 0.0000000 -12.302660 -11.19707782 CTBS_NEURONAV -10.3792926 -10.3826601 0.000000 -10.56865358 DTMS_CM -6.6225758 -6.6988703 -7.990446 0.00000000 HD-TDCS_10-10EEG -7.2374645 -7.2505400 -8.483146 -7.34464850 HD-TDCS_10-20EEG -7.7255410 -7.8139906 -9.116645 -7.09318464 HF-RTMS_10-20EEG -3.5607573 -3.6707822 -4.992880 -2.66589948 HF-RTMS_CM -3.1726893 -3.2819785 -4.603418 -2.28734219 HF-RTMS_NA -9.4950417 -9.5081382 -10.740764 -9.60204620 HF-RTMS_NEURONAV -8.1786465 -8.2800746 -9.594459 -7.39229349 ITBS_10-20EEG -0.6647195 -0.7613343 -2.071380 0.06323747 ITBS_CM -7.9285665 -8.0150203 -9.315861 -7.31896320 ITBS_NA -9.0877456 -9.1087259 -10.348823 -9.12631651 ITBS_NEURONAV -3.6099428 -3.6992300 -5.002644 -2.96796783 LF-RTMS_10-10EEG -8.4808309 -8.4991169 -9.736664 -8.54296822 LF-RTMS_10-20EEG -7.0225719 -7.1325938 -8.454689 -6.12775153 LF-RTMS_CM -7.8670378 -7.9465001 -9.240972 -7.33538060 LF-RTMS_NEURONAV -21.9244483 -21.8194250 -22.936750 -22.92212377 SHAM -7.7631749 -7.8898191 -9.226697 -6.64040533 TACS_10-20EEG -6.9738516 -7.0562669 -8.353432 -6.40959705 TDCS_10-20EEG -7.4573812 -7.5732638 -8.900591 -6.48515483 TDCS_10-20EG -8.2412113 -8.2483007 -9.475212 -8.39932809 HD-TDCS_10-10EEG HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM CTBS_10-20EEG -14.114297 -8.8731214 -12.028186 -12.448780 CTBS_CM -14.647372 -9.4815710 -12.658211 -13.078069 CTBS_NEURONAV -13.959978 -8.8642250 -12.060308 -12.479509 DTMS_CM -10.243273 -4.2625575 -7.155120 -7.585226 HD-TDCS_10-10EEG 0.000000 -5.6236967 -8.790704 -9.210890 HD-TDCS_10-20EEG -11.352949 0.0000000 -7.999392 -8.432867 HF-RTMS_10-20EEG -7.200108 -0.6795439 0.000000 -3.714869 HF-RTMS_CM -6.811632 -0.3043569 -2.906206 0.000000 HF-RTMS_NA -13.081042 -7.8810577 -11.048000 -11.468188 HF-RTMS_NEURONAV -11.813233 -5.4430139 -8.134491 -8.572864 ITBS_10-20EEG -4.296642 1.9937206 -0.744615 -1.180963 ITBS_CM -11.554872 -5.4243984 -8.247129 -8.679987 ITBS_NA -12.678058 -7.3911567 -10.532780 -10.953835 ITBS_NEURONAV -7.237813 -1.0638501 -3.864736 -4.298479 LF-RTMS_10-10EEG -12.069670 -6.8127326 -9.963195 -10.383947 LF-RTMS_10-20EEG -10.661921 -4.1414092 -6.733885 -7.176770 LF-RTMS_CM -11.489483 -5.4630480 -8.335113 -8.766015 LF-RTMS_NEURONAV -25.446286 -21.3593413 -24.790013 -25.201551 SHAM -11.411754 -4.5650362 -6.867355 -7.325898 TACS_10-20EEG -10.597927 -4.5280948 -7.380056 -7.811748 TDCS_10-20EEG -11.099981 -4.4704385 -6.979895 -7.426847 TDCS_10-20EG -11.823929 -6.6886780 -9.873867 -10.293436 HF-RTMS_NA HF-RTMS_NEURONAV ITBS_10-20EEG ITBS_CM CTBS_10-20EEG -11.855042 -7.7984855 -15.537752 -8.7697207 CTBS_CM -12.388138 -8.4199136 -16.154366 -9.3761744 CTBS_NEURONAV -11.700764 -7.8142981 -15.544412 -8.7570154 DTMS_CM -7.983839 -3.0339250 -10.831587 -4.1819098 HD-TDCS_10-10EEG -8.564210 -4.5562398 -12.292842 -5.5191933 HD-TDCS_10-20EEG -9.093477 -3.9152726 -11.731731 -5.1179721 HF-RTMS_10-20EEG -4.940571 0.7130981 -7.150219 -0.6208544 HF-RTMS_CM -4.552097 1.0833883 -6.777904 -0.2450502 HF-RTMS_NA 0.000000 -6.8135616 -14.550178 -7.7765603 HF-RTMS_NEURONAV -9.553723 0.0000000 -11.944640 -5.3775938 ITBS_10-20EEG -2.037146 3.3085530 0.000000 2.0625046 ITBS_CM -9.295406 -4.1562787 -11.969373 0.0000000 ITBS_NA -10.418791 -6.3084562 -14.050720 -7.2889907 ITBS_NEURONAV -4.978339 0.2164708 -7.601437 -0.9903990 LF-RTMS_10-10EEG -9.810410 -5.7353337 -13.475626 -6.7097554 LF-RTMS_10-20EEG -8.402384 -2.7487867 -10.612095 -4.0827174 LF-RTMS_CM -9.230039 -4.2227512 -12.024950 -5.3840454 LF-RTMS_NEURONAV -23.187400 -20.4530021 -28.130755 -21.2293615 SHAM -9.152167 -3.0310115 -10.954823 -4.5230824 TACS_10-20EEG -8.338473 -3.2764165 -11.083059 -4.4506856 TDCS_10-20EEG -8.840427 -3.0354093 -10.916437 -4.4169886 TDCS_10-20EG -9.564704 -5.6321745 -13.364720 -6.5824859 ITBS_NA ITBS_NEURONAV LF-RTMS_10-10EEG LF-RTMS_10-20EEG CTBS_10-20EEG -11.647746 -12.947241 -12.460831 -8.5664988 CTBS_CM -12.188726 -13.556528 -12.999117 -9.1965207 CTBS_NEURONAV -11.508823 -12.939942 -12.316664 -8.5986158 DTMS_CM -7.708109 -8.327058 -8.544761 -3.6934709 HD-TDCS_10-10EEG -8.361226 -9.698279 -9.172837 -5.3290150 HD-TDCS_10-20EEG -8.803576 -9.253568 -9.645152 -4.5377557 HF-RTMS_10-20EEG -4.625351 -4.734605 -5.475766 0.1896163 HF-RTMS_CM -4.237744 -4.359686 -5.087856 0.5553941 HF-RTMS_NA -10.618791 -11.955638 -11.430410 -7.5863110 HF-RTMS_NEURONAV -9.248617 -9.500988 -10.095495 -4.6728746 ITBS_10-20EEG -1.737688 -2.065703 -2.582594 2.7170098 ITBS_CM -9.007837 -9.486543 -9.848601 -4.7854901 ITBS_NA 0.000000 -11.464758 -11.021486 -7.0710944 ITBS_NEURONAV -4.687459 0.000000 -5.529376 -0.4031005 LF-RTMS_10-10EEG -9.601486 -10.886674 0.000000 -6.5015085 LF-RTMS_10-20EEG -8.087168 -8.196472 -8.937582 0.0000000 LF-RTMS_CM -8.950622 -9.526848 -9.788553 -4.8734670 LF-RTMS_NEURONAV -23.116983 -25.444559 -23.883766 -21.3282909 SHAM -8.817292 -8.612767 -9.674608 -3.4058194 TACS_10-20EEG -8.055616 -8.591215 -8.894742 -3.9184129 TDCS_10-20EEG -8.518295 -8.523219 -9.371133 -3.5183125 TDCS_10-20EG -9.368533 -10.763969 -10.177817 -6.4121758 LF-RTMS_CM LF-RTMS_NEURONAV SHAM TACS_10-20EEG CTBS_10-20EEG -9.1892860 -16.024448 -7.123175 -9.9295016 CTBS_CM -9.7887484 -16.439425 -7.769819 -10.5319169 CTBS_NEURONAV -9.1632198 -15.636750 -7.186697 -9.9090821 DTMS_CM -4.6794213 -13.043916 -2.022198 -5.3870395 HD-TDCS_10-10EEG -5.9348987 -12.669454 -3.894921 -6.6767441 HD-TDCS_10-20EEG -5.6377159 -14.311761 -2.777456 -6.3361644 HF-RTMS_10-20EEG -1.1899331 -10.422585 2.240073 -1.8682777 HF-RTMS_CM -0.8121723 -10.025460 2.590193 -1.4913073 HF-RTMS_NA -8.1922869 -14.927400 -6.152167 -8.9341233 HF-RTMS_NEURONAV -5.9251604 -14.933163 -2.771172 -6.6122275 ITBS_10-20EEG 1.5258340 -7.357723 4.558209 0.8343227 ITBS_CM -5.8651395 -14.488207 -3.041928 -6.5651815 ITBS_NA -7.7128700 -14.656983 -5.617292 -8.4512657 ITBS_NEURONAV -1.5117979 -10.207261 1.364531 -2.2095664 LF-RTMS_10-10EEG -7.1308014 -14.003766 -5.054608 -7.8703922 LF-RTMS_10-20EEG -4.6517883 -13.884364 -1.221892 -5.3301361 LF-RTMS_CM 0.0000000 -14.332051 -3.181651 -6.5923981 LF-RTMS_NEURONAV -21.5542991 0.000000 -20.083620 -22.3347740 SHAM -5.1438988 -14.823620 0.000000 -5.8015714 TACS_10-20EEG -4.9589963 -13.479124 -2.205921 0.0000000 TDCS_10-20EEG -5.0025389 -14.390513 -1.310011 -5.6742537 TDCS_10-20EG -6.9922671 -13.566376 -4.991996 -7.7366163 TDCS_10-20EEG TDCS_10-20EG CTBS_10-20EEG -7.8769967 -13.601211 CTBS_CM -8.5128794 -14.128301 CTBS_NEURONAV -7.9202064 -13.435212 DTMS_CM -2.9265629 -9.781121 HD-TDCS_10-10EEG -4.6427644 -10.307097 HD-TDCS_10-20EEG -3.7424736 -10.901098 HF-RTMS_10-20EEG 1.0679178 -6.766438 HF-RTMS_CM 1.4296281 -6.377345 HF-RTMS_NA -6.9000427 -12.564704 HF-RTMS_NEURONAV -3.8351858 -11.372335 ITBS_10-20EEG 3.5369794 -3.851688 ITBS_CM -3.9954500 -11.101332 ITBS_NA -6.3779103 -12.168533 ITBS_NEURONAV 0.3944637 -6.786671 LF-RTMS_10-10EEG -5.8107485 -11.557817 LF-RTMS_10-20EEG -2.3940012 -10.228249 LF-RTMS_CM -4.0999063 -11.030019 LF-RTMS_NEURONAV -20.7101288 -24.826376 SHAM -2.3696268 -10.991996 TACS_10-20EEG -3.1382192 -10.140966 TDCS_10-20EEG 0.0000000 -10.671225 TDCS_10-20EG -5.7308406 0.000000

$upper CTBS_10-20EEG CTBS_CM CTBS_NEURONAV DTMS_CM CTBS_10-20EEG 0.000000 11.063098 10.379293 6.622576 CTBS_CM 10.543098 0.000000 10.382660 6.698870 CTBS_NEURONAV 11.779293 12.302660 0.000000 7.990446 DTMS_CM 10.600783 11.197078 10.568654 0.000000 HD-TDCS_10-10EEG 14.114297 14.647372 13.959978 10.243273 HD-TDCS_10-20EEG 8.873121 9.481571 8.864225 4.262558 HF-RTMS_10-20EEG 12.028186 12.658211 12.060308 7.155120 HF-RTMS_CM 12.448780 13.078069 12.479509 7.585226 HF-RTMS_NA 11.855042 12.388138 11.700764 7.983839 HF-RTMS_NEURONAV 7.798486 8.419914 7.814298 3.033925 ITBS_10-20EEG 15.537752 16.154366 15.544412 10.831587 ITBS_CM 8.769721 9.376174 8.757015 4.181910 ITBS_NA 11.647746 12.188726 11.508823 7.708109 ITBS_NEURONAV 12.947241 13.556528 12.939942 8.327058 LF-RTMS_10-10EEG 12.460831 12.999117 12.316664 8.544761 LF-RTMS_10-20EEG 8.566499 9.196521 8.598616 3.693471 LF-RTMS_CM 9.189286 9.788748 9.163220 4.679421 LF-RTMS_NEURONAV 16.024448 16.439425 15.636750 13.043916 SHAM 7.123175 7.769819 7.186697 2.022198 TACS_10-20EEG 9.929502 10.531917 9.909082 5.387040 TDCS_10-20EEG 7.876997 8.512879 7.920206 2.926563 TDCS_10-20EG 13.601211 14.128301 13.435212 9.781121 HD-TDCS_10-10EEG HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM CTBS_10-20EEG 7.237464 7.725541 3.5607573 3.1726893 CTBS_CM 7.250540 7.813991 3.6707822 3.2819785 CTBS_NEURONAV 8.483146 9.116645 4.9928798 4.6034179 DTMS_CM 7.344648 7.093185 2.6658995 2.2873422 HD-TDCS_10-10EEG 0.000000 11.352949 7.2001076 6.8116316 HD-TDCS_10-20EEG 5.623697 0.000000 0.6795439 0.3043569 HF-RTMS_10-20EEG 8.790704 7.999392 0.0000000 2.9062064 HF-RTMS_CM 9.210890 8.432867 3.7148690 0.0000000 HF-RTMS_NA 8.564210 9.093477 4.9405711 4.5520974 HF-RTMS_NEURONAV 4.556240 3.915273 -0.7130981 -1.0833883 ITBS_10-20EEG 12.292842 11.731731 7.1502186 6.7779039 ITBS_CM 5.519193 5.117972 0.6208544 0.2450502 ITBS_NA 8.361226 8.803576 4.6253511 4.2377443 ITBS_NEURONAV 9.698279 9.253568 4.7346053 4.3596863 LF-RTMS_10-10EEG 9.172837 9.645152 5.4757664 5.0878560 LF-RTMS_10-20EEG 5.329015 4.537756 -0.1896163 -0.5553941 LF-RTMS_CM 5.934899 5.637716 1.1899331 0.8121723 LF-RTMS_NEURONAV 12.669454 14.311761 10.4225849 10.0254596 SHAM 3.894921 2.777456 -2.2400733 -2.5901930 TACS_10-20EEG 6.676744 6.336164 1.8682777 1.4913073 TDCS_10-20EEG 4.642764 3.742474 -1.0679178 -1.4296281 TDCS_10-20EG 10.307097 10.901098 6.7664384 6.3773448 HF-RTMS_NA HF-RTMS_NEURONAV ITBS_10-20EEG ITBS_CM ITBS_NA CTBS_10-20EEG 9.495042 8.178646 0.66471951 7.928567 9.087746 CTBS_CM 9.508138 8.280075 0.76133427 8.015020 9.108726 CTBS_NEURONAV 10.740764 9.594459 2.07138024 9.315861 10.348823 DTMS_CM 9.602046 7.392293 -0.06323747 7.318963 9.126317 HD-TDCS_10-10EEG 13.081042 11.813233 4.29664195 11.554872 12.678058 HD-TDCS_10-20EEG 7.881058 5.443014 -1.99372060 5.424398 7.391157 HF-RTMS_10-20EEG 11.048000 8.134491 0.74461498 8.247129 10.532780 HF-RTMS_CM 11.468188 8.572864 1.18096287 8.679987 10.953835 HF-RTMS_NA 0.000000 9.553723 2.03714592 9.295406 10.418791 HF-RTMS_NEURONAV 6.813562 0.000000 -3.30855299 4.156279 6.308456 ITBS_10-20EEG 14.550178 11.944640 0.00000000 11.969373 14.050720 ITBS_CM 7.776560 5.377594 -2.06250461 0.000000 7.288991 ITBS_NA 10.618791 9.248617 1.73768832 9.007837 0.000000 ITBS_NEURONAV 11.955638 9.500988 2.06570278 9.486543 11.464758 LF-RTMS_10-10EEG 11.430410 10.095495 2.58259424 9.848601 11.021486 LF-RTMS_10-20EEG 7.586311 4.672875 -2.71700977 4.785490 7.071094 LF-RTMS_CM 8.192287 5.925160 -1.52583402 5.865139 7.712870 LF-RTMS_NEURONAV 14.927400 14.933163 7.35772251 14.488207 14.656983 SHAM 6.152167 2.771172 -4.55820947 3.041928 5.617292 TACS_10-20EEG 8.934123 6.612228 -0.83432272 6.565182 8.451266 TDCS_10-20EEG 6.900043 3.835186 -3.53697939 3.995450 6.377910 TDCS_10-20EG 12.564704 11.372335 3.85168763 11.101332 12.168533 ITBS_NEURONAV LF-RTMS_10-10EEG LF-RTMS_10-20EEG LF-RTMS_CM CTBS_10-20EEG 3.6099428 8.480831 7.022572 7.867038 CTBS_CM 3.6992300 8.499117 7.132594 7.946500 CTBS_NEURONAV 5.0026442 9.736664 8.454689 9.240972 DTMS_CM 2.9679678 8.542968 6.127752 7.335381 HD-TDCS_10-10EEG 7.2378134 12.069670 10.661921 11.489483 HD-TDCS_10-20EEG 1.0638501 6.812733 4.141409 5.463048 HF-RTMS_10-20EEG 3.8647356 9.963195 6.733885 8.335113 HF-RTMS_CM 4.2984791 10.383947 7.176770 8.766015 HF-RTMS_NA 4.9783395 9.810410 8.402384 9.230039 HF-RTMS_NEURONAV -0.2164708 5.735334 2.748787 4.222751 ITBS_10-20EEG 7.6014366 13.475626 10.612095 12.024950 ITBS_CM 0.9903990 6.709755 4.082717 5.384045 ITBS_NA 4.6874594 9.601486 8.087168 8.950622 ITBS_NEURONAV 0.0000000 10.886674 8.196472 9.526848 LF-RTMS_10-10EEG 5.5293761 0.000000 8.937582 9.788553 LF-RTMS_10-20EEG 0.4031005 6.501509 0.000000 4.873467 LF-RTMS_CM 1.5117979 7.130801 4.651788 0.000000 LF-RTMS_NEURONAV 10.2072609 14.003766 13.884364 14.332051 SHAM -1.3645311 5.054608 1.221892 3.181651 TACS_10-20EEG 2.2095664 7.870392 5.330136 6.592398 TDCS_10-20EEG -0.3944637 5.810748 2.394001 4.099906 TDCS_10-20EG 6.7866707 11.557817 10.228249 11.030019 LF-RTMS_NEURONAV SHAM TACS_10-20EEG TDCS_10-20EEG CTBS_10-20EEG 21.92445 7.763175 6.973852 7.457381 CTBS_CM 21.81943 7.889819 7.056267 7.573264 CTBS_NEURONAV 22.93675 9.226697 8.353432 8.900591 DTMS_CM 22.92212 6.640405 6.409597 6.485155 HD-TDCS_10-10EEG 25.44629 11.411754 10.597927 11.099981 HD-TDCS_10-20EEG 21.35934 4.565036 4.528095 4.470438 HF-RTMS_10-20EEG 24.79001 6.867355 7.380056 6.979895 HF-RTMS_CM 25.20155 7.325898 7.811748 7.426847 HF-RTMS_NA 23.18740 9.152167 8.338473 8.840427 HF-RTMS_NEURONAV 20.45300 3.031012 3.276417 3.035409 ITBS_10-20EEG 28.13075 10.954823 11.083059 10.916437 ITBS_CM 21.22936 4.523082 4.450686 4.416989 ITBS_NA 23.11698 8.817292 8.055616 8.518295 ITBS_NEURONAV 25.44456 8.612767 8.591215 8.523219 LF-RTMS_10-10EEG 23.88377 9.674608 8.894742 9.371133 LF-RTMS_10-20EEG 21.32829 3.405819 3.918413 3.518313 LF-RTMS_CM 21.55430 5.143899 4.958996 5.002539 LF-RTMS_NEURONAV 0.00000 14.823620 13.479124 14.390513 SHAM 20.08362 0.000000 2.205921 1.310011 TACS_10-20EEG 22.33477 5.801571 0.000000 5.674254 TDCS_10-20EEG 20.71013 2.369627 3.138219 0.000000 TDCS_10-20EG 24.82638 10.991996 10.140966 10.671225 TDCS_10-20EG CTBS_10-20EEG 8.241211 CTBS_CM 8.248301 CTBS_NEURONAV 9.475212 DTMS_CM 8.399328 HD-TDCS_10-10EEG 11.823929 HD-TDCS_10-20EEG 6.688678 HF-RTMS_10-20EEG 9.873867 HF-RTMS_CM 10.293436 HF-RTMS_NA 9.564704 HF-RTMS_NEURONAV 5.632175 ITBS_10-20EEG 13.364720 ITBS_CM 6.582486 ITBS_NA 9.368533 ITBS_NEURONAV 10.763969 LF-RTMS_10-10EEG 10.177817 LF-RTMS_10-20EEG 6.412176 LF-RTMS_CM 6.992267 LF-RTMS_NEURONAV 13.566376 SHAM 4.991996 TACS_10-20EEG 7.736616 TDCS_10-20EEG 5.730841 TDCS_10-20EG 0.000000

$statistic CTBS_10-20EEG CTBS_CM CTBS_NEURONAV DTMS_CM CTBS_10-20EEG NaN 0.04717079 -0.123832346 -0.4527074767 CTBS_CM -0.04717079 NaN -0.165883965 -0.4926436247 CTBS_NEURONAV 0.12383235 0.16588396 NaN -0.2722758107 DTMS_CM 0.45270748 0.49264362 0.272275811 NaN HD-TDCS_10-10EEG 0.63125209 0.66205056 0.478293243 0.3230171493 HD-TDCS_10-20EEG 0.13550588 0.18897320 -0.027514424 -0.4885569859 HF-RTMS_10-20EEG 1.06459140 1.07875827 0.812276572 0.8959060659 HF-RTMS_CM 1.16383444 1.17358981 0.903642262 1.0517689946 HF-RTMS_NA 0.21665091 0.25779252 0.083843021 -0.1803508038 HF-RTMS_NEURONAV -0.04663551 0.01641196 -0.200419324 -0.8193042592 ITBS_10-20EEG 1.79914576 1.78353762 1.499033183 1.9829838832 ITBS_CM 0.09873060 0.15340022 -0.060605611 -0.5346126004 ITBS_NA 0.24197680 0.28344654 0.104016611 -0.1651161589 ITBS_NEURONAV 1.10530682 1.11962332 0.867033216 0.9299336143 LF-RTMS_10-10EEG 0.37249464 0.41025872 0.229294513 0.0002055969 LF-RTMS_10-20EEG 0.19411299 0.24773066 0.016541752 -0.4857951627 LF-RTMS_CM 0.15194124 0.20359118 -0.008280214 -0.4332642829 LF-RTMS_NEURONAV -0.30471999 -0.27561221 -0.370921421 -0.5383114453 SHAM -0.08426357 -0.01501923 -0.243601455 -1.0448961224 TACS_10-20EEG 0.34271115 0.38731395 0.166954997 -0.1698938398 TDCS_10-20EEG 0.05363318 0.11448441 -0.114234668 -0.7410668617 TDCS_10-20EG 0.48096345 0.51502854 0.338774068 0.1489657122 HD-TDCS_10-10EEG HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM CTBS_10-20EEG -0.6312521 -0.13550588 -1.0645914 -1.16383444 CTBS_CM -0.6620506 -0.18897320 -1.0787583 -1.17358981 CTBS_NEURONAV -0.4782932 0.02751442 -0.8122766 -0.90364226 DTMS_CM -0.3230171 0.48855699 -0.8959061 -1.05176899 HD-TDCS_10-10EEG NaN 0.66144561 -0.1949564 -0.29349065 HD-TDCS_10-20EEG -0.6614456 NaN -1.6530412 -1.82341522 HF-RTMS_10-20EEG 0.1949564 1.65304121 NaN -0.23937946 HF-RTMS_CM 0.2934906 1.82341522 0.2393795 NaN HF-RTMS_NA -0.4089963 0.13999198 -0.7486810 -0.84613280 HF-RTMS_NEURONAV -0.8689006 -0.31996435 -2.3366174 -2.52700023 ITBS_10-20EEG 0.9447107 2.76251408 1.5902492 1.37831216 ITBS_CM -0.6928468 -0.05696864 -1.6855268 -1.85233652 ITBS_NA -0.4021447 0.17093777 -0.7638374 -0.86648635 ITBS_NEURONAV 0.2847424 1.55577218 0.1982609 0.01385558 LF-RTMS_10-10EEG -0.2672795 0.33731190 -0.5696755 -0.67090743 LF-RTMS_10-20EEG -0.6536392 0.08950456 -2.0735416 -2.28876343 LF-RTMS_CM -0.6248018 0.03083956 -1.4702601 -1.62757781 LF-RTMS_NEURONAV -0.6570024 -0.38723232 -0.7997036 -0.84436890 SHAM -0.9625030 -0.47716678 -3.8576063 -4.10396787 TACS_10-20EEG -0.4448928 0.32618434 -1.1680901 -1.33158793 TDCS_10-20EEG -0.8039203 -0.17372461 -2.6680454 -2.89440357 TDCS_10-20EG -0.1343334 0.46937441 -0.3660058 -0.46041019 HF-RTMS_NA HF-RTMS_NEURONAV ITBS_10-20EEG ITBS_CM CTBS_10-20EEG -0.21665091 0.04663551 -1.7991458 -0.09873060 CTBS_CM -0.25779252 -0.01641196 -1.7835376 -0.15340022 CTBS_NEURONAV -0.08384302 0.20041932 -1.4990332 0.06060561 DTMS_CM 0.18035080 0.81930426 -1.9829839 0.53461260 HD-TDCS_10-10EEG 0.40899633 0.86890065 -0.9447107 0.69284685 HD-TDCS_10-20EEG -0.13999198 0.31996435 -2.7625141 0.05696864 HF-RTMS_10-20EEG 0.74868104 2.33661740 -1.5902492 1.68552676 HF-RTMS_CM 0.84613280 2.52700023 -1.3783122 1.85233652 HF-RTMS_NA NaN 0.32813121 -1.4785442 0.17437260 HF-RTMS_NEURONAV -0.32813121 NaN -3.4617193 -0.25107673 ITBS_10-20EEG 1.47854424 3.46171929 NaN 2.77605127 ITBS_CM -0.17437260 0.25107673 -2.7760513 NaN ITBS_NA 0.01863298 0.37041733 -1.5285327 0.20671975 ITBS_NEURONAV 0.80756299 2.05135807 -1.1223422 1.58940808 LF-RTMS_10-10EEG 0.14948301 0.53981752 -1.3295340 0.37153595 LF-RTMS_10-20EEG -0.10003780 0.50812651 -3.3089655 0.15531992 LF-RTMS_CM -0.11674424 0.32880269 -2.5296462 0.08382182 LF-RTMS_NEURONAV -0.42475108 -0.30573208 -1.1472567 -0.36991374 SHAM -0.38419782 -0.08777302 -4.7532942 -0.38374153 TACS_10-20EEG 0.06758987 0.66116945 -2.2790750 0.37621512 TDCS_10-20EEG -0.24161182 0.22815100 -3.8387883 -0.09821177 TDCS_10-20EG 0.26570490 0.66161911 -1.0829902 0.50084067 ITBS_NA ITBS_NEURONAV LF-RTMS_10-10EEG LF-RTMS_10-20EEG CTBS_10-20EEG -0.24197680 -1.10530682 -0.3724946363 -0.19411299 CTBS_CM -0.28344654 -1.11962332 -0.4102587242 -0.24773066 CTBS_NEURONAV -0.10401661 -0.86703322 -0.2292945128 -0.01654175 DTMS_CM 0.16511616 -0.92993361 -0.0002055969 0.48579516 HD-TDCS_10-10EEG 0.40214467 -0.28474244 0.2672795303 0.65363923 HD-TDCS_10-20EEG -0.17093777 -1.55577218 -0.3373118968 -0.08950456 HF-RTMS_10-20EEG 0.76383739 -0.19826093 0.5696755071 2.07354158 HF-RTMS_CM 0.86648635 -0.01385558 0.6709074253 2.28876343 HF-RTMS_NA -0.01863298 -0.80756299 -0.1494830066 0.10003780 HF-RTMS_NEURONAV -0.37041733 -2.05135807 -0.5398175151 -0.50812651 ITBS_10-20EEG 1.52853272 1.12234225 1.3295340176 3.30896553 ITBS_CM -0.20671975 -1.58940808 -0.3715359539 -0.15531992 ITBS_NA NaN -0.82238000 -0.1349538202 0.13137830 ITBS_NEURONAV 0.82238000 NaN 0.6396247057 1.77621939 LF-RTMS_10-10EEG 0.13495382 -0.63962471 NaN 0.30925498 LF-RTMS_10-20EEG -0.13137830 -1.77621939 -0.3092549820 NaN LF-RTMS_CM -0.14558466 -1.42311019 -0.3078780401 -0.04561370 LF-RTMS_NEURONAV -0.43896093 -0.83767268 -0.5111033321 -0.41433481 SHAM -0.43450405 -2.69791780 -0.6147668671 -0.92495345 TACS_10-20EEG 0.04697797 -1.15804595 -0.1197538316 0.29917411 TDCS_10-20EEG -0.28162048 -2.15018611 -0.4596416666 -0.37271529 TDCS_10-20EG 0.25481183 -0.44416394 0.1244385251 0.44946965 LF-RTMS_CM LF-RTMS_NEURONAV SHAM TACS_10-20EEG CTBS_10-20EEG -0.151941237 0.3047200 0.08426357 -0.34271115 CTBS_CM -0.203591183 0.2756122 0.01501923 -0.38731395 CTBS_NEURONAV 0.008280214 0.3709214 0.24360145 -0.16695500 DTMS_CM 0.433264283 0.5383114 1.04489612 0.16989384 HD-TDCS_10-10EEG 0.624801795 0.6570024 0.96250301 0.44489278 HD-TDCS_10-20EEG -0.030839557 0.3872323 0.47716678 -0.32618434 HF-RTMS_10-20EEG 1.470260105 0.7997036 3.85760627 1.16809009 HF-RTMS_CM 1.627577807 0.8443689 4.10396787 1.33158793 HF-RTMS_NA 0.116744235 0.4247511 0.38419782 -0.06758987 HF-RTMS_NEURONAV -0.328802694 0.3057321 0.08777302 -0.66116945 ITBS_10-20EEG 2.529646196 1.1472567 4.75329424 2.27907503 ITBS_CM -0.083821816 0.3699137 0.38374153 -0.37621512 ITBS_NA 0.145584664 0.4389609 0.43450405 -0.04697797 ITBS_NEURONAV 1.423110194 0.8376727 2.69791780 1.15804595 LF-RTMS_10-10EEG 0.307878040 0.5111033 0.61476687 0.11975383 LF-RTMS_10-20EEG 0.045613705 0.4143348 0.92495345 -0.29917411 LF-RTMS_CM NaN 0.3944493 0.46194380 -0.27714478 LF-RTMS_NEURONAV -0.394449323 NaN -0.29533732 -0.48463742 SHAM -0.461943798 0.2953373 NaN -0.88009377 TACS_10-20EEG 0.277144778 0.4846374 0.88009377 NaN TDCS_10-20EEG -0.194357397 0.3528773 0.56440559 -0.56403421 TDCS_10-20EG 0.439114551 0.5748271 0.73572256 0.26359489 TDCS_10-20EEG TDCS_10-20EG CTBS_10-20EEG -0.05363318 -0.4809634 CTBS_CM -0.11448441 -0.5150285 CTBS_NEURONAV 0.11423467 -0.3387741 DTMS_CM 0.74106686 -0.1489657 HD-TDCS_10-10EEG 0.80392028 0.1343334 HD-TDCS_10-20EEG 0.17372461 -0.4693744 HF-RTMS_10-20EEG 2.66804535 0.3660058 HF-RTMS_CM 2.89440357 0.4604102 HF-RTMS_NA 0.24161182 -0.2657049 HF-RTMS_NEURONAV -0.22815100 -0.6616191 ITBS_10-20EEG 3.83878829 1.0829902 ITBS_CM 0.09821177 -0.5008407 ITBS_NA 0.28162048 -0.2548118 ITBS_NEURONAV 2.15018611 0.4441639 LF-RTMS_10-10EEG 0.45964167 -0.1244385 LF-RTMS_10-20EEG 0.37271529 -0.4494696 LF-RTMS_CM 0.19435740 -0.4391146 LF-RTMS_NEURONAV -0.35287727 -0.5748271 SHAM -0.56440559 -0.7357226 TACS_10-20EEG 0.56403421 -0.2635949 TDCS_10-20EEG NaN -0.5903510 TDCS_10-20EG 0.59035098 NaN

$p CTBS_10-20EEG CTBS_CM CTBS_NEURONAV DTMS_CM CTBS_10-20EEG NaN 0.96237711 0.9014480 0.65075940 CTBS_CM 0.96237711 NaN 0.8682483 0.62226442 CTBS_NEURONAV 0.90144802 0.86824827 NaN 0.78540995 DTMS_CM 0.65075940 0.62226442 0.7854100 NaN HD-TDCS_10-10EEG 0.52787571 0.50793882 0.6324415 0.74668225 HD-TDCS_10-20EEG 0.89221192 0.85011382 0.9780494 0.62515537 HF-RTMS_10-20EEG 0.28706087 0.28069550 0.4166330 0.37030293 HF-RTMS_CM 0.24449111 0.24055937 0.3661851 0.29290555 HF-RTMS_NA 0.82848041 0.79656704 0.9331812 0.85687717 HF-RTMS_NEURONAV 0.96280373 0.98690574 0.8411526 0.41261284 ITBS_10-20EEG 0.07199563 0.07449883 0.1338650 0.04736923 ITBS_CM 0.92135218 0.87808267 0.9516733 0.59291777 ITBS_NA 0.80879814 0.77683456 0.9171562 0.86885255 ITBS_NEURONAV 0.26902666 0.26287431 0.3859238 0.35240546 LF-RTMS_10-10EEG 0.70952460 0.68161617 0.8186400 0.99983596 LF-RTMS_10-20EEG 0.84608741 0.80434280 0.9868022 0.62711240 LF-RTMS_CM 0.87923328 0.83867298 0.9933934 0.66482278 LF-RTMS_NEURONAV 0.76057942 0.78284593 0.7106961 0.59036205 SHAM 0.93284688 0.98801684 0.8075395 0.29607098 TACS_10-20EEG 0.73181578 0.69852380 0.8674055 0.86509363 TDCS_10-20EEG 0.95722742 0.90885380 0.9090518 0.45865290 TDCS_10-20EG 0.63054248 0.60653308 0.7347799 0.88158069 HD-TDCS_10-10EEG HD-TDCS_10-20EEG HF-RTMS_10-20EEG CTBS_10-20EEG 0.5278757 0.892211919 0.2870608733 CTBS_CM 0.5079388 0.850113824 0.2806955006 CTBS_NEURONAV 0.6324415 0.978049435 0.4166329506 DTMS_CM 0.7466823 0.625155372 0.3703029342 HD-TDCS_10-10EEG NaN 0.508326586 0.8454270856 HD-TDCS_10-20EEG 0.5083266 NaN 0.0983224764 HF-RTMS_10-20EEG 0.8454271 0.098322476 NaN HF-RTMS_CM 0.7691471 0.068240526 0.8108113572 HF-RTMS_NA 0.6825424 0.888666330 0.4540494728 HF-RTMS_NEURONAV 0.3849015 0.748995356 0.0194590870 ITBS_10-20EEG 0.3448066 0.005735809 0.1117786555 ITBS_CM 0.4884057 0.954570180 0.0918869865 ITBS_NA 0.6875776 0.864272700 0.4449641545 ITBS_NEURONAV 0.7758415 0.119762276 0.8428409148 LF-RTMS_10-10EEG 0.7892539 0.735881792 0.5688978053 LF-RTMS_10-20EEG 0.5133443 0.928680932 0.0381219055 LF-RTMS_CM 0.5321012 0.975397494 0.1414913216 LF-RTMS_NEURONAV 0.5111794 0.698584222 0.4238825366 SHAM 0.3357970 0.633243362 0.0001145029 TACS_10-20EEG 0.6563972 0.744284885 0.2427704278 TDCS_10-20EEG 0.4214430 0.862081898 0.0076293959 TDCS_10-20EG 0.8931389 0.638802033 0.7143607679 HF-RTMS_CM HF-RTMS_NA HF-RTMS_NEURONAV ITBS_10-20EEG CTBS_10-20EEG 2.444911e-01 0.8284804 0.9628037272 7.199563e-02 CTBS_CM 2.405594e-01 0.7965670 0.9869057393 7.449883e-02 CTBS_NEURONAV 3.661851e-01 0.9331812 0.8411526479 1.338650e-01 DTMS_CM 2.929055e-01 0.8568772 0.4126128432 4.736923e-02 HD-TDCS_10-10EEG 7.691471e-01 0.6825424 0.3849014744 3.448066e-01 HD-TDCS_10-20EEG 6.824053e-02 0.8886663 0.7489953565 5.735809e-03 HF-RTMS_10-20EEG 8.108114e-01 0.4540495 0.0194590870 1.117787e-01 HF-RTMS_CM NaN 0.3974787 0.0115041427 1.681069e-01 HF-RTMS_NA 3.974787e-01 NaN 0.7428124578 1.392622e-01 HF-RTMS_NEURONAV 1.150414e-02 0.7428125 NaN 5.367367e-04 ITBS_10-20EEG 1.681069e-01 0.1392622 0.0005367367 NaN ITBS_CM 6.397751e-02 0.8615726 0.8017547832 5.502353e-03 ITBS_NA 3.862235e-01 0.9851339 0.7110715622 1.263803e-01 ITBS_NEURONAV 9.889452e-01 0.4193422 0.0402320895 2.617170e-01 LF-RTMS_10-10EEG 5.022795e-01 0.8811725 0.5893228868 1.836719e-01 LF-RTMS_10-20EEG 2.209310e-02 0.9203143 0.6113646227 9.364137e-04 LF-RTMS_CM 1.036144e-01 0.9070627 0.7423048269 1.141776e-02 LF-RTMS_NEURONAV 3.984633e-01 0.6710181 0.7598086481 2.512755e-01 SHAM 4.061239e-05 0.7008318 0.9300570843 2.001288e-06 TACS_10-20EEG 1.829956e-01 0.9461121 0.5085036507 2.266261e-02 TDCS_10-20EEG 3.798796e-03 0.8090810 0.8195288519 1.236430e-04 TDCS_10-20EG 6.452218e-01 0.7904665 0.5082153589 2.788128e-01 ITBS_CM ITBS_NA ITBS_NEURONAV LF-RTMS_10-10EEG CTBS_10-20EEG 0.921352176 0.8087981 0.269026665 0.7095246 CTBS_CM 0.878082671 0.7768346 0.262874312 0.6816162 CTBS_NEURONAV 0.951673305 0.9171562 0.385923810 0.8186400 DTMS_CM 0.592917769 0.8688526 0.352405458 0.9998360 HD-TDCS_10-10EEG 0.488405668 0.6875776 0.775841477 0.7892539 HD-TDCS_10-20EEG 0.954570180 0.8642727 0.119762276 0.7358818 HF-RTMS_10-20EEG 0.091886987 0.4449642 0.842840915 0.5688978 HF-RTMS_CM 0.063977515 0.3862235 0.988945199 0.5022795 HF-RTMS_NA 0.861572648 0.9851339 0.419342201 0.8811725 HF-RTMS_NEURONAV 0.801754783 0.7110716 0.040232090 0.5893229 ITBS_10-20EEG 0.005502353 0.1263803 0.261716950 0.1836719 ITBS_CM NaN 0.8362287 0.111968291 0.7102384 ITBS_NA 0.836228736 NaN 0.410860656 0.8926484 ITBS_NEURONAV 0.111968291 0.4108607 NaN 0.5224166 LF-RTMS_10-10EEG 0.710238382 0.8926484 0.522416617 NaN LF-RTMS_10-20EEG 0.876569112 0.8954761 0.075696764 0.7571276 LF-RTMS_CM 0.933198103 0.8842493 0.154704214 0.7581751 LF-RTMS_NEURONAV 0.711446767 0.6606898 0.402214561 0.6092787 SHAM 0.701170028 0.6639225 0.006977467 0.5387087 TACS_10-20EEG 0.706756978 0.9625308 0.246845287 0.9046782 TDCS_10-20EEG 0.921764140 0.7782345 0.031540496 0.6457734 TDCS_10-20EG 0.616483259 0.7988684 0.656924063 0.9009681 LF-RTMS_10-20EEG LF-RTMS_CM LF-RTMS_NEURONAV SHAM CTBS_10-20EEG 0.8460874107 0.87923328 0.7605794 9.328469e-01 CTBS_CM 0.8043428049 0.83867298 0.7828459 9.880168e-01 CTBS_NEURONAV 0.9868021931 0.99339342 0.7106961 8.075395e-01 DTMS_CM 0.6271124044 0.66482278 0.5903621 2.960710e-01 HD-TDCS_10-10EEG 0.5133442664 0.53210115 0.5111794 3.357970e-01 HD-TDCS_10-20EEG 0.9286809317 0.97539749 0.6985842 6.332434e-01 HF-RTMS_10-20EEG 0.0381219055 0.14149132 0.4238825 1.145029e-04 HF-RTMS_CM 0.0220931011 0.10361444 0.3984633 4.061239e-05 HF-RTMS_NA 0.9203143159 0.90706274 0.6710181 7.008318e-01 HF-RTMS_NEURONAV 0.6113646227 0.74230483 0.7598086 9.300571e-01 ITBS_10-20EEG 0.0009364137 0.01141776 0.2512755 2.001288e-06 ITBS_CM 0.8765691122 0.93319810 0.7114468 7.011700e-01 ITBS_NA 0.8954760545 0.88424928 0.6606898 6.639225e-01 ITBS_NEURONAV 0.0756967636 0.15470421 0.4022146 6.977467e-03 LF-RTMS_10-10EEG 0.7571275727 0.75817514 0.6092787 5.387087e-01 LF-RTMS_10-20EEG NaN 0.96361815 0.6786289 3.549901e-01 LF-RTMS_CM 0.9636181458 NaN 0.6932493 6.441216e-01 LF-RTMS_NEURONAV 0.6786289241 0.69324933 NaN 7.677362e-01 SHAM 0.3549901202 0.64412162 0.7677362 NaN TACS_10-20EEG 0.7648071986 0.78166894 0.6279336 3.788085e-01 TDCS_10-20EEG 0.7093603550 0.84589605 0.7241804 5.724781e-01 TDCS_10-20EG 0.6530929004 0.66057854 0.5654082 4.618996e-01 TACS_10-20EEG TDCS_10-20EEG TDCS_10-20EG CTBS_10-20EEG 0.73181578 0.957227424 0.6305425 CTBS_CM 0.69852380 0.908853802 0.6065331 CTBS_NEURONAV 0.86740546 0.909051771 0.7347799 DTMS_CM 0.86509363 0.458652901 0.8815807 HD-TDCS_10-10EEG 0.65639724 0.421443017 0.8931389 HD-TDCS_10-20EEG 0.74428489 0.862081898 0.6388020 HF-RTMS_10-20EEG 0.24277043 0.007629396 0.7143608 HF-RTMS_CM 0.18299563 0.003798796 0.6452218 HF-RTMS_NA 0.94611212 0.809080959 0.7904665 HF-RTMS_NEURONAV 0.50850365 0.819528852 0.5082154 ITBS_10-20EEG 0.02266261 0.000123643 0.2788128 ITBS_CM 0.70675698 0.921764140 0.6164833 ITBS_NA 0.96253078 0.778234535 0.7988684 ITBS_NEURONAV 0.24684529 0.031540496 0.6569241 LF-RTMS_10-10EEG 0.90467816 0.645773446 0.9009681 LF-RTMS_10-20EEG 0.76480720 0.709360355 0.6530929 LF-RTMS_CM 0.78166894 0.845896046 0.6605785 LF-RTMS_NEURONAV 0.62793356 0.724180449 0.5654082 SHAM 0.37880852 0.572478135 0.4618996 TACS_10-20EEG NaN 0.572730849 0.7920921 TDCS_10-20EEG 0.57273085 NaN 0.5549554 TDCS_10-20EG 0.79209210 0.554955365 NaN

Quantifying heterogeneity / inconsistency: I^2 = 82.1% [78.4%; 85.1%]

Tests of heterogeneity (within designs) and inconsistency (between designs): [1] 496.6347

Details of network meta-analysis methods:

  • Calculation of I^2 based on Q

Generating Forest Plot for: negative_symptoms Generating Network Graph for: negative_symptoms Calculating SUCRA/P-score values for: negative_symptoms Mean rank column not found in netrank results. SUCRA/P-score Results: Treatment SUCRA 1 SHAM 73.4 2 HF-RTMS_NEURONAV 69.6 3 LF-RTMS_NEURONAV 69.0 4 TDCS_10-20EEG 65.4 5 CTBS_CM 64.6 6 CTBS_10-20EEG 63.0 7 ITBS_CM 62.2 8 HD-TDCS_10-20EEG 60.6 9 LF-RTMS_CM 59.5 10 LF-RTMS_10-20EEG 58.3 11 CTBS_NEURONAV 57.1 12 HF-RTMS_NA 53.6 13 ITBS_NA 52.9 14 TACS_10-20EEG 50.9 15 LF-RTMS_10-10EEG 47.1 16 DTMS_CM 45.8 17 TDCS_10-20EG 41.9 18 HD-TDCS_10-10EEG 35.9 19 HF-RTMS_10-20EEG 23.0 20 ITBS_NEURONAV 21.0 21 HF-RTMS_CM 19.9 22 ITBS_10-20EEG 5.3 Skipping Split Analysis (Direct vs Indirect) for: negative_symptoms - Requires at least 3 treatments or k.trts is missing/invalid.

— Generating League Table for: negative_symptoms — League Table (Model: random ):
League Table: negative_symptoms ( random effects)
CTBS_10-20EEG CTBS_CM CTBS_NEURONAV DTMS_CM HD-TDCS_10-10EEG HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM HF-RTMS_NA HF-RTMS_NEURONAV ITBS_10-20EEG ITBS_CM ITBS_NA ITBS_NEURONAV LF-RTMS_10-10EEG LF-RTMS_10-20EEG LF-RTMS_CM LF-RTMS_NEURONAV SHAM TACS_10-20EEG TDCS_10-20EEG TDCS_10-20EG
CTBS_10-20EEG CTBS_10-20EEG . . . . . . . . . . . . . . . . . 0.32 [ -7.12, 7.76] . . .
CTBS_CM 0.26 [-10.54, 11.06] CTBS_CM . . . . . . . . . . . . . . . . 0.06 [ -7.77, 7.89] . . .
CTBS_NEURONAV -0.70 [-11.78, 10.38] -0.96 [-12.30, 10.38] CTBS_NEURONAV . . . . . . . . . . . . . . . 1.02 [ -7.19, 9.23] . . .
DTMS_CM -1.99 [-10.60, 6.62] -2.25 [-11.20, 6.70] -1.29 [-10.57, 7.99] DTMS_CM . . . . . . . . . . . . . . 2.31 [ -2.02, 6.64] . . .
HD-TDCS_10-10EEG -3.44 [-14.11, 7.24] -3.70 [-14.65, 7.25] -2.74 [-13.96, 8.48] -1.45 [-10.24, 7.34] HD-TDCS_10-10EEG . . . . . . . . . . . . . 3.76 [ -3.89, 11.41] . . .
HD-TDCS_10-20EEG -0.57 [ -8.87, 7.73] -0.83 [ -9.48, 7.81] 0.13 [ -8.86, 9.12] 1.42 [ -4.26, 7.09] 2.86 [ -5.62, 11.35] HD-TDCS_10-20EEG . . . . . . . . . . . . 0.89 [ -2.78, 4.57] . . .
HF-RTMS_10-20EEG -4.23 [-12.03, 3.56] -4.49 [-12.66, 3.67] -3.53 [-12.06, 4.99] -2.24 [ -7.16, 2.67] -0.80 [ -8.79, 7.20] -3.66 [ -8.00, 0.68] HF-RTMS_10-20EEG . . . . . . . . . . . 4.55 [ 2.24, 6.87] . . .
HF-RTMS_CM -4.64 [-12.45, 3.17] -4.90 [-13.08, 3.28] -3.94 [-12.48, 4.60] -2.65 [ -7.59, 2.29] -1.20 [ -9.21, 6.81] -4.06 [ -8.43, 0.30] -0.40 [ -3.71, 2.91] HF-RTMS_CM . . . . . . . . . . 4.96 [ 2.59, 7.33] . . .
HF-RTMS_NA -1.18 [-11.86, 9.50] -1.44 [-12.39, 9.51] -0.48 [-11.70, 10.74] 0.81 [ -7.98, 9.60] 2.26 [ -8.56, 13.08] -0.61 [ -9.09, 7.88] 3.05 [ -4.94, 11.05] 3.46 [ -4.55, 11.47] HF-RTMS_NA . . . . . . . . . 1.50 [ -6.15, 9.15] . . .
HF-RTMS_NEURONAV 0.19 [ -7.80, 8.18] -0.07 [ -8.42, 8.28] 0.89 [ -7.81, 9.59] 2.18 [ -3.03, 7.39] 3.63 [ -4.56, 11.81] 0.76 [ -3.92, 5.44] 4.42 [ 0.71, 8.13] 4.83 [ 1.08, 8.57] 1.37 [ -6.81, 9.55] HF-RTMS_NEURONAV . . . . . . . . 0.13 [ -2.77, 3.03] . . .
ITBS_10-20EEG -7.44 [-15.54, 0.66] -7.70 [-16.15, 0.76] -6.74 [-15.54, 2.07] -5.45 [-10.83, -0.06] -4.00 [-12.29, 4.30] -6.86 [-11.73, -1.99] -3.20 [ -7.15, 0.74] -2.80 [ -6.78, 1.18] -6.26 [-14.55, 2.04] -7.63 [-11.94, -3.31] ITBS_10-20EEG . . . . . . . 7.76 [ 4.56, 10.95] . . .
ITBS_CM -0.42 [ -8.77, 7.93] -0.68 [ -9.38, 8.02] 0.28 [ -8.76, 9.32] 1.57 [ -4.18, 7.32] 3.02 [ -5.52, 11.55] 0.15 [ -5.12, 5.42] 3.81 [ -0.62, 8.25] 4.22 [ -0.25, 8.68] 0.76 [ -7.78, 9.30] -0.61 [ -5.38, 4.16] 7.02 [ 2.06, 11.97] ITBS_CM . . . . . . 0.74 [ -3.04, 4.52] . . .
ITBS_NA -1.28 [-11.65, 9.09] -1.54 [-12.19, 9.11] -0.58 [-11.51, 10.35] 0.71 [ -7.71, 9.13] 2.16 [ -8.36, 12.68] -0.71 [ -8.80, 7.39] 2.95 [ -4.63, 10.53] 3.36 [ -4.24, 10.95] -0.10 [-10.62, 10.42] -1.47 [ -9.25, 6.31] 6.16 [ -1.74, 14.05] -0.86 [ -9.01, 7.29] ITBS_NA . . . . . 1.60 [ -5.62, 8.82] . . .
ITBS_NEURONAV -4.67 [-12.95, 3.61] -4.93 [-13.56, 3.70] -3.97 [-12.94, 5.00] -2.68 [ -8.33, 2.97] -1.23 [ -9.70, 7.24] -4.09 [ -9.25, 1.06] -0.43 [ -4.73, 3.86] -0.03 [ -4.36, 4.30] -3.49 [-11.96, 4.98] -4.86 [ -9.50, -0.22] 2.77 [ -2.07, 7.60] -4.25 [ -9.49, 0.99] -3.39 [-11.46, 4.69] ITBS_NEURONAV . . . . 4.99 [ 1.36, 8.61] . . .
LF-RTMS_10-10EEG -1.99 [-12.46, 8.48] -2.25 [-13.00, 8.50] -1.29 [-12.32, 9.74] -0.00 [ -8.54, 8.54] 1.45 [ -9.17, 12.07] -1.42 [ -9.65, 6.81] 2.24 [ -5.48, 9.96] 2.65 [ -5.09, 10.38] -0.81 [-11.43, 9.81] -2.18 [-10.10, 5.74] 5.45 [ -2.58, 13.48] -1.57 [ -9.85, 6.71] -0.71 [-11.02, 9.60] 2.68 [ -5.53, 10.89] LF-RTMS_10-10EEG . . . 2.31 [ -5.05, 9.67] . . .
LF-RTMS_10-20EEG -0.77 [ -8.57, 7.02] -1.03 [ -9.20, 7.13] -0.07 [ -8.60, 8.45] 1.22 [ -3.69, 6.13] 2.67 [ -5.33, 10.66] -0.20 [ -4.54, 4.14] 3.46 [ 0.19, 6.73] 3.87 [ 0.56, 7.18] 0.41 [ -7.59, 8.40] -0.96 [ -4.67, 2.75] 6.66 [ 2.72, 10.61] -0.35 [ -4.79, 4.08] 0.51 [ -7.07, 8.09] 3.90 [ -0.40, 8.20] 1.22 [ -6.50, 8.94] LF-RTMS_10-20EEG . . 1.09 [ -1.22, 3.41] . . .
LF-RTMS_CM -0.66 [ -9.19, 7.87] -0.92 [ -9.79, 7.95] 0.04 [ -9.16, 9.24] 1.33 [ -4.68, 7.34] 2.78 [ -5.93, 11.49] -0.09 [ -5.64, 5.46] 3.57 [ -1.19, 8.34] 3.98 [ -0.81, 8.77] 0.52 [ -8.19, 9.23] -0.85 [ -5.93, 4.22] 6.78 [ 1.53, 12.02] -0.24 [ -5.87, 5.38] 0.62 [ -7.71, 8.95] 4.01 [ -1.51, 9.53] 1.33 [ -7.13, 9.79] 0.11 [ -4.65, 4.87] LF-RTMS_CM . 0.98 [ -3.18, 5.14] . . .
LF-RTMS_NEURONAV 2.95 [-16.02, 21.92] 2.69 [-16.44, 21.82] 3.65 [-15.64, 22.94] 4.94 [-13.04, 22.92] 6.39 [-12.67, 25.45] 3.52 [-14.31, 21.36] 7.18 [-10.42, 24.79] 7.59 [-10.03, 25.20] 4.13 [-14.93, 23.19] 2.76 [-14.93, 20.45] 10.39 [ -7.36, 28.13] 3.37 [-14.49, 21.23] 4.23 [-14.66, 23.12] 7.62 [-10.21, 25.44] 4.94 [-14.00, 23.88] 3.72 [-13.88, 21.33] 3.61 [-14.33, 21.55] LF-RTMS_NEURONAV -2.63 [-20.08, 14.82] . . .
SHAM 0.32 [ -7.12, 7.76] 0.06 [ -7.77, 7.89] 1.02 [ -7.19, 9.23] 2.31 [ -2.02, 6.64] 3.76 [ -3.89, 11.41] 0.89 [ -2.78, 4.57] 4.55 [ 2.24, 6.87] 4.96 [ 2.59, 7.33] 1.50 [ -6.15, 9.15] 0.13 [ -2.77, 3.03] 7.76 [ 4.56, 10.95] 0.74 [ -3.04, 4.52] 1.60 [ -5.62, 8.82] 4.99 [ 1.36, 8.61] 2.31 [ -5.05, 9.67] 1.09 [ -1.22, 3.41] 0.98 [ -3.18, 5.14] -2.63 [-20.08, 14.82] SHAM -1.80 [ -5.80, 2.21] -0.53 [ -2.37, 1.31] -3.00 [-10.99, 4.99]
TACS_10-20EEG -1.48 [ -9.93, 6.97] -1.74 [-10.53, 7.06] -0.78 [ -9.91, 8.35] 0.51 [ -5.39, 6.41] 1.96 [ -6.68, 10.60] -0.90 [ -6.34, 4.53] 2.76 [ -1.87, 7.38] 3.16 [ -1.49, 7.81] -0.30 [ -8.93, 8.34] -1.67 [ -6.61, 3.28] 5.96 [ 0.83, 11.08] -1.06 [ -6.57, 4.45] -0.20 [ -8.45, 8.06] 3.19 [ -2.21, 8.59] 0.51 [ -7.87, 8.89] -0.71 [ -5.33, 3.92] -0.82 [ -6.59, 4.96] -4.43 [-22.33, 13.48] -1.80 [ -5.80, 2.21] TACS_10-20EEG . .
TDCS_10-20EEG -0.21 [ -7.88, 7.46] -0.47 [ -8.51, 7.57] 0.49 [ -7.92, 8.90] 1.78 [ -2.93, 6.49] 3.23 [ -4.64, 11.10] 0.36 [ -3.74, 4.47] 4.02 [ 1.07, 6.98] 4.43 [ 1.43, 7.43] 0.97 [ -6.90, 8.84] -0.40 [ -3.84, 3.04] 7.23 [ 3.54, 10.92] 0.21 [ -4.00, 4.42] 1.07 [ -6.38, 8.52] 4.46 [ 0.39, 8.52] 1.78 [ -5.81, 9.37] 0.56 [ -2.39, 3.52] 0.45 [ -4.10, 5.00] -3.16 [-20.71, 14.39] -0.53 [ -2.37, 1.31] 1.27 [ -3.14, 5.67] TDCS_10-20EEG .
TDCS_10-20EG -2.68 [-13.60, 8.24] -2.94 [-14.13, 8.25] -1.98 [-13.44, 9.48] -0.69 [ -9.78, 8.40] 0.76 [-10.31, 11.82] -2.11 [-10.90, 6.69] 1.55 [ -6.77, 9.87] 1.96 [ -6.38, 10.29] -1.50 [-12.56, 9.56] -2.87 [-11.37, 5.63] 4.76 [ -3.85, 13.36] -2.26 [-11.10, 6.58] -1.40 [-12.17, 9.37] 1.99 [ -6.79, 10.76] -0.69 [-11.56, 10.18] -1.91 [-10.23, 6.41] -2.02 [-11.03, 6.99] -5.63 [-24.83, 13.57] -3.00 [-10.99, 4.99] -1.20 [-10.14, 7.74] -2.47 [-10.67, 5.73] TDCS_10-20EG

Interpretation Guide: - Comparisons are ‘Column Treatment’ vs ‘Row Treatment’. - Cells contain: MD [95% CI]. - Positive MD favors the column treatment (assuming positive TE = benefit after direction adjustment).

Generating Comparison-Adjusted Funnel Plot for: negative_symptoms Visual assessment of funnel plot asymmetry recommended. Asymmetry may suggest publication bias or other systematic differences between small and large studies.

Generating Rankogram for: negative_symptoms

— Performing Network Meta-Regression for: negative_symptoms using covariate: Overall_RoB_Level — !!! Error during netmetareg execution for negative_symptoms with covariate Overall_RoB_Level : object ‘netmetareg’ not found -> Double-check if the covariate ’ Overall_RoB_Level ’ exists in the data frame used by the nma_result object. — Meta-regression failed for: negative_symptoms using covariate: Overall_RoB_Level —

Skipping meta-regression for Diagnosis - ‘Diagnosis’ column not found or contains only NA values.

========================================================== Finished NMA Workflow for Domain: negative_symptoms ==========================================================

========================================================== Starting NMA Workflow for Domain: total_psychopathology ==========================================================

— Running Network Meta-Analysis for: total_psychopathology — Number of comparisons: 74 Number of unique studies (studlab): 74 Treatments included: ITBS_CM, LF-RTMS_NEURONAV, PRM-RTMS_NEURONAV, TDCS_10-20EEG, TACS_10-20EEG, ITBS_10-20EEG, LF-RTMS_10-20EEG, HF-RTMS_NEURONAV, HF-RTMS_10-20EEG, LF-RTMS_CM, DTMS_CM, HD-TDCS_10-20EEG, LF-RTMS_10-10EEG, HF-RTMS_CM, ITBS_NA, CTBS_CM, HF-RTMS_NA, CTBS_NEURONAV, CTBS_10-20EEG, ITBS_NEURONAV, SHAM Reference treatment: SHAM Model type: Random Effects (tau method: REML ) — NMA completed successfully for: total_psychopathology — Estimated heterogeneity (tau^2): 13.8512 I^2 statistic (overall inconsistency): 63.4% Cochran’s Q: 147.45 , df = 54 , p-value = 1.31e-10

— NMA Summary —

Results ( effects model): Number of studies: k = 74 Number of pairwise comparisons: m = 74 Number of treatments: n = 21 Number of designs: d = 20

Treatment estimates (sm = ‘MD’, comparison: other treatments vs ‘SHAM’): $TE CTBS_10-20EEG CTBS_CM CTBS_NEURONAV DTMS_CM CTBS_10-20EEG 0.0000000 -0.8600000 2.32000000 -2.147478573 CTBS_CM 0.8600000 0.0000000 3.18000000 -1.287478573 CTBS_NEURONAV -2.3200000 -3.1800000 0.00000000 -4.467478573 DTMS_CM 2.1474786 1.2874786 4.46747857 0.000000000 HD-TDCS_10-20EEG 0.2041868 -0.6558132 2.52418679 -1.943291782 HF-RTMS_10-20EEG 4.5155463 3.6555463 6.83554631 2.368067741 HF-RTMS_CM 2.8463853 1.9863853 5.16638531 0.698906739 HF-RTMS_NA -2.3927867 -3.2527867 -0.07278672 -4.540265292 HF-RTMS_NEURONAV -3.4975087 -4.3575087 -1.17750869 -5.644987260 ITBS_10-20EEG 2.7857905 1.9257905 5.10579054 0.638311965 ITBS_CM 2.1488248 1.2888248 4.46882484 0.001346268 ITBS_NA -0.4100000 -1.2700000 1.91000000 -2.557478573 ITBS_NEURONAV 10.5324865 9.6724865 12.85248647 8.385007897 LF-RTMS_10-10EEG 7.8200000 6.9600000 10.14000000 5.672521427 LF-RTMS_10-20EEG 7.0415237 6.1815237 9.36152370 4.894045129 LF-RTMS_CM -3.3275215 -4.1875215 -1.00752150 -5.475000074 LF-RTMS_NEURONAV -0.3100000 -1.1700000 2.01000000 -2.457478573 PRM-RTMS_NEURONAV 3.7600000 2.9000000 6.08000000 1.612521427 SHAM -2.1100000 -2.9700000 0.21000000 -4.257478573 TACS_10-20EEG 0.6280189 -0.2319811 2.94801887 -1.519459699 TDCS_10-20EEG -0.3279067 -1.1879067 1.99209330 -2.475385277 HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM HF-RTMS_NA CTBS_10-20EEG -0.2041868 -4.5155463 -2.84638531 2.39278672 CTBS_CM 0.6558132 -3.6555463 -1.98638531 3.25278672 CTBS_NEURONAV -2.5241868 -6.8355463 -5.16638531 0.07278672 DTMS_CM 1.9432918 -2.3680677 -0.69890674 4.54026529 HD-TDCS_10-20EEG 0.0000000 -4.3113595 -2.64219852 2.59697351 HF-RTMS_10-20EEG 4.3113595 0.0000000 1.66916100 6.90833303 HF-RTMS_CM 2.6421985 -1.6691610 0.00000000 5.23917203 HF-RTMS_NA -2.5969735 -6.9083330 -5.23917203 0.00000000 HF-RTMS_NEURONAV -3.7016955 -8.0130550 -6.34389400 -1.10472197 ITBS_10-20EEG 2.5816037 -1.7297558 -0.06059477 5.17857726 ITBS_CM 1.9446380 -2.3667215 -0.69756047 4.54161156 ITBS_NA -0.6141868 -4.9255463 -3.25638531 1.98278672 ITBS_NEURONAV 10.3282997 6.0169402 7.68610116 12.92527319 LF-RTMS_10-10EEG 7.6158132 3.3044537 4.97361469 10.21278672 LF-RTMS_10-20EEG 6.8373369 2.5259774 4.19513839 9.43431042 LF-RTMS_CM -3.5317083 -7.8430678 -6.17390681 -0.93473478 LF-RTMS_NEURONAV -0.5141868 -4.8255463 -3.15638531 2.08278672 PRM-RTMS_NEURONAV 3.5558132 -0.7555463 0.91361469 6.15278672 SHAM -2.3141868 -6.6255463 -4.95638531 0.28278672 TACS_10-20EEG 0.4238321 -3.8875274 -2.21836644 3.02080559 TDCS_10-20EEG -0.5320935 -4.8434530 -3.17429202 2.06488002 HF-RTMS_NEURONAV ITBS_10-20EEG ITBS_CM ITBS_NA CTBS_10-20EEG 3.4975087 -2.78579054 -2.148824841 0.4100000 CTBS_CM 4.3575087 -1.92579054 -1.288824841 1.2700000 CTBS_NEURONAV 1.1775087 -5.10579054 -4.468824841 -1.9100000 DTMS_CM 5.6449873 -0.63831197 -0.001346268 2.5574786 HD-TDCS_10-20EEG 3.7016955 -2.58160375 -1.944638050 0.6141868 HF-RTMS_10-20EEG 8.0130550 1.72975578 2.366721473 4.9255463 HF-RTMS_CM 6.3438940 0.06059477 0.697560471 3.2563853 HF-RTMS_NA 1.1047220 -5.17857726 -4.541611560 -1.9827867 HF-RTMS_NEURONAV 0.0000000 -6.28329923 -5.646333528 -3.0875087 ITBS_10-20EEG 6.2832992 0.00000000 0.636965697 3.1957905 ITBS_CM 5.6463335 -0.63696570 0.000000000 2.5588248 ITBS_NA 3.0875087 -3.19579054 -2.558824841 0.0000000 ITBS_NEURONAV 14.0299952 7.74669593 8.383661629 10.9424865 LF-RTMS_10-10EEG 11.3175087 5.03420946 5.671175159 8.2300000 LF-RTMS_10-20EEG 10.5390324 4.25573316 4.892698861 7.4515237 LF-RTMS_CM 0.1699872 -6.11331204 -5.476346342 -2.9175215 LF-RTMS_NEURONAV 3.1875087 -3.09579054 -2.458824841 0.1000000 PRM-RTMS_NEURONAV 7.2575087 0.97420946 1.611175159 4.1700000 SHAM 1.3875087 -4.89579054 -4.258824841 -1.7000000 TACS_10-20EEG 4.1255276 -2.15777166 -1.520805967 1.0380189 TDCS_10-20EEG 3.1696020 -3.11369724 -2.476731544 0.0820933 ITBS_NEURONAV LF-RTMS_10-10EEG LF-RTMS_10-20EEG LF-RTMS_CM CTBS_10-20EEG -10.532486 -7.8200000 -7.0415237 3.3275215 CTBS_CM -9.672486 -6.9600000 -6.1815237 4.1875215 CTBS_NEURONAV -12.852486 -10.1400000 -9.3615237 1.0075215 DTMS_CM -8.385008 -5.6725214 -4.8940451 5.4750001 HD-TDCS_10-20EEG -10.328300 -7.6158132 -6.8373369 3.5317083 HF-RTMS_10-20EEG -6.016940 -3.3044537 -2.5259774 7.8430678 HF-RTMS_CM -7.686101 -4.9736147 -4.1951384 6.1739068 HF-RTMS_NA -12.925273 -10.2127867 -9.4343104 0.9347348 HF-RTMS_NEURONAV -14.029995 -11.3175087 -10.5390324 -0.1699872 ITBS_10-20EEG -7.746696 -5.0342095 -4.2557332 6.1133120 ITBS_CM -8.383662 -5.6711752 -4.8926989 5.4763463 ITBS_NA -10.942486 -8.2300000 -7.4515237 2.9175215 ITBS_NEURONAV 0.000000 2.7124865 3.4909628 13.8600080 LF-RTMS_10-10EEG -2.712486 0.0000000 0.7784763 11.1475215 LF-RTMS_10-20EEG -3.490963 -0.7784763 0.0000000 10.3690452 LF-RTMS_CM -13.860008 -11.1475215 -10.3690452 0.0000000 LF-RTMS_NEURONAV -10.842486 -8.1300000 -7.3515237 3.0175215 PRM-RTMS_NEURONAV -6.772486 -4.0600000 -3.2815237 7.0875215 SHAM -12.642486 -9.9300000 -9.1515237 1.2175215 TACS_10-20EEG -9.904468 -7.1919811 -6.4135048 3.9555404 TDCS_10-20EEG -10.860393 -8.1479067 -7.3694304 2.9996148 LF-RTMS_NEURONAV PRM-RTMS_NEURONAV SHAM TACS_10-20EEG CTBS_10-20EEG 0.3100000 -3.7600000 2.1100000 -0.6280189 CTBS_CM 1.1700000 -2.9000000 2.9700000 0.2319811 CTBS_NEURONAV -2.0100000 -6.0800000 -0.2100000 -2.9480189 DTMS_CM 2.4574786 -1.6125214 4.2574786 1.5194597 HD-TDCS_10-20EEG 0.5141868 -3.5558132 2.3141868 -0.4238321 HF-RTMS_10-20EEG 4.8255463 0.7555463 6.6255463 3.8875274 HF-RTMS_CM 3.1563853 -0.9136147 4.9563853 2.2183664 HF-RTMS_NA -2.0827867 -6.1527867 -0.2827867 -3.0208056 HF-RTMS_NEURONAV -3.1875087 -7.2575087 -1.3875087 -4.1255276 ITBS_10-20EEG 3.0957905 -0.9742095 4.8957905 2.1577717 ITBS_CM 2.4588248 -1.6111752 4.2588248 1.5208060 ITBS_NA -0.1000000 -4.1700000 1.7000000 -1.0380189 ITBS_NEURONAV 10.8424865 6.7724865 12.6424865 9.9044676 LF-RTMS_10-10EEG 8.1300000 4.0600000 9.9300000 7.1919811 LF-RTMS_10-20EEG 7.3515237 3.2815237 9.1515237 6.4135048 LF-RTMS_CM -3.0175215 -7.0875215 -1.2175215 -3.9555404 LF-RTMS_NEURONAV 0.0000000 -4.0700000 1.8000000 -0.9380189 PRM-RTMS_NEURONAV 4.0700000 0.0000000 5.8700000 3.1319811 SHAM -1.8000000 -5.8700000 0.0000000 -2.7380189 TACS_10-20EEG 0.9380189 -3.1319811 2.7380189 0.0000000 TDCS_10-20EEG -0.0179067 -4.0879067 1.7820933 -0.9559256 TDCS_10-20EEG CTBS_10-20EEG 0.3279067 CTBS_CM 1.1879067 CTBS_NEURONAV -1.9920933 DTMS_CM 2.4753853 HD-TDCS_10-20EEG 0.5320935 HF-RTMS_10-20EEG 4.8434530 HF-RTMS_CM 3.1742920 HF-RTMS_NA -2.0648800 HF-RTMS_NEURONAV -3.1696020 ITBS_10-20EEG 3.1136972 ITBS_CM 2.4767315 ITBS_NA -0.0820933 ITBS_NEURONAV 10.8603932 LF-RTMS_10-10EEG 8.1479067 LF-RTMS_10-20EEG 7.3694304 LF-RTMS_CM -2.9996148 LF-RTMS_NEURONAV 0.0179067 PRM-RTMS_NEURONAV 4.0879067 SHAM -1.7820933 TACS_10-20EEG 0.9559256 TDCS_10-20EEG 0.0000000

$seTE CTBS_10-20EEG CTBS_CM CTBS_NEURONAV DTMS_CM CTBS_10-20EEG 0.000000 6.926986 7.536658 5.660757 CTBS_CM 6.926986 0.000000 8.135392 6.436424 CTBS_NEURONAV 7.536658 8.135392 0.000000 7.088416 DTMS_CM 5.660757 6.436424 7.088416 0.000000 HD-TDCS_10-20EEG 5.056733 5.912185 6.616042 4.360615 HF-RTMS_10-20EEG 4.731238 5.636311 6.370721 3.978571 HF-RTMS_CM 4.691694 5.603158 6.341408 3.931464 HF-RTMS_NA 5.390051 6.199680 6.874163 4.743107 HF-RTMS_NEURONAV 4.935439 5.808782 6.523805 4.219357 ITBS_10-20EEG 4.830343 5.719755 6.444663 4.095928 ITBS_CM 5.449264 6.251229 6.920690 4.810291 ITBS_NA 5.834366 6.589629 7.227814 5.242542 ITBS_NEURONAV 5.678705 6.452215 7.102757 5.068739 LF-RTMS_10-10EEG 6.129195 6.852038 7.467831 5.568793 LF-RTMS_10-20EEG 4.855965 5.741409 6.463889 4.126114 LF-RTMS_CM 5.399291 6.207715 6.881410 4.753605 LF-RTMS_NEURONAV 7.237240 7.858819 8.401138 6.769199 PRM-RTMS_NEURONAV 7.444222 8.049834 8.580088 6.990054 SHAM 4.393163 5.355676 6.123834 3.569915 TACS_10-20EEG 5.325691 6.143808 6.823815 4.669840 TDCS_10-20EEG 4.609174 5.534245 6.280601 3.832610 HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM HF-RTMS_NA CTBS_10-20EEG 5.056733 4.731238 4.691694 5.390051 CTBS_CM 5.912185 5.636311 5.603158 6.199680 CTBS_NEURONAV 6.616042 6.370721 6.341408 6.874163 DTMS_CM 4.360615 3.978571 3.931464 4.743107 HD-TDCS_10-20EEG 0.000000 3.058661 2.997130 4.002929 HF-RTMS_10-20EEG 3.058661 0.000000 2.407665 3.582946 HF-RTMS_CM 2.997130 2.407665 0.000000 3.530564 HF-RTMS_NA 4.002929 3.582946 3.530564 0.000000 HF-RTMS_NEURONAV 3.365911 2.853668 2.787615 3.848565 ITBS_10-20EEG 3.209830 2.667784 2.597008 3.712830 ITBS_CM 4.082312 3.671422 3.620320 4.488582 ITBS_NA 4.583734 4.221929 4.177567 4.949012 ITBS_NEURONAV 4.383890 4.004067 3.957264 4.764513 LF-RTMS_10-10EEG 4.953568 4.620811 4.580314 5.293385 LF-RTMS_10-20EEG 3.248260 2.713901 2.644360 3.746103 LF-RTMS_CM 4.015363 3.596832 3.544655 4.427780 LF-RTMS_NEURONAV 6.272834 6.013527 5.982465 6.544504 PRM-RTMS_NEURONAV 6.510548 6.261094 6.231266 6.772690 SHAM 2.504131 1.756342 1.646850 3.122942 TACS_10-20EEG 3.915838 3.485376 3.431505 4.337728 TDCS_10-20EEG 2.866231 2.242620 2.157944 3.420143 HF-RTMS_NEURONAV ITBS_10-20EEG ITBS_CM ITBS_NA CTBS_10-20EEG 4.935439 4.830343 5.449264 5.834366 CTBS_CM 5.808782 5.719755 6.251229 6.589629 CTBS_NEURONAV 6.523805 6.444663 6.920690 7.227814 DTMS_CM 4.219357 4.095928 4.810291 5.242542 HD-TDCS_10-20EEG 3.365911 3.209830 4.082312 4.583734 HF-RTMS_10-20EEG 2.853668 2.667784 3.671422 4.221929 HF-RTMS_CM 2.787615 2.597008 3.620320 4.177567 HF-RTMS_NA 3.848565 3.712830 4.488582 4.949012 HF-RTMS_NEURONAV 0.000000 3.015131 3.931067 4.449565 ITBS_10-20EEG 3.015131 0.000000 3.798281 4.332699 ITBS_CM 3.931067 3.798281 0.000000 5.013437 ITBS_NA 4.449565 4.332699 5.013437 0.000000 ITBS_NEURONAV 4.243407 4.120698 4.831399 5.261917 LF-RTMS_10-10EEG 4.829684 4.722234 5.353668 5.745181 LF-RTMS_10-20EEG 3.056011 2.883203 3.830812 4.361247 LF-RTMS_CM 3.861496 3.726231 4.499674 4.959074 LF-RTMS_NEURONAV 6.175472 6.091806 6.593358 6.915036 PRM-RTMS_NEURONAV 6.416794 6.336316 6.819909 7.131375 SHAM 2.249152 2.008067 3.224066 3.839264 TACS_10-20EEG 3.757898 3.618763 4.411090 4.878838 TDCS_10-20EEG 2.646373 2.444779 3.512721 4.084674 ITBS_NEURONAV LF-RTMS_10-10EEG LF-RTMS_10-20EEG LF-RTMS_CM CTBS_10-20EEG 5.678705 6.129195 4.855965 5.399291 CTBS_CM 6.452215 6.852038 5.741409 6.207715 CTBS_NEURONAV 7.102757 7.467831 6.463889 6.881410 DTMS_CM 5.068739 5.568793 4.126114 4.753605 HD-TDCS_10-20EEG 4.383890 4.953568 3.248260 4.015363 HF-RTMS_10-20EEG 4.004067 4.620811 2.713901 3.596832 HF-RTMS_CM 3.957264 4.580314 2.644360 3.544655 HF-RTMS_NA 4.764513 5.293385 3.746103 4.427780 HF-RTMS_NEURONAV 4.243407 4.829684 3.056011 3.861496 ITBS_10-20EEG 4.120698 4.722234 2.883203 3.726231 ITBS_CM 4.831399 5.353668 3.830812 4.499674 ITBS_NA 5.261917 5.745181 4.361247 4.959074 ITBS_NEURONAV 0.000000 5.587037 4.150704 4.774964 LF-RTMS_10-10EEG 5.587037 0.000000 4.748440 5.302794 LF-RTMS_10-20EEG 4.150704 4.748440 0.000000 3.759387 LF-RTMS_CM 4.774964 5.302794 3.759387 0.000000 LF-RTMS_NEURONAV 6.784216 7.165538 6.112143 6.552117 PRM-RTMS_NEURONAV 7.004597 7.374532 6.355870 6.780046 SHAM 3.598308 4.274010 2.068942 3.138864 TACS_10-20EEG 4.691581 5.227836 3.652894 4.349204 TDCS_10-20EEG 3.859071 4.495750 2.495021 3.434687 LF-RTMS_NEURONAV PRM-RTMS_NEURONAV SHAM TACS_10-20EEG CTBS_10-20EEG 7.237240 7.444222 4.393163 5.325691 CTBS_CM 7.858819 8.049834 5.355676 6.143808 CTBS_NEURONAV 8.401138 8.580088 6.123834 6.823815 DTMS_CM 6.769199 6.990054 3.569915 4.669840 HD-TDCS_10-20EEG 6.272834 6.510548 2.504131 3.915838 HF-RTMS_10-20EEG 6.013527 6.261094 1.756342 3.485376 HF-RTMS_CM 5.982465 6.231266 1.646850 3.431505 HF-RTMS_NA 6.544504 6.772690 3.122942 4.337728 HF-RTMS_NEURONAV 6.175472 6.416794 2.249152 3.757898 ITBS_10-20EEG 6.091806 6.336316 2.008067 3.618763 ITBS_CM 6.593358 6.819909 3.224066 4.411090 ITBS_NA 6.915036 7.131375 3.839264 4.878838 ITBS_NEURONAV 6.784216 7.004597 3.598308 4.691581 LF-RTMS_10-10EEG 7.165538 7.374532 4.274010 5.227836 LF-RTMS_10-20EEG 6.112143 6.355870 2.068942 3.652894 LF-RTMS_CM 6.552117 6.780046 3.138864 4.349204 LF-RTMS_NEURONAV 0.000000 8.318313 5.751328 6.491601 PRM-RTMS_NEURONAV 8.318313 0.000000 6.009706 6.721583 SHAM 5.751328 6.009706 0.000000 3.010500 TACS_10-20EEG 6.491601 6.721583 3.010500 0.000000 TDCS_10-20EEG 5.917971 6.169374 1.394492 3.317789 TDCS_10-20EEG CTBS_10-20EEG 4.609174 CTBS_CM 5.534245 CTBS_NEURONAV 6.280601 DTMS_CM 3.832610 HD-TDCS_10-20EEG 2.866231 HF-RTMS_10-20EEG 2.242620 HF-RTMS_CM 2.157944 HF-RTMS_NA 3.420143 HF-RTMS_NEURONAV 2.646373 ITBS_10-20EEG 2.444779 ITBS_CM 3.512721 ITBS_NA 4.084674 ITBS_NEURONAV 3.859071 LF-RTMS_10-10EEG 4.495750 LF-RTMS_10-20EEG 2.495021 LF-RTMS_CM 3.434687 LF-RTMS_NEURONAV 5.917971 PRM-RTMS_NEURONAV 6.169374 SHAM 1.394492 TACS_10-20EEG 3.317789 TDCS_10-20EEG 0.000000

$lower CTBS_10-20EEG CTBS_CM CTBS_NEURONAV DTMS_CM CTBS_10-20EEG 0.0000000 -14.436643 -12.451579 -13.242358 CTBS_CM -12.7166434 0.000000 -12.765075 -13.902638 CTBS_NEURONAV -17.0915791 -19.125075 0.000000 -18.360518 DTMS_CM -8.9474013 -11.327681 -9.425561 0.000000 HD-TDCS_10-20EEG -9.7068278 -12.243483 -10.443018 -10.489941 HF-RTMS_10-20EEG -4.7575099 -7.391420 -5.650837 -5.429789 HF-RTMS_CM -6.3491659 -8.995602 -7.262547 -7.006621 HF-RTMS_NA -12.9570917 -15.403936 -13.545898 -13.836584 HF-RTMS_NEURONAV -13.1707917 -15.742511 -13.963931 -13.914776 ITBS_10-20EEG -6.6815074 -9.284723 -7.525516 -7.389560 ITBS_CM -8.5315364 -10.963359 -9.095478 -9.426650 ITBS_NA -11.8451471 -14.185435 -12.256255 -12.832671 ITBS_NEURONAV -0.5975718 -2.973623 -1.068662 -1.549537 LF-RTMS_10-10EEG -4.1930024 -6.469747 -4.496680 -5.242112 LF-RTMS_10-20EEG -2.4759935 -5.071432 -3.307467 -3.192989 LF-RTMS_CM -13.9099373 -16.354419 -14.494838 -14.791894 LF-RTMS_NEURONAV -14.4947301 -16.573001 -14.455927 -15.724866 PRM-RTMS_NEURONAV -10.8304067 -12.877384 -10.736663 -12.087733 SHAM -10.7204403 -13.466931 -11.792494 -11.254383 TACS_10-20EEG -9.8101446 -12.273623 -10.426413 -10.672178 TDCS_10-20EEG -9.3617219 -12.034828 -10.317659 -9.987164 HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM HF-RTMS_NA CTBS_10-20EEG -10.1152014 -13.788603 -12.04193655 -8.1715183 CTBS_CM -10.9318567 -14.702512 -12.96837259 -8.8983623 CTBS_NEURONAV -15.4913914 -19.321929 -17.59531720 -13.4003245 DTMS_CM -6.6033570 -10.165924 -8.40443448 -4.7560531 HD-TDCS_10-20EEG 0.0000000 -10.306225 -8.51646520 -5.2486231 HF-RTMS_10-20EEG -1.6835065 0.000000 -3.04977634 -0.1141129 HF-RTMS_CM -3.2320682 -6.388098 0.00000000 -1.6806067 HF-RTMS_NA -10.4425702 -13.930779 -12.15895080 0.0000000 HF-RTMS_NEURONAV -10.2987592 -13.606141 -11.80751929 -8.6477704 ITBS_10-20EEG -3.7095469 -6.958516 -5.15063678 -2.0984349 ITBS_CM -6.0565471 -9.562576 -7.79325742 -4.2558479 ITBS_NA -9.5981411 -13.200375 -11.44426583 -7.7170981 ITBS_NEURONAV 1.7360332 -1.830888 -0.06999284 3.5869986 LF-RTMS_10-10EEG -2.0930010 -5.752170 -4.00363574 -0.1620580 LF-RTMS_10-20EEG 0.4708639 -2.793171 -0.98771129 2.0920827 LF-RTMS_CM -11.4016747 -14.892730 -13.12130361 -9.6130238 LF-RTMS_NEURONAV -12.8087146 -16.611842 -14.88180065 -10.7442060 PRM-RTMS_NEURONAV -9.2046262 -13.027065 -11.29944249 -7.1214418 SHAM -7.2221934 -10.067913 -8.18415238 -5.8380676 TACS_10-20EEG -7.2510687 -10.718740 -8.94399308 -5.4809843 TDCS_10-20EEG -6.1498033 -9.238908 -7.40378549 -4.6384768 HF-RTMS_NEURONAV ITBS_10-20EEG ITBS_CM ITBS_NA CTBS_10-20EEG -6.1757743 -12.2530884 -12.829186 -11.0251471 CTBS_CM -7.0274940 -13.1363040 -13.541008 -11.6454354 CTBS_NEURONAV -11.6089134 -17.7370975 -18.033127 -16.0762548 DTMS_CM -2.6248010 -8.6661837 -9.429342 -7.7177141 HD-TDCS_10-20EEG -2.8953682 -8.8727544 -9.945823 -8.3697676 HF-RTMS_10-20EEG 2.4199691 -3.4990048 -4.829133 -3.3492828 HF-RTMS_CM 0.8802687 -5.0294472 -6.398136 -4.9314952 HF-RTMS_NA -6.4383264 -12.4555894 -13.339071 -11.6826715 HF-RTMS_NEURONAV 0.0000000 -12.1928481 -13.351082 -11.8084965 ITBS_10-20EEG 0.3737503 0.0000000 -6.807528 -5.2961441 ITBS_CM -2.0584154 -8.0814591 0.000000 -7.2673312 ITBS_NA -5.6334791 -11.6877252 -12.384981 0.0000000 ITBS_NEURONAV 5.7130706 -0.3297241 -1.085707 0.6293191 LF-RTMS_10-10EEG 1.8515029 -4.2211994 -4.821822 -3.0303487 LF-RTMS_10-20EEG 4.5493603 -1.3952400 -2.615556 -1.0963624 LF-RTMS_CM -7.3984052 -13.4165914 -14.295546 -12.6371279 LF-RTMS_NEURONAV -8.9161935 -15.0355113 -15.381569 -13.4532207 PRM-RTMS_NEURONAV -5.3191763 -11.4447411 -11.755602 -9.8072384 SHAM -3.0207473 -8.8315303 -10.577878 -9.2248194 TACS_10-20EEG -3.2398166 -9.2504172 -10.166383 -8.5243281 TDCS_10-20EEG -2.0171943 -7.9053757 -9.361539 -7.9237197 ITBS_NEURONAV LF-RTMS_10-10EEG LF-RTMS_10-20EEG LF-RTMS_CM CTBS_10-20EEG -21.66254 -19.833002 -16.559041 -7.2548943 CTBS_CM -22.31860 -20.389747 -17.434480 -7.9793765 CTBS_NEURONAV -26.77364 -24.776680 -22.030514 -12.4797951 DTMS_CM -18.31955 -16.587155 -12.981080 -3.8418942 HD-TDCS_10-20EEG -18.92057 -17.324627 -13.203810 -4.3382581 HF-RTMS_10-20EEG -13.86477 -12.361077 -7.845126 0.7934060 HF-RTMS_CM -15.44220 -13.950865 -9.377988 -0.7734900 HF-RTMS_NA -22.26355 -20.587631 -16.776538 -7.7435542 HF-RTMS_NEURONAV -22.34692 -20.783514 -16.528704 -7.7383795 ITBS_10-20EEG -15.82312 -14.289618 -9.906706 -1.1899673 ITBS_CM -17.85303 -16.164172 -12.400953 -3.3428530 ITBS_NA -21.25565 -19.490349 -15.999410 -6.8020849 ITBS_NEURONAV 0.00000 -8.237904 -4.644267 4.5012497 LF-RTMS_10-10EEG -13.66288 0.000000 -8.528295 0.7542358 LF-RTMS_10-20EEG -11.62619 -10.085248 0.000000 3.0007827 LF-RTMS_CM -23.21877 -21.540807 -17.737308 0.0000000 LF-RTMS_NEURONAV -24.13931 -22.174196 -19.331104 -9.8243914 PRM-RTMS_NEURONAV -20.50124 -18.513817 -15.738800 -6.2011251 SHAM -19.69504 -18.306905 -13.206576 -4.9345385 TACS_10-20EEG -19.09980 -17.438352 -13.573046 -4.5687435 TDCS_10-20EEG -18.42403 -16.959415 -12.259582 -3.7322480 LF-RTMS_NEURONAV PRM-RTMS_NEURONAV SHAM TACS_10-20EEG CTBS_10-20EEG -13.874730 -18.350407 -6.5004403 -11.0661823 CTBS_CM -14.233001 -18.677384 -7.5269312 -11.8096607 CTBS_NEURONAV -18.475927 -22.896663 -12.2124942 -16.3224512 DTMS_CM -10.809909 -15.312776 -2.7394263 -7.6332585 HD-TDCS_10-20EEG -11.780341 -16.316253 -2.5938198 -8.0987329 HF-RTMS_10-20EEG -6.960750 -11.515973 3.1831795 -2.9436850 HF-RTMS_CM -8.569030 -13.126672 1.7286182 -4.5072602 HF-RTMS_NA -14.909779 -19.427015 -6.4036411 -11.5225955 HF-RTMS_NEURONAV -15.291211 -19.834194 -5.7957647 -11.4908717 ITBS_10-20EEG -8.843930 -13.393160 0.9600508 -4.9348739 ITBS_CM -10.463919 -14.977952 -2.0602285 -7.1247714 ITBS_NA -13.653221 -18.147238 -5.8248194 -10.6003659 ITBS_NEURONAV -2.454333 -6.956272 5.5899328 0.7091379 LF-RTMS_10-10EEG -5.914196 -10.393817 1.5530945 -3.0543899 LF-RTMS_10-20EEG -4.628056 -9.175753 5.0964712 -0.7460359 LF-RTMS_CM -15.859434 -20.376168 -7.3695815 -12.4798242 LF-RTMS_NEURONAV 0.000000 -20.373594 -9.4723948 -13.6613226 PRM-RTMS_NEURONAV -12.233594 0.000000 -5.9088066 -10.0420789 SHAM -13.072395 -17.648807 0.0000000 -8.6384912 TACS_10-20EEG -11.785285 -16.306041 -3.1624534 0.0000000 TDCS_10-20EEG -11.616916 -16.179657 -0.9510614 -7.4586718 TDCS_10-20EEG CTBS_10-20EEG -8.7059085 CTBS_CM -9.6590145 CTBS_NEURONAV -14.3018456 DTMS_CM -5.0363930 HD-TDCS_10-20EEG -5.0856163 HF-RTMS_10-20EEG 0.4479981 HF-RTMS_CM -1.0552015 HF-RTMS_NA -8.7682368 HF-RTMS_NEURONAV -8.3563983 ITBS_10-20EEG -1.6779812 ITBS_CM -4.4080756 ITBS_NA -8.0879063 ITBS_NEURONAV 3.2967533 LF-RTMS_10-10EEG -0.6636017 LF-RTMS_10-20EEG 2.4792785 LF-RTMS_CM -9.7314776 LF-RTMS_NEURONAV -11.5811027 PRM-RTMS_NEURONAV -8.0038434 SHAM -4.5152480 TACS_10-20EEG -5.5468206 TDCS_10-20EEG 0.0000000

$upper CTBS_10-20EEG CTBS_CM CTBS_NEURONAV DTMS_CM CTBS_10-20EEG 0.000000 12.716643 17.09158 8.947401 CTBS_CM 14.436643 0.000000 19.12508 11.327681 CTBS_NEURONAV 12.451579 12.765075 0.00000 9.425561 DTMS_CM 13.242358 13.902638 18.36052 0.000000 HD-TDCS_10-20EEG 10.115201 10.931857 15.49139 6.603357 HF-RTMS_10-20EEG 13.788603 14.702512 19.32193 10.165924 HF-RTMS_CM 12.041937 12.968373 17.59532 8.404434 HF-RTMS_NA 8.171518 8.898362 13.40032 4.756053 HF-RTMS_NEURONAV 6.175774 7.027494 11.60891 2.624801 ITBS_10-20EEG 12.253088 13.136304 17.73710 8.666184 ITBS_CM 12.829186 13.541008 18.03313 9.429342 ITBS_NA 11.025147 11.645435 16.07625 7.717714 ITBS_NEURONAV 21.662545 22.318596 26.77364 18.319553 LF-RTMS_10-10EEG 19.833002 20.389747 24.77668 16.587155 LF-RTMS_10-20EEG 16.559041 17.434480 22.03051 12.981080 LF-RTMS_CM 7.254894 7.979376 12.47980 3.841894 LF-RTMS_NEURONAV 13.874730 14.233001 18.47593 10.809909 PRM-RTMS_NEURONAV 18.350407 18.677384 22.89666 15.312776 SHAM 6.500440 7.526931 12.21249 2.739426 TACS_10-20EEG 11.066182 11.809661 16.32245 7.633259 TDCS_10-20EEG 8.705908 9.659014 14.30185 5.036393 HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM HF-RTMS_NA CTBS_10-20EEG 9.706828 4.7575099 6.3491659 12.957092 CTBS_CM 12.243483 7.3914195 8.9956020 15.403936 CTBS_NEURONAV 10.443018 5.6508366 7.2625466 13.545898 DTMS_CM 10.489941 5.4297888 7.0066210 13.836584 HD-TDCS_10-20EEG 0.000000 1.6835065 3.2320682 10.442570 HF-RTMS_10-20EEG 10.306225 0.0000000 6.3880983 13.930779 HF-RTMS_CM 8.516465 3.0497763 0.0000000 12.158951 HF-RTMS_NA 5.248623 0.1141129 1.6806067 0.000000 HF-RTMS_NEURONAV 2.895368 -2.4199691 -0.8802687 6.438326 ITBS_10-20EEG 8.872754 3.4990048 5.0294472 12.455589 ITBS_CM 9.945823 4.8291332 6.3981365 13.339071 ITBS_NA 8.369768 3.3492828 4.9314952 11.682672 ITBS_NEURONAV 18.920566 13.8647681 15.4421952 22.263548 LF-RTMS_10-10EEG 17.324627 12.3610775 13.9508651 20.587631 LF-RTMS_10-20EEG 13.203810 7.8451258 9.3779881 16.776538 LF-RTMS_CM 4.338258 -0.7934060 0.7734900 7.743554 LF-RTMS_NEURONAV 11.780341 6.9607497 8.5690300 14.909779 PRM-RTMS_NEURONAV 16.316253 11.5159725 13.1266719 19.427015 SHAM 2.593820 -3.1831795 -1.7286182 6.403641 TACS_10-20EEG 8.098733 2.9436850 4.5072602 11.522595 TDCS_10-20EEG 5.085616 -0.4479981 1.0552015 8.768237 HF-RTMS_NEURONAV ITBS_10-20EEG ITBS_CM ITBS_NA CTBS_10-20EEG 13.170792 6.6815074 8.531536 11.845147 CTBS_CM 15.742511 9.2847229 10.963359 14.185435 CTBS_NEURONAV 13.963931 7.5255164 9.095478 12.256255 DTMS_CM 13.914776 7.3895598 9.426650 12.832671 HD-TDCS_10-20EEG 10.298759 3.7095469 6.056547 9.598141 HF-RTMS_10-20EEG 13.606141 6.9585163 9.562576 13.200375 HF-RTMS_CM 11.807519 5.1506368 7.793257 11.444266 HF-RTMS_NA 8.647770 2.0984349 4.255848 7.717098 HF-RTMS_NEURONAV 0.000000 -0.3737503 2.058415 5.633479 ITBS_10-20EEG 12.192848 0.0000000 8.081459 11.687725 ITBS_CM 13.351082 6.8075277 0.000000 12.384981 ITBS_NA 11.808496 5.2961441 7.267331 0.000000 ITBS_NEURONAV 22.346920 15.8231160 17.853031 21.255654 LF-RTMS_10-10EEG 20.783514 14.2896183 16.164172 19.490349 LF-RTMS_10-20EEG 16.528704 9.9067063 12.400953 15.999410 LF-RTMS_CM 7.738380 1.1899673 3.342853 6.802085 LF-RTMS_NEURONAV 15.291211 8.8439302 10.463919 13.653221 PRM-RTMS_NEURONAV 19.834194 13.3931600 14.977952 18.147238 SHAM 5.795765 -0.9600508 2.060228 5.824819 TACS_10-20EEG 11.490872 4.9348739 7.124771 10.600366 TDCS_10-20EEG 8.356398 1.6779812 4.408076 8.087906 ITBS_NEURONAV LF-RTMS_10-10EEG LF-RTMS_10-20EEG LF-RTMS_CM CTBS_10-20EEG 0.59757176 4.1930024 2.4759935 13.909937 CTBS_CM 2.97362274 6.4697472 5.0714321 16.354419 CTBS_NEURONAV 1.06866224 4.4966804 3.3074667 14.494838 DTMS_CM 1.54953745 5.2421120 3.1929894 14.791894 HD-TDCS_10-20EEG -1.73603324 2.0930010 -0.4708639 11.401675 HF-RTMS_10-20EEG 1.83088777 5.7521701 2.7931710 14.892730 HF-RTMS_CM 0.06999284 4.0036357 0.9877113 13.121304 HF-RTMS_NA -3.58699863 0.1620580 -2.0920827 9.613024 HF-RTMS_NEURONAV -5.71307056 -1.8515029 -4.5493603 7.398405 ITBS_10-20EEG 0.32972414 4.2211994 1.3952400 13.416591 ITBS_CM 1.08570734 4.8218215 2.6155556 14.295546 ITBS_NA -0.62931912 3.0303487 1.0963624 12.637128 ITBS_NEURONAV 0.00000000 13.6628773 11.6261926 23.218766 LF-RTMS_10-10EEG 8.23790434 0.0000000 10.0852478 21.540807 LF-RTMS_10-20EEG 4.64426706 8.5282952 0.0000000 17.737308 LF-RTMS_CM -4.50124973 -0.7542358 -3.0007827 0.000000 LF-RTMS_NEURONAV 2.45433264 5.9141956 4.6280562 15.859434 PRM-RTMS_NEURONAV 6.95627164 10.3938172 9.1757527 20.376168 SHAM -5.58993276 -1.5530945 -5.0964712 7.369581 TACS_10-20EEG -0.70913795 3.0543899 0.7460359 12.479824 TDCS_10-20EEG -3.29675327 0.6636017 -2.4792785 9.731478 LF-RTMS_NEURONAV PRM-RTMS_NEURONAV SHAM TACS_10-20EEG CTBS_10-20EEG 14.494730 10.830407 10.720440 9.810145 CTBS_CM 16.573001 12.877384 13.466931 12.273623 CTBS_NEURONAV 14.455927 10.736663 11.792494 10.426413 DTMS_CM 15.724866 12.087733 11.254383 10.672178 HD-TDCS_10-20EEG 12.808715 9.204626 7.222193 7.251069 HF-RTMS_10-20EEG 16.611842 13.027065 10.067913 10.718740 HF-RTMS_CM 14.881801 11.299442 8.184152 8.943993 HF-RTMS_NA 10.744206 7.121442 5.838068 5.480984 HF-RTMS_NEURONAV 8.916193 5.319176 3.020747 3.239817 ITBS_10-20EEG 15.035511 11.444741 8.831530 9.250417 ITBS_CM 15.381569 11.755602 10.577878 10.166383 ITBS_NA 13.453221 9.807238 9.224819 8.524328 ITBS_NEURONAV 24.139306 20.501245 19.695040 19.099797 LF-RTMS_10-10EEG 22.174196 18.513817 18.306905 17.438352 LF-RTMS_10-20EEG 19.331104 15.738800 13.206576 13.573046 LF-RTMS_CM 9.824391 6.201125 4.934538 4.568743 LF-RTMS_NEURONAV 0.000000 12.233594 13.072395 11.785285 PRM-RTMS_NEURONAV 20.373594 0.000000 17.648807 16.306041 SHAM 9.472395 5.908807 0.000000 3.162453 TACS_10-20EEG 13.661323 10.042079 8.638491 0.000000 TDCS_10-20EEG 11.581103 8.003843 4.515248 5.546821 TDCS_10-20EEG CTBS_10-20EEG 9.3617219 CTBS_CM 12.0348279 CTBS_NEURONAV 10.3176590 DTMS_CM 9.9871635 HD-TDCS_10-20EEG 6.1498033 HF-RTMS_10-20EEG 9.2389080 HF-RTMS_CM 7.4037855 HF-RTMS_NA 4.6384768 HF-RTMS_NEURONAV 2.0171943 ITBS_10-20EEG 7.9053757 ITBS_CM 9.3615387 ITBS_NA 7.9237197 ITBS_NEURONAV 18.4240331 LF-RTMS_10-10EEG 16.9594151 LF-RTMS_10-20EEG 12.2595823 LF-RTMS_CM 3.7322480 LF-RTMS_NEURONAV 11.6169161 PRM-RTMS_NEURONAV 16.1796568 SHAM 0.9510614 TACS_10-20EEG 7.4586718 TDCS_10-20EEG 0.0000000

$statistic CTBS_10-20EEG CTBS_CM CTBS_NEURONAV DTMS_CM CTBS_10-20EEG NaN -0.12415212 0.30782873 -0.3793624358 CTBS_CM 0.12415212 NaN 0.39088466 -0.2000301060 CTBS_NEURONAV -0.30782873 -0.39088466 NaN -0.6302506471 DTMS_CM 0.37936244 0.20003011 0.63025065 NaN HD-TDCS_10-20EEG 0.04037919 -0.11092569 0.38152519 -0.4456462387 HF-RTMS_10-20EEG 0.95441114 0.64857077 1.07296282 0.5952055480 HF-RTMS_CM 0.60668605 0.35451176 0.81470630 0.1777726435 HF-RTMS_NA -0.44392658 -0.52467012 -0.01058845 -0.9572344756 HF-RTMS_NEURONAV -0.70865197 -0.75015881 -0.18049417 -1.3378784708 ITBS_10-20EEG 0.57672730 0.33669110 0.79225100 0.1558406140 ITBS_CM 0.39433304 0.20617144 0.64571958 0.0002798724 ITBS_NA -0.07027327 -0.19272709 0.26425694 -0.4878318151 ITBS_NEURONAV 1.85473371 1.49909548 1.80950661 1.6542592447 LF-RTMS_10-10EEG 1.27586076 1.01575623 1.35782392 1.0186267625 LF-RTMS_10-20EEG 1.45007701 1.07665613 1.44828030 1.1861148998 LF-RTMS_CM -0.61628861 -0.67456728 -0.14641206 -1.1517575074 LF-RTMS_NEURONAV -0.04283401 -0.14887734 0.23925331 -0.3630382860 PRM-RTMS_NEURONAV 0.50508973 0.36025589 0.70861746 0.2306879780 SHAM -0.48029182 -0.55455189 0.03429224 -1.1925994199 TACS_10-20EEG 0.11792250 -0.03775853 0.43201914 -0.3253772498 TDCS_10-20EEG -0.07114218 -0.21464656 0.31718194 -0.6458744969 HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM HF-RTMS_NA CTBS_10-20EEG -0.04037919 -0.9544111 -0.60668605 0.44392658 CTBS_CM 0.11092569 -0.6485708 -0.35451176 0.52467012 CTBS_NEURONAV -0.38152519 -1.0729628 -0.81470630 0.01058845 DTMS_CM 0.44564624 -0.5952055 -0.17777264 0.95723448 HD-TDCS_10-20EEG NaN -1.4095577 -0.88157624 0.64876832 HF-RTMS_10-20EEG 1.40955768 NaN 0.69326952 1.92811508 HF-RTMS_CM 0.88157624 -0.6932695 NaN 1.48394751 HF-RTMS_NA -0.64876832 -1.9281151 -1.48394751 NaN HF-RTMS_NEURONAV -1.09976046 -2.8079846 -2.27574241 -0.28704778 ITBS_10-20EEG 0.80428060 -0.6483867 -0.02333253 1.39477917 ITBS_CM 0.47635700 -0.6446335 -0.19267923 1.01181428 ITBS_NA -0.13399267 -1.1666577 -0.77949329 0.40064296 ITBS_NEURONAV 2.35596691 1.5027070 1.94227680 2.71282128 LF-RTMS_10-10EEG 1.53744003 0.7151241 1.08586763 1.92934879 LF-RTMS_10-20EEG 2.10492277 0.9307551 1.58644774 2.51843299 LF-RTMS_CM -0.87954900 -2.1805486 -1.74175095 -0.21110688 LF-RTMS_NEURONAV -0.08197042 -0.8024486 -0.52760617 0.31824973 PRM-RTMS_NEURONAV 0.54616190 -0.1206732 0.14661783 0.90847015 SHAM -0.92414765 -3.7723557 -3.00961516 0.09055138 TACS_10-20EEG 0.10823536 -1.1153824 -0.64647037 0.69640279 TDCS_10-20EEG -0.18564221 -2.1597294 -1.47097946 0.60374087 HF-RTMS_NEURONAV ITBS_10-20EEG ITBS_CM ITBS_NA CTBS_10-20EEG 0.70865197 -0.57672730 -0.3943330365 0.07027327 CTBS_CM 0.75015881 -0.33669110 -0.2061714372 0.19272709 CTBS_NEURONAV 0.18049417 -0.79225100 -0.6457195817 -0.26425694 DTMS_CM 1.33787847 -0.15584061 -0.0002798724 0.48783182 HD-TDCS_10-20EEG 1.09976046 -0.80428060 -0.4763569992 0.13399267 HF-RTMS_10-20EEG 2.80798460 0.64838675 0.6446334828 1.16665774 HF-RTMS_CM 2.27574241 0.02333253 0.1926792266 0.77949329 HF-RTMS_NA 0.28704778 -1.39477917 -1.0118142784 -0.40064296 HF-RTMS_NEURONAV NaN -2.08392220 -1.4363362752 -0.69388996 ITBS_10-20EEG 2.08392220 NaN 0.1676984258 0.73759804 ITBS_CM 1.43633628 -0.16769843 NaN 0.51039333 ITBS_NA 0.69388996 -0.73759804 -0.5103933345 NaN ITBS_NEURONAV 3.30630450 1.87994741 1.7352449678 2.07956282 LF-RTMS_10-10EEG 2.34332303 1.06606520 1.0593064471 1.43250481 LF-RTMS_10-20EEG 3.44862351 1.47604377 1.2771961280 1.70857658 LF-RTMS_CM 0.04402107 -1.64061524 -1.2170539745 -0.58831982 LF-RTMS_NEURONAV 0.51615631 -0.50818927 -0.3729245144 0.01446124 PRM-RTMS_NEURONAV 1.13101788 0.15375015 0.2362458315 0.58473996 SHAM 0.61690316 -2.43806089 -1.3209483891 -0.44279319 TACS_10-20EEG 1.09782860 -0.59627324 -0.3447687516 0.21275944 TDCS_10-20EEG 1.19771539 -1.27361102 -0.7050748864 0.02009788 ITBS_NEURONAV LF-RTMS_10-10EEG LF-RTMS_10-20EEG LF-RTMS_CM CTBS_10-20EEG -1.8547337 -1.2758608 -1.4500770 0.61628861 CTBS_CM -1.4990955 -1.0157562 -1.0766561 0.67456728 CTBS_NEURONAV -1.8095066 -1.3578239 -1.4482803 0.14641206 DTMS_CM -1.6542592 -1.0186268 -1.1861149 1.15175751 HD-TDCS_10-20EEG -2.3559669 -1.5374400 -2.1049228 0.87954900 HF-RTMS_10-20EEG -1.5027070 -0.7151241 -0.9307551 2.18054864 HF-RTMS_CM -1.9422768 -1.0858676 -1.5864477 1.74175095 HF-RTMS_NA -2.7128213 -1.9293488 -2.5184330 0.21110688 HF-RTMS_NEURONAV -3.3063045 -2.3433230 -3.4486235 -0.04402107 ITBS_10-20EEG -1.8799474 -1.0660652 -1.4760438 1.64061524 ITBS_CM -1.7352450 -1.0593064 -1.2771961 1.21705397 ITBS_NA -2.0795628 -1.4325048 -1.7085766 0.58831982 ITBS_NEURONAV NaN 0.4854964 0.8410532 2.90264111 LF-RTMS_10-10EEG -0.4854964 NaN 0.1639436 2.10219765 LF-RTMS_10-20EEG -0.8410532 -0.1639436 NaN 2.75817469 LF-RTMS_CM -2.9026411 -2.1021976 -2.7581747 NaN LF-RTMS_NEURONAV -1.5981930 -1.1345974 -1.2027735 0.46054147 PRM-RTMS_NEURONAV -0.9668631 -0.5505434 -0.5162981 1.04535002 SHAM -3.5134533 -2.3233451 -4.4232860 0.38788606 TACS_10-20EEG -2.1111152 -1.3757089 -1.7557325 0.90948598 TDCS_10-20EEG -2.8142508 -1.8123575 -2.9536543 0.87332989 LF-RTMS_NEURONAV PRM-RTMS_NEURONAV SHAM TACS_10-20EEG CTBS_10-20EEG 0.042834008 -0.5050897 0.48029182 -0.11792250 CTBS_CM 0.148877340 -0.3602559 0.55455189 0.03775853 CTBS_NEURONAV -0.239253314 -0.7086175 -0.03429224 -0.43201914 DTMS_CM 0.363038286 -0.2306880 1.19259942 0.32537725 HD-TDCS_10-20EEG 0.081970419 -0.5461619 0.92414765 -0.10823536 HF-RTMS_10-20EEG 0.802448620 0.1206732 3.77235571 1.11538235 HF-RTMS_CM 0.527606174 -0.1466178 3.00961516 0.64647037 HF-RTMS_NA -0.318249729 -0.9084701 -0.09055138 -0.69640279 HF-RTMS_NEURONAV -0.516156309 -1.1310179 -0.61690316 -1.09782860 ITBS_10-20EEG 0.508189268 -0.1537501 2.43806089 0.59627324 ITBS_CM 0.372924514 -0.2362458 1.32094839 0.34476875 ITBS_NA -0.014461242 -0.5847400 0.44279319 -0.21275944 ITBS_NEURONAV 1.598192982 0.9668631 3.51345331 2.11111516 LF-RTMS_10-10EEG 1.134597357 0.5505434 2.32334511 1.37570892 LF-RTMS_10-20EEG 1.202773534 0.5162981 4.42328601 1.75573251 LF-RTMS_CM -0.460541472 -1.0453500 -0.38788606 -0.90948598 LF-RTMS_NEURONAV NaN -0.4892819 0.31297122 -0.14449731 PRM-RTMS_NEURONAV 0.489281905 NaN 0.97675333 0.46595887 SHAM -0.312971222 -0.9767533 NaN -0.90948963 TACS_10-20EEG 0.144497314 -0.4659589 0.90948963 NaN TDCS_10-20EEG -0.003025818 -0.6626129 1.27795131 -0.28812130 TDCS_10-20EEG CTBS_10-20EEG 0.071142182 CTBS_CM 0.214646563 CTBS_NEURONAV -0.317181939 DTMS_CM 0.645874497 HD-TDCS_10-20EEG 0.185642214 HF-RTMS_10-20EEG 2.159729449 HF-RTMS_CM 1.470979460 HF-RTMS_NA -0.603740867 HF-RTMS_NEURONAV -1.197715388 ITBS_10-20EEG 1.273611023 ITBS_CM 0.705074886 ITBS_NA -0.020097884 ITBS_NEURONAV 2.814250778 LF-RTMS_10-10EEG 1.812357546 LF-RTMS_10-20EEG 2.953654318 LF-RTMS_CM -0.873329886 LF-RTMS_NEURONAV 0.003025818 PRM-RTMS_NEURONAV 0.662612926 SHAM -1.277951315 TACS_10-20EEG 0.288121302 TDCS_10-20EEG NaN

$p CTBS_10-20EEG CTBS_CM CTBS_NEURONAV DTMS_CM CTBS_10-20EEG NaN 0.9011948 0.75821266 0.70441874 CTBS_CM 0.90119483 NaN 0.69588249 0.84145704 CTBS_NEURONAV 0.75821266 0.6958825 NaN 0.52853061 DTMS_CM 0.70441874 0.8414570 0.52853061 NaN HD-TDCS_10-20EEG 0.96779082 0.9116753 0.70281358 0.65585280 HF-RTMS_10-20EEG 0.33987557 0.5166159 0.28328780 0.55170608 HF-RTMS_CM 0.54405928 0.7229554 0.41524045 0.85890153 HF-RTMS_NA 0.65709567 0.5998125 0.99155180 0.33844892 HF-RTMS_NEURONAV 0.47854048 0.4531591 0.85676463 0.18093606 ITBS_10-20EEG 0.56412369 0.7363498 0.42821434 0.87615866 ITBS_CM 0.69333518 0.8366570 0.51846098 0.99977669 ITBS_NA 0.94397615 0.8471727 0.79158193 0.62566897 ITBS_NEURONAV 0.06363426 0.1338489 0.07037233 0.09807485 LF-RTMS_10-10EEG 0.20200475 0.3097455 0.17451956 0.30838019 LF-RTMS_10-20EEG 0.14703704 0.2816339 0.14753867 0.23557693 LF-RTMS_CM 0.53770406 0.4999507 0.88359610 0.24942073 LF-RTMS_NEURONAV 0.96583385 0.8816504 0.81090916 0.71657628 PRM-RTMS_NEURONAV 0.61349581 0.7186558 0.47856190 0.81755721 SHAM 0.63101991 0.5792012 0.97264411 0.23302629 TACS_10-20EEG 0.90612906 0.9698802 0.66572750 0.74489557 TDCS_10-20EEG 0.94328460 0.8300429 0.75110555 0.51836064 HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM HF-RTMS_NA CTBS_10-20EEG 0.96779082 0.3398755703 0.544059279 0.657095667 CTBS_CM 0.91167527 0.5166158543 0.722955390 0.599812532 CTBS_NEURONAV 0.70281358 0.2832877975 0.415240445 0.991551798 DTMS_CM 0.65585280 0.5517060822 0.858901532 0.338448920 HD-TDCS_10-20EEG NaN 0.1586703298 0.378006007 0.516488137 HF-RTMS_10-20EEG 0.15867033 NaN 0.488140424 0.053840814 HF-RTMS_CM 0.37800601 0.4881404243 NaN 0.137822846 HF-RTMS_NA 0.51648814 0.0538408141 0.137822846 NaN HF-RTMS_NEURONAV 0.27143650 0.0049852610 0.022861432 0.774075738 ITBS_10-20EEG 0.42123494 0.5167348410 0.981385021 0.163082442 ITBS_CM 0.63382006 0.5191647314 0.847210193 0.311626862 ITBS_NA 0.89340837 0.2433486165 0.435689188 0.688683012 ITBS_NEURONAV 0.01847456 0.1329146154 0.052103600 0.006671308 LF-RTMS_10-10EEG 0.12418559 0.4745323443 0.277537559 0.053687576 LF-RTMS_10-20EEG 0.03529803 0.3519802418 0.112637778 0.011787831 LF-RTMS_CM 0.37910368 0.0292168172 0.081552032 0.832803872 LF-RTMS_NEURONAV 0.93467024 0.4222934981 0.597772707 0.750295514 PRM-RTMS_NEURONAV 0.58495465 0.9039498797 0.883433683 0.363629878 SHAM 0.35540945 0.0001617135 0.002615789 0.927849069 TACS_10-20EEG 0.91380900 0.2646866078 0.517974782 0.486176619 TDCS_10-20EEG 0.85272535 0.0307936200 0.141296672 0.546015939 HF-RTMS_NEURONAV ITBS_10-20EEG ITBS_CM ITBS_NA CTBS_10-20EEG 0.4785404751 0.56412369 0.69333518 0.94397615 CTBS_CM 0.4531590607 0.73634977 0.83665700 0.84717271 CTBS_NEURONAV 0.8567646318 0.42821434 0.51846098 0.79158193 DTMS_CM 0.1809360563 0.87615866 0.99977669 0.62566897 HD-TDCS_10-20EEG 0.2714365049 0.42123494 0.63382006 0.89340837 HF-RTMS_10-20EEG 0.0049852610 0.51673484 0.51916473 0.24334862 HF-RTMS_CM 0.0228614316 0.98138502 0.84721019 0.43568919 HF-RTMS_NA 0.7740757381 0.16308244 0.31162686 0.68868301 HF-RTMS_NEURONAV NaN 0.03716724 0.15090668 0.48775122 ITBS_10-20EEG 0.0371672443 NaN 0.86682053 0.46075875 ITBS_CM 0.1509066766 0.86682053 NaN 0.60977593 ITBS_NA 0.4877512232 0.46075875 0.60977593 NaN ITBS_NEURONAV 0.0009453529 0.06011525 0.08269742 0.03756565 LF-RTMS_10-10EEG 0.0191128271 0.28639417 0.28946024 0.15199940 LF-RTMS_10-20EEG 0.0005634517 0.13993214 0.20153301 0.08752941 LF-RTMS_CM 0.9648876053 0.10087731 0.22358368 0.55631765 LF-RTMS_NEURONAV 0.6057452425 0.61132062 0.70920463 0.98846200 PRM-RTMS_NEURONAV 0.2580475658 0.87780674 0.81324192 0.55872258 SHAM 0.5372986029 0.01476629 0.18651857 0.65791533 TACS_10-20EEG 0.2722793417 0.55099270 0.73026823 0.83151460 TDCS_10-20EEG 0.2310278365 0.20280130 0.48076363 0.98396529 ITBS_NEURONAV LF-RTMS_10-10EEG LF-RTMS_10-20EEG LF-RTMS_CM CTBS_10-20EEG 0.0636342629 0.20200475 1.470370e-01 0.537704057 CTBS_CM 0.1338488648 0.30974549 2.816339e-01 0.499950724 CTBS_NEURONAV 0.0703723344 0.17451956 1.475387e-01 0.883596105 DTMS_CM 0.0980748499 0.30838019 2.355769e-01 0.249420734 HD-TDCS_10-20EEG 0.0184745634 0.12418559 3.529803e-02 0.379103677 HF-RTMS_10-20EEG 0.1329146154 0.47453234 3.519802e-01 0.029216817 HF-RTMS_CM 0.0521035997 0.27753756 1.126378e-01 0.081552032 HF-RTMS_NA 0.0066713076 0.05368758 1.178783e-02 0.832803872 HF-RTMS_NEURONAV 0.0009453529 0.01911283 5.634517e-04 0.964887605 ITBS_10-20EEG 0.0601152450 0.28639417 1.399321e-01 0.100877309 ITBS_CM 0.0826974247 0.28946024 2.015330e-01 0.223583681 ITBS_NA 0.0375656502 0.15199940 8.752941e-02 0.556317647 ITBS_NEURONAV NaN 0.62732424 4.003181e-01 0.003700304 LF-RTMS_10-10EEG 0.6273242350 NaN 8.697756e-01 0.035535966 LF-RTMS_10-20EEG 0.4003181166 0.86977555 NaN 0.005812513 LF-RTMS_CM 0.0037003041 0.03553597 5.812513e-03 NaN LF-RTMS_NEURONAV 0.1100000351 0.25654406 2.290640e-01 0.645127611 PRM-RTMS_NEURONAV 0.3336124773 0.58194671 6.056462e-01 0.295861230 SHAM 0.0004423221 0.02016062 9.721091e-06 0.698100356 TACS_10-20EEG 0.0347624151 0.16891177 7.913409e-02 0.363093655 TDCS_10-20EEG 0.0048891071 0.06993097 3.140356e-03 0.382483295 LF-RTMS_NEURONAV PRM-RTMS_NEURONAV SHAM TACS_10-20EEG CTBS_10-20EEG 0.9658339 0.6134958 6.310199e-01 0.90612906 CTBS_CM 0.8816504 0.7186558 5.792012e-01 0.96988021 CTBS_NEURONAV 0.8109092 0.4785619 9.726441e-01 0.66572750 DTMS_CM 0.7165763 0.8175572 2.330263e-01 0.74489557 HD-TDCS_10-20EEG 0.9346702 0.5849547 3.554094e-01 0.91380900 HF-RTMS_10-20EEG 0.4222935 0.9039499 1.617135e-04 0.26468661 HF-RTMS_CM 0.5977727 0.8834337 2.615789e-03 0.51797478 HF-RTMS_NA 0.7502955 0.3636299 9.278491e-01 0.48617662 HF-RTMS_NEURONAV 0.6057452 0.2580476 5.372986e-01 0.27227934 ITBS_10-20EEG 0.6113206 0.8778067 1.476629e-02 0.55099270 ITBS_CM 0.7092046 0.8132419 1.865186e-01 0.73026823 ITBS_NA 0.9884620 0.5587226 6.579153e-01 0.83151460 ITBS_NEURONAV 0.1100000 0.3336125 4.423221e-04 0.03476242 LF-RTMS_10-10EEG 0.2565441 0.5819467 2.016062e-02 0.16891177 LF-RTMS_10-20EEG 0.2290640 0.6056462 9.721091e-06 0.07913409 LF-RTMS_CM 0.6451276 0.2958612 6.981004e-01 0.36309365 LF-RTMS_NEURONAV NaN 0.6246421 7.543025e-01 0.88510778 PRM-RTMS_NEURONAV 0.6246421 NaN 3.286913e-01 0.64124494 SHAM 0.7543025 0.3286913 NaN 0.36309173 TACS_10-20EEG 0.8851078 0.6412449 3.630917e-01 NaN TDCS_10-20EEG 0.9975858 0.5075785 2.012666e-01 0.77325389 TDCS_10-20EEG CTBS_10-20EEG 0.943284596 CTBS_CM 0.830042888 CTBS_NEURONAV 0.751105553 DTMS_CM 0.518360637 HD-TDCS_10-20EEG 0.852725347 HF-RTMS_10-20EEG 0.030793620 HF-RTMS_CM 0.141296672 HF-RTMS_NA 0.546015939 HF-RTMS_NEURONAV 0.231027837 ITBS_10-20EEG 0.202801304 ITBS_CM 0.480763634 ITBS_NA 0.983965288 ITBS_NEURONAV 0.004889107 LF-RTMS_10-10EEG 0.069930968 LF-RTMS_10-20EEG 0.003140356 LF-RTMS_CM 0.382483295 LF-RTMS_NEURONAV 0.997585750 PRM-RTMS_NEURONAV 0.507578489 SHAM 0.201266593 TACS_10-20EEG 0.773253887 TDCS_10-20EEG NaN

Quantifying heterogeneity / inconsistency: I^2 = 63.4% [51.1%; 72.5%]

Tests of heterogeneity (within designs) and inconsistency (between designs): [1] 147.4467

Details of network meta-analysis methods:

  • Calculation of I^2 based on Q

Generating Forest Plot for: total_psychopathology Generating Network Graph for: total_psychopathology Calculating SUCRA/P-score values for: total_psychopathology Mean rank column not found in netrank results. SUCRA/P-score Results: Treatment SUCRA 1 HF-RTMS_NEURONAV 83.5 2 LF-RTMS_CM 80.4 3 SHAM 77.0 4 HF-RTMS_NA 75.0 5 CTBS_NEURONAV 68.8 6 TDCS_10-20EEG 61.8 7 ITBS_NA 61.2 8 LF-RTMS_NEURONAV 59.0 9 CTBS_10-20EEG 58.2 10 HD-TDCS_10-20EEG 57.6 11 TACS_10-20EEG 54.4 12 CTBS_CM 52.7 13 DTMS_CM 44.0 14 ITBS_CM 43.7 15 ITBS_10-20EEG 37.9 16 PRM-RTMS_NEURONAV 37.4 17 HF-RTMS_CM 37.2 18 HF-RTMS_10-20EEG 25.9 19 LF-RTMS_10-10EEG 15.1 20 LF-RTMS_10-20EEG 13.5 21 ITBS_NEURONAV 5.7 Skipping Split Analysis (Direct vs Indirect) for: total_psychopathology - Requires at least 3 treatments or k.trts is missing/invalid.

— Generating League Table for: total_psychopathology — League Table (Model: random ):
League Table: total_psychopathology ( random effects)
CTBS_10-20EEG CTBS_CM CTBS_NEURONAV DTMS_CM HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM HF-RTMS_NA HF-RTMS_NEURONAV ITBS_10-20EEG ITBS_CM ITBS_NA ITBS_NEURONAV LF-RTMS_10-10EEG LF-RTMS_10-20EEG LF-RTMS_CM LF-RTMS_NEURONAV PRM-RTMS_NEURONAV SHAM TACS_10-20EEG TDCS_10-20EEG
CTBS_10-20EEG CTBS_10-20EEG . . . . . . . . . . . . . . . . . 2.11 [ -6.50, 10.72] . .
CTBS_CM -0.86 [-14.44, 12.72] CTBS_CM . . . . . . . . . . . . . . . . 2.97 [ -7.53, 13.47] . .
CTBS_NEURONAV 2.32 [-12.45, 17.09] 3.18 [-12.77, 19.13] CTBS_NEURONAV . . . . . . . . . . . . . . . -0.21 [-12.21, 11.79] . .
DTMS_CM -2.15 [-13.24, 8.95] -1.29 [-13.90, 11.33] -4.47 [-18.36, 9.43] DTMS_CM . . . . . . . . . . . . . . 4.26 [ -2.74, 11.25] . .
HD-TDCS_10-20EEG -0.20 [-10.12, 9.71] 0.66 [-10.93, 12.24] -2.52 [-15.49, 10.44] 1.94 [ -6.60, 10.49] HD-TDCS_10-20EEG . . . . . . . . . . . . . 2.31 [ -2.59, 7.22] . .
HF-RTMS_10-20EEG -4.52 [-13.79, 4.76] -3.66 [-14.70, 7.39] -6.84 [-19.32, 5.65] -2.37 [-10.17, 5.43] -4.31 [-10.31, 1.68] HF-RTMS_10-20EEG . . . . . . . . . . . . 6.63 [ 3.18, 10.07] . .
HF-RTMS_CM -2.85 [-12.04, 6.35] -1.99 [-12.97, 9.00] -5.17 [-17.60, 7.26] -0.70 [ -8.40, 7.01] -2.64 [ -8.52, 3.23] 1.67 [ -3.05, 6.39] HF-RTMS_CM . . . . . . . . . . . 4.96 [ 1.73, 8.18] . .
HF-RTMS_NA 2.39 [ -8.17, 12.96] 3.25 [ -8.90, 15.40] 0.07 [-13.40, 13.55] 4.54 [ -4.76, 13.84] 2.60 [ -5.25, 10.44] 6.91 [ -0.11, 13.93] 5.24 [ -1.68, 12.16] HF-RTMS_NA . . . . . . . . . . -0.28 [ -6.40, 5.84] . .
HF-RTMS_NEURONAV 3.50 [ -6.18, 13.17] 4.36 [ -7.03, 15.74] 1.18 [-11.61, 13.96] 5.64 [ -2.62, 13.91] 3.70 [ -2.90, 10.30] 8.01 [ 2.42, 13.61] 6.34 [ 0.88, 11.81] 1.10 [ -6.44, 8.65] HF-RTMS_NEURONAV . . . . . . . . . -1.39 [ -5.80, 3.02] . .
ITBS_10-20EEG -2.79 [-12.25, 6.68] -1.93 [-13.14, 9.28] -5.11 [-17.74, 7.53] -0.64 [ -8.67, 7.39] -2.58 [ -8.87, 3.71] 1.73 [ -3.50, 6.96] 0.06 [ -5.03, 5.15] -5.18 [-12.46, 2.10] -6.28 [-12.19, -0.37] ITBS_10-20EEG . . . . . . . . 4.90 [ 0.96, 8.83] . .
ITBS_CM -2.15 [-12.83, 8.53] -1.29 [-13.54, 10.96] -4.47 [-18.03, 9.10] -0.00 [ -9.43, 9.43] -1.94 [ -9.95, 6.06] 2.37 [ -4.83, 9.56] 0.70 [ -6.40, 7.79] -4.54 [-13.34, 4.26] -5.65 [-13.35, 2.06] 0.64 [ -6.81, 8.08] ITBS_CM . . . . . . . 4.26 [ -2.06, 10.58] . .
ITBS_NA 0.41 [-11.03, 11.85] 1.27 [-11.65, 14.19] -1.91 [-16.08, 12.26] 2.56 [ -7.72, 12.83] 0.61 [ -8.37, 9.60] 4.93 [ -3.35, 13.20] 3.26 [ -4.93, 11.44] -1.98 [-11.68, 7.72] -3.09 [-11.81, 5.63] 3.20 [ -5.30, 11.69] 2.56 [ -7.27, 12.38] ITBS_NA . . . . . . 1.70 [ -5.82, 9.22] . .
ITBS_NEURONAV -10.53 [-21.66, 0.60] -9.67 [-22.32, 2.97] -12.85 [-26.77, 1.07] -8.39 [-18.32, 1.55] -10.33 [-18.92, -1.74] -6.02 [-13.86, 1.83] -7.69 [-15.44, 0.07] -12.93 [-22.26, -3.59] -14.03 [-22.35, -5.71] -7.75 [-15.82, 0.33] -8.38 [-17.85, 1.09] -10.94 [-21.26, -0.63] ITBS_NEURONAV . . . . . 12.64 [ 5.59, 19.70] . .
LF-RTMS_10-10EEG -7.82 [-19.83, 4.19] -6.96 [-20.39, 6.47] -10.14 [-24.78, 4.50] -5.67 [-16.59, 5.24] -7.62 [-17.32, 2.09] -3.30 [-12.36, 5.75] -4.97 [-13.95, 4.00] -10.21 [-20.59, 0.16] -11.32 [-20.78, -1.85] -5.03 [-14.29, 4.22] -5.67 [-16.16, 4.82] -8.23 [-19.49, 3.03] 2.71 [ -8.24, 13.66] LF-RTMS_10-10EEG . . . . 9.93 [ 1.55, 18.31] . .
LF-RTMS_10-20EEG -7.04 [-16.56, 2.48] -6.18 [-17.43, 5.07] -9.36 [-22.03, 3.31] -4.89 [-12.98, 3.19] -6.84 [-13.20, -0.47] -2.53 [ -7.85, 2.79] -4.20 [ -9.38, 0.99] -9.43 [-16.78, -2.09] -10.54 [-16.53, -4.55] -4.26 [ -9.91, 1.40] -4.89 [-12.40, 2.62] -7.45 [-16.00, 1.10] 3.49 [ -4.64, 11.63] 0.78 [ -8.53, 10.09] LF-RTMS_10-20EEG . . . 9.15 [ 5.10, 13.21] . .
LF-RTMS_CM 3.33 [ -7.25, 13.91] 4.19 [ -7.98, 16.35] 1.01 [-12.48, 14.49] 5.48 [ -3.84, 14.79] 3.53 [ -4.34, 11.40] 7.84 [ 0.79, 14.89] 6.17 [ -0.77, 13.12] 0.93 [ -7.74, 9.61] -0.17 [ -7.74, 7.40] 6.11 [ -1.19, 13.42] 5.48 [ -3.34, 14.30] 2.92 [ -6.80, 12.64] 13.86 [ 4.50, 23.22] 11.15 [ 0.75, 21.54] 10.37 [ 3.00, 17.74] LF-RTMS_CM . . -1.22 [ -7.37, 4.93] . .
LF-RTMS_NEURONAV 0.31 [-13.87, 14.49] 1.17 [-14.23, 16.57] -2.01 [-18.48, 14.46] 2.46 [-10.81, 15.72] 0.51 [-11.78, 12.81] 4.83 [ -6.96, 16.61] 3.16 [ -8.57, 14.88] -2.08 [-14.91, 10.74] -3.19 [-15.29, 8.92] 3.10 [ -8.84, 15.04] 2.46 [-10.46, 15.38] -0.10 [-13.65, 13.45] 10.84 [ -2.45, 24.14] 8.13 [ -5.91, 22.17] 7.35 [ -4.63, 19.33] -3.02 [-15.86, 9.82] LF-RTMS_NEURONAV . 1.80 [ -9.47, 13.07] . .
PRM-RTMS_NEURONAV -3.76 [-18.35, 10.83] -2.90 [-18.68, 12.88] -6.08 [-22.90, 10.74] -1.61 [-15.31, 12.09] -3.56 [-16.32, 9.20] 0.76 [-11.52, 13.03] -0.91 [-13.13, 11.30] -6.15 [-19.43, 7.12] -7.26 [-19.83, 5.32] -0.97 [-13.39, 11.44] -1.61 [-14.98, 11.76] -4.17 [-18.15, 9.81] 6.77 [ -6.96, 20.50] 4.06 [-10.39, 18.51] 3.28 [ -9.18, 15.74] -7.09 [-20.38, 6.20] -4.07 [-20.37, 12.23] PRM-RTMS_NEURONAV 5.87 [ -5.91, 17.65] . .
SHAM 2.11 [ -6.50, 10.72] 2.97 [ -7.53, 13.47] -0.21 [-12.21, 11.79] 4.26 [ -2.74, 11.25] 2.31 [ -2.59, 7.22] 6.63 [ 3.18, 10.07] 4.96 [ 1.73, 8.18] -0.28 [ -6.40, 5.84] -1.39 [ -5.80, 3.02] 4.90 [ 0.96, 8.83] 4.26 [ -2.06, 10.58] 1.70 [ -5.82, 9.22] 12.64 [ 5.59, 19.70] 9.93 [ 1.55, 18.31] 9.15 [ 5.10, 13.21] -1.22 [ -7.37, 4.93] 1.80 [ -9.47, 13.07] 5.87 [ -5.91, 17.65] SHAM -2.74 [ -8.64, 3.16] -1.78 [ -4.52, 0.95]
TACS_10-20EEG -0.63 [-11.07, 9.81] 0.23 [-11.81, 12.27] -2.95 [-16.32, 10.43] 1.52 [ -7.63, 10.67] -0.42 [ -8.10, 7.25] 3.89 [ -2.94, 10.72] 2.22 [ -4.51, 8.94] -3.02 [-11.52, 5.48] -4.13 [-11.49, 3.24] 2.16 [ -4.93, 9.25] 1.52 [ -7.12, 10.17] -1.04 [-10.60, 8.52] 9.90 [ 0.71, 19.10] 7.19 [ -3.05, 17.44] 6.41 [ -0.75, 13.57] -3.96 [-12.48, 4.57] -0.94 [-13.66, 11.79] 3.13 [-10.04, 16.31] -2.74 [ -8.64, 3.16] TACS_10-20EEG .
TDCS_10-20EEG 0.33 [ -8.71, 9.36] 1.19 [ -9.66, 12.03] -1.99 [-14.30, 10.32] 2.48 [ -5.04, 9.99] 0.53 [ -5.09, 6.15] 4.84 [ 0.45, 9.24] 3.17 [ -1.06, 7.40] -2.06 [ -8.77, 4.64] -3.17 [ -8.36, 2.02] 3.11 [ -1.68, 7.91] 2.48 [ -4.41, 9.36] -0.08 [ -8.09, 7.92] 10.86 [ 3.30, 18.42] 8.15 [ -0.66, 16.96] 7.37 [ 2.48, 12.26] -3.00 [ -9.73, 3.73] 0.02 [-11.58, 11.62] 4.09 [ -8.00, 16.18] -1.78 [ -4.52, 0.95] 0.96 [ -5.55, 7.46] TDCS_10-20EEG

Interpretation Guide: - Comparisons are ‘Column Treatment’ vs ‘Row Treatment’. - Cells contain: MD [95% CI]. - Positive MD favors the column treatment (assuming positive TE = benefit after direction adjustment).

Generating Comparison-Adjusted Funnel Plot for: total_psychopathology Visual assessment of funnel plot asymmetry recommended. Asymmetry may suggest publication bias or other systematic differences between small and large studies.

Generating Rankogram for: total_psychopathology

Skipping meta-regression for RoB - ‘Overall_RoB_Level’ column not found after merge.

Skipping meta-regression for Diagnosis - ‘Diagnosis’ column not found or contains only NA values.

========================================================== Finished NMA Workflow for Domain: total_psychopathology ==========================================================

========================================================== Starting NMA Workflow for Domain: global_cognition ==========================================================

— Running Network Meta-Analysis for: global_cognition — Number of comparisons: 32 Number of unique studies (studlab): 32 Treatments included: TDCS_10-20EEG, HF-RTMS_CM, HF-RTMS_NEURONAV, HD-TDCS_10-20EEG, LF-RTMS_10-10EEG, ITBS_10-20EEG, ITBS_NEURONAV, TDCS_10-20 EEG, TACS_10-20EEG, HF-RTMS_10-20EEG, SHAM Reference treatment: SHAM Model type: Random Effects (tau method: REML ) — NMA completed successfully for: global_cognition — Estimated heterogeneity (tau^2): 1.8981 I^2 statistic (overall inconsistency): 12.4% Cochran’s Q: 25.11 , df = 22 , p-value = 0.292

— NMA Summary —

Results ( effects model): Number of studies: k = 32 Number of pairwise comparisons: m = 32 Number of treatments: n = 11 Number of designs: d = 10

Treatment estimates (sm = ‘MD’, comparison: other treatments vs ‘SHAM’): $TE HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM HF-RTMS_NEURONAV HD-TDCS_10-20EEG 0.000000000 -0.9868948 -5.137906 -1.2636160 HF-RTMS_10-20EEG 0.986894781 0.0000000 -4.151012 -0.2767212 HF-RTMS_CM 5.137906324 4.1510115 0.000000 3.8742904 HF-RTMS_NEURONAV 1.263615959 0.2767212 -3.874290 0.0000000 ITBS_10-20EEG 1.368334230 0.3814394 -3.769572 0.1047183 ITBS_NEURONAV -1.045444218 -2.0323390 -6.183351 -2.3090602 LF-RTMS_10-10EEG 3.326173837 2.3392791 -1.811732 2.0625579 SHAM -0.793826163 -1.7807209 -5.931732 -2.0574421 TACS_10-20EEG -2.993826163 -3.9807209 -8.131732 -4.2574421 TDCS_10-20 EEG -0.783826163 -1.7707209 -5.921732 -2.0474421 TDCS_10-20EEG -0.003148491 -0.9900433 -5.141055 -1.2667645 ITBS_10-20EEG ITBS_NEURONAV LF-RTMS_10-10EEG SHAM HD-TDCS_10-20EEG -1.3683342 1.0454442 -3.326174 0.7938262 HF-RTMS_10-20EEG -0.3814394 2.0323390 -2.339279 1.7807209 HF-RTMS_CM 3.7695721 6.1833505 1.811732 5.9317325 HF-RTMS_NEURONAV -0.1047183 2.3090602 -2.062558 2.0574421 ITBS_10-20EEG 0.0000000 2.4137784 -1.957840 2.1621604 ITBS_NEURONAV -2.4137784 0.0000000 -4.371618 -0.2516181 LF-RTMS_10-10EEG 1.9578396 4.3716181 0.000000 4.1200000 SHAM -2.1621604 0.2516181 -4.120000 0.0000000 TACS_10-20EEG -4.3621604 -1.9483819 -6.320000 -2.2000000 TDCS_10-20 EEG -2.1521604 0.2616181 -4.110000 0.0100000 TDCS_10-20EEG -1.3714827 1.0422957 -3.329322 0.7906777 TACS_10-20EEG TDCS_10-20 EEG TDCS_10-20EEG HD-TDCS_10-20EEG 2.993826 0.7838262 0.003148491 HF-RTMS_10-20EEG 3.980721 1.7707209 0.990043272 HF-RTMS_CM 8.131732 5.9217325 5.141054815 HF-RTMS_NEURONAV 4.257442 2.0474421 1.266764451 ITBS_10-20EEG 4.362160 2.1521604 1.371482721 ITBS_NEURONAV 1.948382 -0.2616181 -1.042295726 LF-RTMS_10-10EEG 6.320000 4.1100000 3.329322328 SHAM 2.200000 -0.0100000 -0.790677672 TACS_10-20EEG 0.000000 -2.2100000 -2.990677672 TDCS_10-20 EEG 2.210000 0.0000000 -0.780677672 TDCS_10-20EEG 2.990678 0.7806777 0.000000000

$seTE HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM HF-RTMS_NEURONAV HD-TDCS_10-20EEG 0.000000 1.990959 2.053813 1.880631 HF-RTMS_10-20EEG 1.990959 0.000000 2.306829 2.154085 HF-RTMS_CM 2.053813 2.306829 0.000000 2.212310 HF-RTMS_NEURONAV 1.880631 2.154085 2.212310 0.000000 ITBS_10-20EEG 4.300327 4.426750 4.455373 4.378239 ITBS_NEURONAV 1.518211 1.846151 1.913767 1.726595 LF-RTMS_10-10EEG 2.274690 2.505498 2.555730 2.418755 SHAM 1.195953 1.591733 1.669684 1.451368 TACS_10-20EEG 3.769252 3.912873 3.945226 3.857905 TDCS_10-20 EEG 1.835087 2.114439 2.173726 2.010897 TDCS_10-20EEG 1.619914 1.930655 1.995410 1.816669 ITBS_10-20EEG ITBS_NEURONAV LF-RTMS_10-10EEG SHAM HD-TDCS_10-20EEG 4.300327 1.5182107 2.274690 1.1959528 HF-RTMS_10-20EEG 4.426750 1.8461509 2.505498 1.5917326 HF-RTMS_CM 4.455373 1.9137675 2.555730 1.6696842 HF-RTMS_NEURONAV 4.378239 1.7265945 2.418755 1.4513677 ITBS_10-20EEG 0.000000 4.2352291 4.561405 4.1306785 ITBS_NEURONAV 4.235229 0.0000000 2.149086 0.9352329 LF-RTMS_10-10EEG 4.561405 2.1490859 0.000000 1.9349185 SHAM 4.130678 0.9352329 1.934918 0.0000000 TACS_10-20EEG 5.462551 3.6948100 4.064587 3.5744875 TDCS_10-20 EEG 4.358870 1.6768721 2.383516 1.3918475 TDCS_10-20EEG 4.272742 1.4382204 2.222100 1.0926195 TACS_10-20EEG TDCS_10-20 EEG TDCS_10-20EEG HD-TDCS_10-20EEG 3.769252 1.835087 1.619914 HF-RTMS_10-20EEG 3.912873 2.114439 1.930655 HF-RTMS_CM 3.945226 2.173726 1.995410 HF-RTMS_NEURONAV 3.857905 2.010897 1.816669 ITBS_10-20EEG 5.462551 4.358870 4.272742 ITBS_NEURONAV 3.694810 1.676872 1.438220 LF-RTMS_10-10EEG 4.064587 2.383516 2.222100 SHAM 3.574487 1.391847 1.092620 TACS_10-20EEG 0.000000 3.835909 3.737750 TDCS_10-20 EEG 3.835909 0.000000 1.769479 TDCS_10-20EEG 3.737750 1.769479 0.000000

$lower HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM HF-RTMS_NEURONAV HD-TDCS_10-20EEG 0.000000 -4.8891018 -9.163306 -4.9495841 HF-RTMS_10-20EEG -2.915312 0.0000000 -8.672312 -4.4986496 HF-RTMS_CM 1.112506 -0.3702894 0.000000 -0.4617567 HF-RTMS_NEURONAV -2.422352 -3.9452072 -8.210337 0.0000000 ITBS_10-20EEG -7.060151 -8.2948316 -12.501943 -8.4764716 ITBS_NEURONAV -4.021082 -5.6507283 -9.934266 -5.6931233 LF-RTMS_10-10EEG -1.132136 -2.5714076 -6.820871 -2.6781156 SHAM -3.137851 -4.9004595 -9.204253 -4.9020705 TACS_10-20EEG -10.381425 -11.6498107 -15.864233 -11.8187964 TDCS_10-20 EEG -4.380530 -5.9149451 -10.182157 -5.9887282 TDCS_10-20EEG -3.178121 -4.7740582 -9.051987 -4.8273698 ITBS_10-20EEG ITBS_NEURONAV LF-RTMS_10-10EEG SHAM HD-TDCS_10-20EEG -9.796819 -1.9301941 -7.784483 -1.5501983 HF-RTMS_10-20EEG -9.057710 -1.5860503 -7.249966 -1.3390177 HF-RTMS_CM -4.962799 2.4324352 -3.197406 2.6592115 HF-RTMS_NEURONAV -8.685908 -1.0750029 -6.803231 -0.7871862 ITBS_10-20EEG 0.000000 -5.8871180 -10.898029 -5.9338207 ITBS_NEURONAV -10.714675 0.0000000 -8.583749 -2.0846408 LF-RTMS_10-10EEG -6.982350 0.1594871 0.000000 0.3276295 SHAM -10.258141 -1.5814047 -7.912371 0.0000000 TACS_10-20EEG -15.068564 -9.1900766 -14.286445 -9.2058667 TDCS_10-20 EEG -10.695388 -3.0249908 -8.781606 -2.7179709 TDCS_10-20EEG -9.745903 -1.7765645 -7.684558 -1.3508172 TACS_10-20EEG TDCS_10-20 EEG TDCS_10-20EEG HD-TDCS_10-20EEG -4.3937729 -2.8128773 -3.171824 HF-RTMS_10-20EEG -3.6883688 -2.3735033 -2.793972 HF-RTMS_CM 0.3992321 1.6613078 1.230122 HF-RTMS_NEURONAV -3.3039122 -1.8938439 -2.293841 ITBS_10-20EEG -6.3442432 -6.3910670 -7.002937 ITBS_NEURONAV -5.2933127 -3.5482269 -3.861156 LF-RTMS_10-10EEG -1.6464448 -0.5616057 -1.025913 SHAM -4.8058667 -2.7379709 -2.932173 TACS_10-20EEG 0.0000000 -9.7282441 -10.316534 TDCS_10-20 EEG -5.3082441 0.0000000 -4.248793 TDCS_10-20EEG -4.3351785 -2.6874379 0.000000

$upper HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM HF-RTMS_NEURONAV HD-TDCS_10-20EEG 0.000000 2.915312 -1.1125065 2.4223522 HF-RTMS_10-20EEG 4.889102 0.000000 0.3702894 3.9452072 HF-RTMS_CM 9.163306 8.672312 0.0000000 8.2103374 HF-RTMS_NEURONAV 4.949584 4.498650 0.4617567 0.0000000 ITBS_10-20EEG 9.796819 9.057710 4.9627989 8.6859082 ITBS_NEURONAV 1.930194 1.586050 -2.4324352 1.0750029 LF-RTMS_10-10EEG 7.784483 7.249966 3.1974059 6.8032313 SHAM 1.550198 1.339018 -2.6592115 0.7871862 TACS_10-20EEG 4.393773 3.688369 -0.3992321 3.3039122 TDCS_10-20 EEG 2.812877 2.373503 -1.6613078 1.8938439 TDCS_10-20EEG 3.171824 2.793972 -1.2301222 2.2938409 ITBS_10-20EEG ITBS_NEURONAV LF-RTMS_10-10EEG SHAM HD-TDCS_10-20EEG 7.060151 4.021082 1.1321358 3.137851 HF-RTMS_10-20EEG 8.294832 5.650728 2.5714076 4.900460 HF-RTMS_CM 12.501943 9.934266 6.8208709 9.204253 HF-RTMS_NEURONAV 8.476472 5.693123 2.6781156 4.902070 ITBS_10-20EEG 0.000000 10.714675 6.9823497 10.258141 ITBS_NEURONAV 5.887118 0.000000 -0.1594871 1.581405 LF-RTMS_10-10EEG 10.898029 8.583749 0.0000000 7.912371 SHAM 5.933821 2.084641 -0.3276295 0.000000 TACS_10-20EEG 6.344243 5.293313 1.6464448 4.805867 TDCS_10-20 EEG 6.391067 3.548227 0.5616057 2.737971 TDCS_10-20EEG 7.002937 3.861156 1.0259130 2.932173 TACS_10-20EEG TDCS_10-20 EEG TDCS_10-20EEG HD-TDCS_10-20EEG 10.381425 4.380530 3.178121 HF-RTMS_10-20EEG 11.649811 5.914945 4.774058 HF-RTMS_CM 15.864233 10.182157 9.051987 HF-RTMS_NEURONAV 11.818796 5.988728 4.827370 ITBS_10-20EEG 15.068564 10.695388 9.745903 ITBS_NEURONAV 9.190077 3.024991 1.776564 LF-RTMS_10-10EEG 14.286445 8.781606 7.684558 SHAM 9.205867 2.717971 1.350817 TACS_10-20EEG 0.000000 5.308244 4.335179 TDCS_10-20 EEG 9.728244 0.000000 2.687438 TDCS_10-20EEG 10.316534 4.248793 0.000000

$statistic HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM HF-RTMS_NEURONAV HD-TDCS_10-20EEG NaN -0.49568826 -2.5016425 -0.6719108 HF-RTMS_10-20EEG 0.495688265 NaN -1.7994452 -0.1284635 HF-RTMS_CM 2.501642493 1.79944516 NaN 1.7512424 HF-RTMS_NEURONAV 0.671910790 0.12846346 -1.7512424 NaN ITBS_10-20EEG 0.318193102 0.08616692 -0.8460733 0.0239179 ITBS_NEURONAV -0.688602855 -1.10085203 -3.2309832 -1.3373494 LF-RTMS_10-10EEG 1.462253953 0.93365817 -0.7088905 0.8527352 SHAM -0.663760429 -1.11873120 -3.5526074 -1.4175885 TACS_10-20EEG -0.794275845 -1.01733973 -2.0611577 -1.1035633 TDCS_10-20 EEG -0.427133083 -0.83744245 -2.7242313 -1.0181735 TDCS_10-20EEG -0.001943617 -0.51280166 -2.5764398 -0.6973007 ITBS_10-20EEG ITBS_NEURONAV LF-RTMS_10-10EEG SHAM HD-TDCS_10-20EEG -0.31819310 0.6886029 -1.4622540 0.663760429 HF-RTMS_10-20EEG -0.08616692 1.1008520 -0.9336582 1.118731204 HF-RTMS_CM 0.84607325 3.2309832 0.7088905 3.552607373 HF-RTMS_NEURONAV -0.02391790 1.3373494 -0.8527352 1.417588505 ITBS_10-20EEG NaN 0.5699287 -0.4292186 0.523439526 ITBS_NEURONAV -0.56992866 NaN -2.0341756 -0.269043208 LF-RTMS_10-10EEG 0.42921856 2.0341756 NaN 2.129288667 SHAM -0.52343953 0.2690432 -2.1292887 NaN TACS_10-20EEG -0.79855735 -0.5273294 -1.5548934 -0.615472851 TDCS_10-20 EEG -0.49374278 0.1560155 -1.7243433 0.007184695 TDCS_10-20EEG -0.32098423 0.7247121 -1.4982777 0.723653267 TACS_10-20EEG TDCS_10-20 EEG TDCS_10-20EEG HD-TDCS_10-20EEG 0.7942758 0.427133083 0.001943617 HF-RTMS_10-20EEG 1.0173397 0.837442453 0.512801661 HF-RTMS_CM 2.0611577 2.724231320 2.576439783 HF-RTMS_NEURONAV 1.1035633 1.018173450 0.697300719 ITBS_10-20EEG 0.7985573 0.493742779 0.320984229 ITBS_NEURONAV 0.5273294 -0.156015513 -0.724712101 LF-RTMS_10-10EEG 1.5548934 1.724343306 1.498277680 SHAM 0.6154729 -0.007184695 -0.723653267 TACS_10-20EEG NaN -0.576134582 -0.800127709 TDCS_10-20 EEG 0.5761346 NaN -0.441190639 TDCS_10-20EEG 0.8001277 0.441190639 NaN

$p HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM HD-TDCS_10-20EEG NaN 0.62011437 0.0123618685 HF-RTMS_10-20EEG 0.62011437 NaN 0.0719482907 HF-RTMS_CM 0.01236187 0.07194829 NaN HF-RTMS_NEURONAV 0.50164049 0.89778221 0.0799041578 ITBS_10-20EEG 0.75033846 0.93133372 0.3975118798 ITBS_NEURONAV 0.49107322 0.27096106 0.0012336519 LF-RTMS_10-10EEG 0.14367163 0.35048025 0.4783924572 SHAM 0.50684366 0.26325483 0.0003814333 TACS_10-20EEG 0.42703486 0.30899184 0.0392879959 TDCS_10-20 EEG 0.66928240 0.40234391 0.0064451347 TDCS_10-20EEG 0.99844922 0.60809007 0.0099823591 HF-RTMS_NEURONAV ITBS_10-20EEG ITBS_NEURONAV LF-RTMS_10-10EEG HD-TDCS_10-20EEG 0.50164049 0.7503385 0.491073224 0.14367163 HF-RTMS_10-20EEG 0.89778221 0.9313337 0.270961063 0.35048025 HF-RTMS_CM 0.07990416 0.3975119 0.001233652 0.47839246 HF-RTMS_NEURONAV NaN 0.9809181 0.181108608 0.39380616 ITBS_10-20EEG 0.98091810 NaN 0.568726083 0.66776418 ITBS_NEURONAV 0.18110861 0.5687261 NaN 0.04193389 LF-RTMS_10-10EEG 0.39380616 0.6677642 0.041933893 NaN SHAM 0.15631094 0.6006684 0.787896433 0.03323038 TACS_10-20EEG 0.26978261 0.4245471 0.597964865 0.11997146 TDCS_10-20 EEG 0.30859553 0.6214878 0.876020794 0.08464589 TDCS_10-20EEG 0.48561462 0.7482223 0.468628670 0.13406112 SHAM TACS_10-20EEG TDCS_10-20 EEG TDCS_10-20EEG HD-TDCS_10-20EEG 0.5068436559 0.4270349 0.669282398 0.998449219 HF-RTMS_10-20EEG 0.2632548288 0.3089918 0.402343911 0.608090067 HF-RTMS_CM 0.0003814333 0.0392880 0.006445135 0.009982359 HF-RTMS_NEURONAV 0.1563109380 0.2697826 0.308595534 0.485614618 ITBS_10-20EEG 0.6006684245 0.4245471 0.621487849 0.748222343 ITBS_NEURONAV 0.7878964325 0.5979649 0.876020794 0.468628670 LF-RTMS_10-10EEG 0.0332303848 0.1199715 0.084645886 0.134061121 SHAM NaN 0.5382425 0.994267492 0.469278630 TACS_10-20EEG 0.5382424933 NaN 0.564524218 0.423636808 TDCS_10-20 EEG 0.9942674918 0.5645242 NaN 0.659074990 TDCS_10-20EEG 0.4692786303 0.4236368 0.659074990 NaN

Quantifying heterogeneity / inconsistency: I^2 = 12.4% [0.0%; 46.3%]

Tests of heterogeneity (within designs) and inconsistency (between designs): [1] 25.11097

Details of network meta-analysis methods:

  • Calculation of I^2 based on Q

Generating Forest Plot for: global_cognition Generating Network Graph for: global_cognition Calculating SUCRA/P-score values for: global_cognition Mean rank column not found in netrank results. SUCRA/P-score Results: Treatment SUCRA 1 TACS_10-20EEG 81.4 2 ITBS_NEURONAV 74.6 3 SHAM 71.5 4 TDCS_10-20 EEG 68.4 5 HD-TDCS_10-20EEG 55.3 6 TDCS_10-20EEG 55.2 7 ITBS_10-20EEG 42.8 8 HF-RTMS_10-20EEG 41.1 9 HF-RTMS_NEURONAV 36.7 10 LF-RTMS_10-10EEG 17.5 11 HF-RTMS_CM 5.5 — Performing Split Analysis (Direct vs Indirect) for: global_cognition — Summary of Direct vs Indirect Evidence: Length Class Mode
comparison 55 -none- character k 55 -none- numeric
show 1 -none- character overall 1 -none- logical
direct 1 -none- logical
indirect 1 -none- logical
ci 1 -none- logical
test 1 -none- logical
only.reference 1 -none- logical
prop.common 55 -none- numeric
common 7 data.frame list
direct.common 12 data.frame list
indirect.common 7 data.frame list
compare.common 8 data.frame list
prop.random 55 -none- numeric
random 7 data.frame list
direct.random 12 data.frame list
indirect.random 7 data.frame list
compare.random 8 data.frame list
predict 3 data.frame list
method 1 -none- character sm 1 -none- character level.ma 1 -none- numeric
prediction 1 -none- logical
level.predict 1 -none- numeric
tau 1 -none- numeric
reference.group 1 -none- character baseline.reference 1 -none- logical
order 0 -none- NULL
sep.trts 1 -none- character quote.trts 1 -none- character nchar.trts 1 -none- numeric
tol.direct 1 -none- numeric
backtransf 1 -none- logical
x 198 netmeta list
version 1 -none- character prop.fixed 55 -none- numeric
fixed 7 data.frame list
direct.fixed 12 data.frame list
indirect.fixed 7 data.frame list
compare.fixed 8 data.frame list

‘p’ value column (’ p.random ’) not found in netsplit results. Cannot check for inconsistency. This might happen if there are no closed loops for indirect evidence calculation.

— Generating League Table for: global_cognition — League Table (Model: random ):
League Table: global_cognition ( random effects)
HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM HF-RTMS_NEURONAV ITBS_10-20EEG ITBS_NEURONAV LF-RTMS_10-10EEG SHAM TACS_10-20EEG TDCS_10-20 EEG TDCS_10-20EEG
HD-TDCS_10-20EEG HD-TDCS_10-20EEG . . . . . . 0.79 [ -1.55, 3.14] . . .
HF-RTMS_10-20EEG -0.99 [ -4.89, 2.92] HF-RTMS_10-20EEG . . . . . 1.78 [ -1.34, 4.90] . . .
HF-RTMS_CM -5.14 [ -9.16, -1.11] -4.15 [ -8.67, 0.37] HF-RTMS_CM . . . . 5.93 [ 2.66, 9.20] . . .
HF-RTMS_NEURONAV -1.26 [ -4.95, 2.42] -0.28 [ -4.50, 3.95] 3.87 [ -0.46, 8.21] HF-RTMS_NEURONAV . . . 2.06 [ -0.79, 4.90] . . .
ITBS_10-20EEG -1.37 [ -9.80, 7.06] -0.38 [ -9.06, 8.29] 3.77 [ -4.96, 12.50] -0.10 [ -8.69, 8.48] ITBS_10-20EEG . . 2.16 [ -5.93, 10.26] . . .
ITBS_NEURONAV 1.05 [ -1.93, 4.02] 2.03 [ -1.59, 5.65] 6.18 [ 2.43, 9.93] 2.31 [ -1.08, 5.69] 2.41 [ -5.89, 10.71] ITBS_NEURONAV . -0.25 [ -2.08, 1.58] . . .
LF-RTMS_10-10EEG -3.33 [ -7.78, 1.13] -2.34 [ -7.25, 2.57] 1.81 [ -3.20, 6.82] -2.06 [ -6.80, 2.68] -1.96 [-10.90, 6.98] -4.37 [ -8.58, -0.16] LF-RTMS_10-10EEG 4.12 [ 0.33, 7.91] . . .
SHAM 0.79 [ -1.55, 3.14] 1.78 [ -1.34, 4.90] 5.93 [ 2.66, 9.20] 2.06 [ -0.79, 4.90] 2.16 [ -5.93, 10.26] -0.25 [ -2.08, 1.58] 4.12 [ 0.33, 7.91] SHAM 2.20 [ -4.81, 9.21] -0.01 [ -2.74, 2.72] -0.79 [ -2.93, 1.35]
TACS_10-20EEG 2.99 [ -4.39, 10.38] 3.98 [ -3.69, 11.65] 8.13 [ 0.40, 15.86] 4.26 [ -3.30, 11.82] 4.36 [ -6.34, 15.07] 1.95 [ -5.29, 9.19] 6.32 [ -1.65, 14.29] 2.20 [ -4.81, 9.21] TACS_10-20EEG . .
TDCS_10-20 EEG 0.78 [ -2.81, 4.38] 1.77 [ -2.37, 5.91] 5.92 [ 1.66, 10.18] 2.05 [ -1.89, 5.99] 2.15 [ -6.39, 10.70] -0.26 [ -3.55, 3.02] 4.11 [ -0.56, 8.78] -0.01 [ -2.74, 2.72] -2.21 [ -9.73, 5.31] TDCS_10-20 EEG .
TDCS_10-20EEG 0.00 [ -3.17, 3.18] 0.99 [ -2.79, 4.77] 5.14 [ 1.23, 9.05] 1.27 [ -2.29, 4.83] 1.37 [ -7.00, 9.75] -1.04 [ -3.86, 1.78] 3.33 [ -1.03, 7.68] -0.79 [ -2.93, 1.35] -2.99 [-10.32, 4.34] -0.78 [ -4.25, 2.69] TDCS_10-20EEG

Interpretation Guide: - Comparisons are ‘Column Treatment’ vs ‘Row Treatment’. - Cells contain: MD [95% CI]. - Positive MD favors the column treatment (assuming positive TE = benefit after direction adjustment).

Generating Comparison-Adjusted Funnel Plot for: global_cognition Visual assessment of funnel plot asymmetry recommended. Asymmetry may suggest publication bias or other systematic differences between small and large studies.

Generating Rankogram for: global_cognition

— Performing Network Meta-Regression for: global_cognition using covariate: Overall_RoB_Level — !!! Error during netmetareg execution for global_cognition with covariate Overall_RoB_Level : object ‘netmetareg’ not found -> Double-check if the covariate ’ Overall_RoB_Level ’ exists in the data frame used by the nma_result object. — Meta-regression failed for: global_cognition using covariate: Overall_RoB_Level —

Skipping meta-regression for Diagnosis - ‘Diagnosis’ column not found or contains only NA values.

========================================================== Finished NMA Workflow for Domain: global_cognition ==========================================================

========================================================== Cross-Domain Comparison (Based on SUCRA/P-score) ========================================================== — Summary Table: Treatment Performance Across Domains —
Cross-Domain Treatment Performance Summary (SUCRA % / Mean Rank)
Treatment positive_symptoms negative_symptoms total_psychopathology global_cognition
CTBS_10-20EEG 91.0 63.0 58.2 NA
CTBS_CM 37.4 64.6 52.7 NA
CTBS_NEURONAV 48.2 57.1 68.8 NA
DTMS_CM 42.4 45.8 44.0 NA
HD-TDCS_10-10EEG 50.8 35.9 NA NA
HD-TDCS_10-20EEG 48.8 60.6 57.6 55.3
HF-RTMS_10-20EEG 54.6 23.0 25.9 41.1
HF-RTMS_CM 43.2 19.9 37.2 5.5
HF-RTMS_NA 58.0 53.6 75.0 NA
HF-RTMS_NEURONAV 52.9 69.6 83.5 36.7
ITBS_10-20EEG 69.8 5.3 37.9 42.8
ITBS_CM 39.7 62.2 43.7 NA
ITBS_NA 53.1 52.9 61.2 NA
ITBS_NEURONAV 19.5 21.0 5.7 74.6
LF-RTMS_10-10EEG 36.7 47.1 15.1 17.5
LF-RTMS_10-20EEG 19.0 58.3 13.5 NA
LF-RTMS_CM 76.7 59.5 80.4 NA
LF-RTMS_NEURONAV 58.0 69.0 59.0 NA
PRM-RTMS_NEURONAV 48.1 NA 37.4 NA
TACS_10-20EEG 57.7 50.9 54.4 81.4
TDCS_10-20EEG 50.6 65.4 61.8 55.2
TDCS_10-20EG 32.5 41.9 NA NA

========================================================== Summary Recommendations (Based on SUCRA/P-score) ==========================================================

— Domain: positive_symptoms — Top Treatments (ranked by SUCRA/P-score): 1. CTBS_10-20EEG (SUCRA: 91.0%) 2. LF-RTMS_CM (SUCRA: 76.7%) 3. ITBS_10-20EEG (SUCRA: 69.8%) 4. HF-RTMS_NA (SUCRA: 58.0%) 5. LF-RTMS_NEURONAV (SUCRA: 58.0%)

— Domain: negative_symptoms — Top Treatments (ranked by SUCRA/P-score): 1. HF-RTMS_NEURONAV (SUCRA: 69.6%) 2. LF-RTMS_NEURONAV (SUCRA: 69.0%) 3. TDCS_10-20EEG (SUCRA: 65.4%) 4. CTBS_CM (SUCRA: 64.6%) 5. CTBS_10-20EEG (SUCRA: 63.0%)

— Domain: total_psychopathology — Top Treatments (ranked by SUCRA/P-score): 1. HF-RTMS_NEURONAV (SUCRA: 83.5%) 2. LF-RTMS_CM (SUCRA: 80.4%) 3. HF-RTMS_NA (SUCRA: 75.0%) 4. CTBS_NEURONAV (SUCRA: 68.8%) 5. TDCS_10-20EEG (SUCRA: 61.8%)

— Domain: global_cognition — Top Treatments (ranked by SUCRA/P-score): 1. TACS_10-20EEG (SUCRA: 81.4%) 2. ITBS_NEURONAV (SUCRA: 74.6%) 3. TDCS_10-20 EEG (SUCRA: 68.4%) 4. HD-TDCS_10-20EEG (SUCRA: 55.3%) 5. TDCS_10-20EEG (SUCRA: 55.2%)

========================================================== Targeting Method Analysis (Exploratory) ========================================================== Average SUCRA/P-score by Targeting Method within each Domain:

Domain: global_cognition
Targeting_Method Avg_SUCRA Num_Treatments
10-20 EEG 68.4 1
NEURONAV 55.6 2
10-20EEG 55.2 5
10-10EEG 17.5 1
CM 5.5 1
Domain: negative_symptoms
Targeting_Method Avg_SUCRA Num_Treatments
NEURONAV 54.2 4
NA 53.2 2
CM 50.4 5
10-20EEG 46.6 7
10-20EG 41.9 1
10-10EEG 41.5 2
Domain: positive_symptoms
Targeting_Method Avg_SUCRA Num_Treatments
10-20EEG 55.9 7
NA 55.5 2
CM 47.9 5
NEURONAV 45.3 5
10-10EEG 43.8 2
10-20EG 32.5 1
Domain: total_psychopathology
Targeting_Method Avg_SUCRA Num_Treatments
NA 68.1 2
CM 51.6 5
NEURONAV 50.9 5
10-20EEG 44.2 7
10-10EEG 15.1 1

— End of Workflow —

— Full NMA Workflow Execution Finished —

# Define the domains you want to analyze explicitly
# Adjust these based on the domains present in your 'outcomes' data and RoB mapping
domains <- c("positive_symptoms", "negative_symptoms", "total_psychopathology", "global_cognition") 

# Ensure the required dataframes are loaded and processed
# - 'outcomes' (cleaned outcomes data)
# - 'baseline' (cleaned baseline data, including Diagnosis)
# - 'processed_rob_data' (list of processed RoB dataframes, or NULL)
# - 'domain_rob_mapping' (mapping vector)
if (exists("outcomes") && exists("baseline") && exists("domain_rob_mapping")) {
  
  # Check if processed_rob_data exists, otherwise pass NULL
  rob_data_to_pass <- if (exists("processed_rob_data")) processed_rob_data else NULL
  
  cat("\n--- Starting Full NMA Workflow Execution ---\n")
  # Run the workflow, passing the RoB data list and mapping
  nma_results_output <- run_nma_workflow(
    outcomes_df = outcomes,
    baseline_df = baseline,
    rob_data_processed_list = rob_data_to_pass, # Pass the list (or NULL)
    domain_rob_map = domain_rob_mapping,       # Pass the mapping
    domains_to_analyze = domains,
    correlation_pre_post = 0.7, # Assumed correlation for pre-post calculations
    reference_group = "SHAM"    # Define the reference treatment label
  )
  cat("\n--- Full NMA Workflow Execution Finished ---\n")
  
} else {
  cat("\n\n!!! Error: Required data objects ('outcomes', 'baseline', 'domain_rob_mapping') not found. !!!\n")
  cat("Please ensure data loading and preprocessing chunks ran successfully.\n")
  # Set output to NULL if prerequisites are missing
  nma_results_output <- NULL 
}

— Starting Full NMA Workflow Execution —

— Preparing NMA Data for Specified Domains —

— Preparing data for domain: positive_symptoms —

— Warnings/Errors during NMA data preparation for domain: positive_symptoms — Summary of reasons for skipped comparisons/errors: skip_reasons_simple Fewer than 2 valid groups in study ‘kumar, 2020’ 1 Missing baseline info for active group 1 Missing required data points 2

First 10 detailed skip/error messages: - Comparison: hua, 2024 active vs sham p_ahrs | Reason: Missing required data points: active_t0, sham_t0 - Comparison: hua, 2024 active vs sham p_panss | Reason: Missing required data points: active_t0, sham_t0 - Comparison: kumar, 2020 | Reason: Fewer than 2 valid groups in study ‘kumar, 2020’ - Comparison: walther-lft, 2024 active vs sham p_panss | Reason: Missing baseline info for active group————————————————————– Merging RoB data using indicator: p Successfully merged RoB data for 68 out of 121 comparisons. -> Note: Some comparisons did not have matching RoB entries based on study name. Examples: bais, 2014 - l, bais, 2014 - bi, blumberger-prm, 2012, chauhan, 2021, de jesus, 2011 … Prepared 121 comparisons for domain: positive_symptoms Diagnosis information included.

— Preparing data for domain: negative_symptoms —

— Warnings/Errors during NMA data preparation for domain: negative_symptoms — Summary of reasons for skipped comparisons/errors: skip_reasons_simple Missing baseline info for active group Missing required data points 2 4

First 10 detailed skip/error messages: - Comparison: chang-b, 2021 active vs sham n_panss | Reason: Missing required data points: active_t0, sham_t0 - Comparison: hua, 2024 active vs sham n_panss | Reason: Missing required data points: active_t0, sham_t0 - Comparison: kumar, 2020 active vs sham n_sans | Reason: Missing required data points: sham_t1, sham_t0 - Comparison: kumar, 2020 active vs sham sans | Reason: Missing required data points: active_t1, active_t0 - Comparison: walther-lft, 2024 active vs sham n_panss | Reason: Missing baseline info for active group - Comparison: walther-lft, 2024 active vs sham n_bnss | Reason: Missing baseline info for active group————————————————————– Merging RoB data using indicator: n Successfully merged RoB data for 64 out of 110 comparisons. -> Note: Some comparisons did not have matching RoB entries based on study name. Examples: bais, 2014 - l, bais, 2014 - bi, chang-a, 2021, chauhan, 2021, de jesus, 2011 … Prepared 110 comparisons for domain: negative_symptoms Diagnosis information included.

— Preparing data for domain: total_psychopathology —

— Warnings/Errors during NMA data preparation for domain: total_psychopathology — Summary of reasons for skipped comparisons/errors: skip_reasons_simple Error calculating effect size 1 Fewer than 2 valid groups in study ‘kumar, 2020’ 1 Missing baseline info for active group 1 Missing required data points 2

First 10 detailed skip/error messages: - Comparison: chang-b, 2021 active vs sham t_panss | Reason: Missing required data points: active_t0, sham_t0 - Comparison: hou-dlpfc, 2024 active vs sham t_panss | Reason: Error calculating effect size: Invalid SD values (<0, or 0 with non-zero mean) in T1/Change row(s). - Comparison: hua, 2024 active vs sham t_panss | Reason: Missing required data points: active_t0, sham_t0 - Comparison: kumar, 2020 | Reason: Fewer than 2 valid groups in study ‘kumar, 2020’ - Comparison: walther-lft, 2024 active vs sham t_panss | Reason: Missing baseline info for active group————————————————————– -> RoB indicator (’ NA ’) not found for this domain or corresponding RoB sheet not processed. Skipping RoB merge. Prepared 74 comparisons for domain: total_psychopathology Diagnosis information included.

— Preparing data for domain: global_cognition —

— Warnings/Errors during NMA data preparation for domain: global_cognition — Summary of reasons for skipped comparisons/errors: skip_reasons_simple Missing required data points 1

First 10 detailed skip/error messages: - Comparison: schifani, 2024 active vs sham gc_mccb | Reason: Missing required data points: active_t0, sham_t0————————————————————– Merging RoB data using indicator: c Successfully merged RoB data for 13 out of 32 comparisons. -> Note: Some comparisons did not have matching RoB entries based on study name. Examples: francis, 2019, guan, 2020, hou-dlpfc, 2024, hou-ppc, 2024, hu, 2023 … Prepared 32 comparisons for domain: global_cognition Diagnosis information included. — Finished Data Preparation —

========================================================== Starting NMA Workflow for Domain: positive_symptoms ==========================================================

— Running Network Meta-Analysis for: positive_symptoms — Number of comparisons: 121 Number of unique studies (studlab): 121 Treatments included: LF-RTMS_10-20EEG, HF-RTMS_NEURONAV, ITBS_NEURONAV, LF-RTMS_NEURONAV, PRM-RTMS_NEURONAV, TDCS_10-20EEG, ITBS_10-20EEG, HD-TDCS_10-10EEG, HF-RTMS_10-20EEG, LF-RTMS_CM, DTMS_CM, HF-RTMS_CM, HD-TDCS_10-20EEG, LF-RTMS_10-10EEG, ITBS_NA, CTBS_CM, CTBS_10-20EEG, HF-RTMS_NA, TACS_10-20EEG, TDCS_10-20EG, CTBS_NEURONAV, ITBS_CM, SHAM Reference treatment: SHAM Model type: Random Effects (tau method: REML ) — NMA completed successfully for: positive_symptoms — Estimated heterogeneity (tau^2): 10.9797 I^2 statistic (overall inconsistency): 86.0% Cochran’s Q: 707.05 , df = 99 , p-value = <2e-16

— NMA Summary —

Results ( effects model): Number of studies: k = 121 Number of pairwise comparisons: m = 121 Number of treatments: n = 23 Number of designs: d = 22

Treatment estimates (sm = ‘MD’, comparison: other treatments vs ‘SHAM’): $TE CTBS_10-20EEG CTBS_CM CTBS_NEURONAV DTMS_CM CTBS_10-20EEG 0.000000 -4.8055031 -3.83698780 -4.3033470 CTBS_CM 4.805503 0.0000000 0.96851529 0.5021560 CTBS_NEURONAV 3.836988 -0.9685153 0.00000000 -0.4663592 DTMS_CM 4.303347 -0.5021560 0.46635925 0.0000000 HD-TDCS_10-10EEG 3.556988 -1.2485153 -0.28000000 -0.7463592 HD-TDCS_10-20EEG 3.715343 -1.0901597 -0.12164438 -0.5880036 HF-RTMS_10-20EEG 3.321657 -1.4838464 -0.51533114 -0.9816904 HF-RTMS_CM 4.026074 -0.7794293 0.18908599 -0.2772733 HF-RTMS_NA 2.776988 -2.0285153 -1.06000000 -1.5263592 HF-RTMS_NEURONAV 3.428532 -1.3769708 -0.40845549 -0.8748147 ITBS_10-20EEG 2.136513 -2.6689897 -1.70047436 -2.1668336 ITBS_CM 4.686988 -0.1185153 0.85000000 0.3836408 ITBS_NA 3.326988 -1.4785153 -0.51000000 -0.9763592 ITBS_NEURONAV 6.137113 1.3316101 2.30012535 1.8337661 LF-RTMS_10-10EEG 5.026988 0.2214847 1.19000000 0.7236408 LF-RTMS_10-20EEG 5.824689 1.0191855 1.98770082 1.5213416 LF-RTMS_CM 1.446276 -3.3592267 -2.39071140 -2.8570706 LF-RTMS_NEURONAV 3.065263 -1.7402398 -0.77172450 -1.2380837 PRM-RTMS_NEURONAV 3.778406 -1.0270969 -0.05858159 -0.5249408 SHAM 2.986988 -1.8185153 -0.85000000 -1.3163592 TACS_10-20EEG 3.045358 -1.7601454 -0.79163015 -1.2579894 TDCS_10-20EEG 3.554848 -1.2506548 -0.28213947 -0.7484987 TDCS_10-20EG 5.258738 0.4532346 1.42174988 0.9553906 HD-TDCS_10-10EEG HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM CTBS_10-20EEG -3.556987799 -3.71534342 -3.321656663 -4.0260738 CTBS_CM 1.248515287 1.09015967 1.483846424 0.7794293 CTBS_NEURONAV 0.280000000 0.12164438 0.515331137 -0.1890860 DTMS_CM 0.746359247 0.58800363 0.981690384 0.2772733 HD-TDCS_10-10EEG 0.000000000 -0.15835562 0.235331137 -0.4690860 HD-TDCS_10-20EEG 0.158355620 0.00000000 0.393686757 -0.3107304 HF-RTMS_10-20EEG -0.235331137 -0.39368676 0.000000000 -0.7044171 HF-RTMS_CM 0.469085991 0.31073037 0.704417128 0.0000000 HF-RTMS_NA -0.780000000 -0.93835562 -0.544668863 -1.2490860 HF-RTMS_NEURONAV -0.128455485 -0.28681111 0.106875651 -0.5975415 ITBS_10-20EEG -1.420474364 -1.57882998 -1.185143227 -1.8895604 ITBS_CM 1.130000000 0.97164438 1.365331137 0.6609140 ITBS_NA -0.230000000 -0.38835562 0.005331137 -0.6990860 ITBS_NEURONAV 2.580125347 2.42176973 2.815456484 2.1110394 LF-RTMS_10-10EEG 1.470000000 1.31164438 1.705331137 1.0009140 LF-RTMS_10-20EEG 2.267700819 2.10934520 2.503031956 1.7986148 LF-RTMS_CM -2.110711402 -2.26906702 -1.875380266 -2.5797974 LF-RTMS_NEURONAV -0.491724501 -0.65008012 -0.256393364 -0.9608105 PRM-RTMS_NEURONAV 0.221418407 0.06306279 0.456749544 -0.2476676 SHAM -0.570000000 -0.72835562 -0.334668863 -1.0390860 TACS_10-20EEG -0.511630152 -0.66998577 -0.276299015 -0.9807161 TDCS_10-20EEG -0.002139465 -0.16049509 0.233191672 -0.4712255 TDCS_10-20EG 1.701749878 1.54339426 1.937081015 1.2326639 HF-RTMS_NA HF-RTMS_NEURONAV ITBS_10-20EEG ITBS_CM CTBS_10-20EEG -2.7769878 -3.4285323 -2.1365134 -4.6869878 CTBS_CM 2.0285153 1.3769708 2.6689897 0.1185153 CTBS_NEURONAV 1.0600000 0.4084555 1.7004744 -0.8500000 DTMS_CM 1.5263592 0.8748147 2.1668336 -0.3836408 HD-TDCS_10-10EEG 0.7800000 0.1284555 1.4204744 -1.1300000 HD-TDCS_10-20EEG 0.9383556 0.2868111 1.5788300 -0.9716444 HF-RTMS_10-20EEG 0.5446689 -0.1068757 1.1851432 -1.3653311 HF-RTMS_CM 1.2490860 0.5975415 1.8895604 -0.6609140 HF-RTMS_NA 0.0000000 -0.6515445 0.6404744 -1.9100000 HF-RTMS_NEURONAV 0.6515445 0.0000000 1.2920189 -1.2584555 ITBS_10-20EEG -0.6404744 -1.2920189 0.0000000 -2.5504744 ITBS_CM 1.9100000 1.2584555 2.5504744 0.0000000 ITBS_NA 0.5500000 -0.1015445 1.1904744 -1.3600000 ITBS_NEURONAV 3.3601253 2.7085808 4.0005997 1.4501253 LF-RTMS_10-10EEG 2.2500000 1.5984555 2.8904744 0.3400000 LF-RTMS_10-20EEG 3.0477008 2.3961563 3.6881752 1.1377008 LF-RTMS_CM -1.3307114 -1.9822559 -0.6902370 -3.2407114 LF-RTMS_NEURONAV 0.2882755 -0.3632690 0.9287499 -1.6217245 PRM-RTMS_NEURONAV 1.0014184 0.3498739 1.6418928 -0.9085816 SHAM 0.2100000 -0.4415445 0.8504744 -1.7000000 TACS_10-20EEG 0.2683698 -0.3831747 0.9088442 -1.6416302 TDCS_10-20EEG 0.7778605 0.1263160 1.4183349 -1.1321395 TDCS_10-20EG 2.4817499 1.8302054 3.1222242 0.5717499 ITBS_NA ITBS_NEURONAV LF-RTMS_10-10EEG LF-RTMS_10-20EEG CTBS_10-20EEG -3.326987799 -6.1371131 -5.0269878 -5.8246886 CTBS_CM 1.478515287 -1.3316101 -0.2214847 -1.0191855 CTBS_NEURONAV 0.510000000 -2.3001253 -1.1900000 -1.9877008 DTMS_CM 0.976359247 -1.8337661 -0.7236408 -1.5213416 HD-TDCS_10-10EEG 0.230000000 -2.5801253 -1.4700000 -2.2677008 HD-TDCS_10-20EEG 0.388355620 -2.4217697 -1.3116444 -2.1093452 HF-RTMS_10-20EEG -0.005331137 -2.8154565 -1.7053311 -2.5030320 HF-RTMS_CM 0.699085991 -2.1110394 -1.0009140 -1.7986148 HF-RTMS_NA -0.550000000 -3.3601253 -2.2500000 -3.0477008 HF-RTMS_NEURONAV 0.101544515 -2.7085808 -1.5984555 -2.3961563 ITBS_10-20EEG -1.190474364 -4.0005997 -2.8904744 -3.6881752 ITBS_CM 1.360000000 -1.4501253 -0.3400000 -1.1377008 ITBS_NA 0.000000000 -2.8101253 -1.7000000 -2.4977008 ITBS_NEURONAV 2.810125347 0.0000000 1.1101253 0.3124245 LF-RTMS_10-10EEG 1.700000000 -1.1101253 0.0000000 -0.7977008 LF-RTMS_10-20EEG 2.497700819 -0.3124245 0.7977008 0.0000000 LF-RTMS_CM -1.880711402 -4.6908367 -3.5807114 -4.3784122 LF-RTMS_NEURONAV -0.261724501 -3.0718498 -1.9617245 -2.7594253 PRM-RTMS_NEURONAV 0.451418407 -2.3587069 -1.2485816 -2.0462824 SHAM -0.340000000 -3.1501253 -2.0400000 -2.8377008 TACS_10-20EEG -0.281630152 -3.0917555 -1.9816302 -2.7793310 TDCS_10-20EEG 0.227860535 -2.5822648 -1.4721395 -2.2698403 TDCS_10-20EG 1.931749878 -0.8783755 0.2317499 -0.5659509 LF-RTMS_CM LF-RTMS_NEURONAV PRM-RTMS_NEURONAV SHAM CTBS_10-20EEG -1.446276 -3.06526330 -3.77840621 -2.98698780 CTBS_CM 3.359227 1.74023979 1.02709688 1.81851529 CTBS_NEURONAV 2.390711 0.77172450 0.05858159 0.85000000 DTMS_CM 2.857071 1.23808375 0.52494084 1.31635925 HD-TDCS_10-10EEG 2.110711 0.49172450 -0.22141841 0.57000000 HD-TDCS_10-20EEG 2.269067 0.65008012 -0.06306279 0.72835562 HF-RTMS_10-20EEG 1.875380 0.25639336 -0.45674954 0.33466886 HF-RTMS_CM 2.579797 0.96081049 0.24766758 1.03908599 HF-RTMS_NA 1.330711 -0.28827550 -1.00141841 -0.21000000 HF-RTMS_NEURONAV 1.982256 0.36326902 -0.34987389 0.44154451 ITBS_10-20EEG 0.690237 -0.92874986 -1.64189277 -0.85047436 ITBS_CM 3.240711 1.62172450 0.90858159 1.70000000 ITBS_NA 1.880711 0.26172450 -0.45141841 0.34000000 ITBS_NEURONAV 4.690837 3.07184985 2.35870694 3.15012535 LF-RTMS_10-10EEG 3.580711 1.96172450 1.24858159 2.04000000 LF-RTMS_10-20EEG 4.378412 2.75942532 2.04628241 2.83770082 LF-RTMS_CM 0.000000 -1.61898690 -2.33212981 -1.54071140 LF-RTMS_NEURONAV 1.618987 0.00000000 -0.71314291 0.07827550 PRM-RTMS_NEURONAV 2.332130 0.71314291 0.00000000 0.79141841 SHAM 1.540711 -0.07827550 -0.79141841 0.00000000 TACS_10-20EEG 1.599081 -0.01990565 -0.73304856 0.05836985 TDCS_10-20EEG 2.108572 0.48958504 -0.22355787 0.56786053 TDCS_10-20EG 3.812461 2.19347438 1.48033147 2.27174988 TACS_10-20EEG TDCS_10-20EEG TDCS_10-20EG CTBS_10-20EEG -3.04535765 -3.554848334 -5.2587377 CTBS_CM 1.76014544 1.250654752 -0.4532346 CTBS_NEURONAV 0.79163015 0.282139465 -1.4217499 DTMS_CM 1.25798940 0.748498712 -0.9553906 HD-TDCS_10-10EEG 0.51163015 0.002139465 -1.7017499 HD-TDCS_10-20EEG 0.66998577 0.160495085 -1.5433943 HF-RTMS_10-20EEG 0.27629902 -0.233191672 -1.9370810 HF-RTMS_CM 0.98071614 0.471225456 -1.2326639 HF-RTMS_NA -0.26836985 -0.777860535 -2.4817499 HF-RTMS_NEURONAV 0.38317467 -0.126316020 -1.8302054 ITBS_10-20EEG -0.90884421 -1.418334899 -3.1222242 ITBS_CM 1.64163015 1.132139465 -0.5717499 ITBS_NA 0.28163015 -0.227860535 -1.9317499 ITBS_NEURONAV 3.09175550 2.582264812 0.8783755 LF-RTMS_10-10EEG 1.98163015 1.472139465 -0.2317499 LF-RTMS_10-20EEG 2.77933097 2.269840285 0.5659509 LF-RTMS_CM -1.59908125 -2.108571937 -3.8124613 LF-RTMS_NEURONAV 0.01990565 -0.489585036 -2.1934744 PRM-RTMS_NEURONAV 0.73304856 0.223557872 -1.4803315 SHAM -0.05836985 -0.567860535 -2.2717499 TACS_10-20EEG 0.00000000 -0.509490687 -2.2133800 TDCS_10-20EEG 0.50949069 0.000000000 -1.7038893 TDCS_10-20EG 2.21338003 1.703889343 0.0000000

$seTE CTBS_10-20EEG CTBS_CM CTBS_NEURONAV DTMS_CM CTBS_10-20EEG 0.000000 3.155643 3.903786 2.975398 CTBS_CM 3.155643 0.000000 4.594247 3.836737 CTBS_NEURONAV 3.903786 4.594247 0.000000 4.472361 DTMS_CM 2.975398 3.836737 4.472361 0.000000 HD-TDCS_10-10EEG 3.689608 4.413703 4.976166 4.286686 HD-TDCS_10-20EEG 2.449719 3.445096 4.141274 3.280792 HF-RTMS_10-20EEG 1.853661 3.050183 3.819042 2.863307 HF-RTMS_CM 1.748203 2.987269 3.768984 2.796191 HF-RTMS_NA 3.909766 4.599330 5.141527 4.477582 HF-RTMS_NEURONAV 1.916265 3.088629 3.849817 2.904228 ITBS_10-20EEG 2.251096 3.306810 4.026966 3.135268 ITBS_CM 3.619442 4.355217 4.924366 4.226444 ITBS_NA 3.647784 4.378800 4.945235 4.250741 ITBS_NEURONAV 2.245147 3.302764 4.023644 3.130999 LF-RTMS_10-10EEG 3.677338 4.403450 4.967075 4.276129 LF-RTMS_10-20EEG 1.662586 2.937984 3.730042 2.743476 LF-RTMS_CM 2.390238 3.403057 4.106368 3.236620 LF-RTMS_NEURONAV 2.091102 3.200042 3.939763 3.022445 PRM-RTMS_NEURONAV 2.587420 3.544334 4.224188 3.384850 SHAM 1.430126 2.812974 3.632394 2.609163 TACS_10-20EEG 2.384081 3.398735 4.102788 3.232075 TDCS_10-20EEG 1.627513 2.918280 3.714542 2.722364 TDCS_10-20EG 3.089938 3.926229 4.549367 3.782881 HD-TDCS_10-10EEG HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM CTBS_10-20EEG 3.689608 2.449719 1.853661 1.748203 CTBS_CM 4.413703 3.445096 3.050183 2.987269 CTBS_NEURONAV 4.976166 4.141274 3.819042 3.768984 DTMS_CM 4.286686 3.280792 2.863307 2.796191 HD-TDCS_10-10EEG 0.000000 3.940027 3.599826 3.546674 HD-TDCS_10-20EEG 3.940027 0.000000 2.312285 2.228635 HF-RTMS_10-20EEG 3.599826 2.312285 0.000000 1.549757 HF-RTMS_CM 3.546674 2.228635 1.549757 0.000000 HF-RTMS_NA 4.980859 4.146912 3.825155 3.775177 HF-RTMS_NEURONAV 3.632459 2.362768 1.737126 1.624118 ITBS_10-20EEG 3.819701 2.641597 2.100707 2.008264 ITBS_CM 4.756369 3.874398 3.527874 3.473622 ITBS_NA 4.777972 3.900888 3.556946 3.503144 ITBS_NEURONAV 3.816199 2.636530 2.094331 2.001594 LF-RTMS_10-10EEG 4.800573 3.928539 3.587248 3.533908 LF-RTMS_10-20EEG 3.505264 2.162127 1.452490 1.315250 LF-RTMS_CM 3.903322 2.761130 2.249172 2.163083 LF-RTMS_NEURONAV 3.727653 2.506653 1.928274 1.827128 PRM-RTMS_NEURONAV 4.027087 2.933487 2.457697 2.379166 SHAM 3.401169 1.988935 1.179320 1.005461 TACS_10-20EEG 3.899555 2.755802 2.242627 2.156277 TDCS_10-20EEG 3.488766 2.135275 1.412209 1.270625 TDCS_10-20EG 4.366967 3.385014 2.982156 2.917774 HF-RTMS_NA HF-RTMS_NEURONAV ITBS_10-20EEG ITBS_CM ITBS_NA CTBS_10-20EEG 3.909766 1.916265 2.251096 3.619442 3.647784 CTBS_CM 4.599330 3.088629 3.306810 4.355217 4.378800 CTBS_NEURONAV 5.141527 3.849817 4.026966 4.924366 4.945235 DTMS_CM 4.477582 2.904228 3.135268 4.226444 4.250741 HD-TDCS_10-10EEG 4.980859 3.632459 3.819701 4.756369 4.777972 HD-TDCS_10-20EEG 4.146912 2.362768 2.641597 3.874398 3.900888 HF-RTMS_10-20EEG 3.825155 1.737126 2.100707 3.527874 3.556946 HF-RTMS_CM 3.775177 1.624118 2.008264 3.473622 3.503144 HF-RTMS_NA 0.000000 3.855881 4.032764 4.929108 4.949957 HF-RTMS_NEURONAV 3.855881 0.000000 2.156149 3.561166 3.589969 ITBS_10-20EEG 4.032764 2.156149 0.000000 3.751969 3.779317 ITBS_CM 4.929108 3.561166 3.751969 0.000000 4.723999 ITBS_NA 4.949957 3.589969 3.779317 4.723999 0.000000 ITBS_NEURONAV 4.029446 2.149938 2.453079 3.748403 3.775777 LF-RTMS_10-10EEG 4.971777 3.619995 3.807850 4.746857 4.768503 LF-RTMS_10-20EEG 3.736301 1.531581 1.934193 3.431330 3.461213 LF-RTMS_CM 4.112054 2.301040 2.586532 3.837066 3.863812 LF-RTMS_NEURONAV 3.945689 1.988531 2.312924 3.658216 3.686260 PRM-RTMS_NEURONAV 4.229715 2.505252 2.769775 3.962900 3.988803 SHAM 3.638820 1.275464 1.738439 3.324921 3.355751 TACS_10-20EEG 4.108478 2.294644 2.580843 3.833233 3.860006 TDCS_10-20EEG 3.720827 1.493435 1.904130 3.414474 3.444503 TDCS_10-20EG 4.554500 3.021467 3.244168 4.307848 4.331688 ITBS_NEURONAV LF-RTMS_10-10EEG LF-RTMS_10-20EEG LF-RTMS_CM CTBS_10-20EEG 2.245147 3.677338 1.6625858 2.390238 CTBS_CM 3.302764 4.403450 2.9379845 3.403057 CTBS_NEURONAV 4.023644 4.967075 3.7300423 4.106368 DTMS_CM 3.130999 4.276129 2.7434762 3.236620 HD-TDCS_10-10EEG 3.816199 4.800573 3.5052644 3.903322 HD-TDCS_10-20EEG 2.636530 3.928539 2.1621271 2.761130 HF-RTMS_10-20EEG 2.094331 3.587248 1.4524901 2.249172 HF-RTMS_CM 2.001594 3.533908 1.3152498 2.163083 HF-RTMS_NA 4.029446 4.971777 3.7363007 4.112054 HF-RTMS_NEURONAV 2.149938 3.619995 1.5315807 2.301040 ITBS_10-20EEG 2.453079 3.807850 1.9341929 2.586532 ITBS_CM 3.748403 4.746857 3.4313303 3.837066 ITBS_NA 3.775777 4.768503 3.4612132 3.863812 ITBS_NEURONAV 0.000000 3.804337 1.9272667 2.581357 LF-RTMS_10-10EEG 3.804337 0.000000 3.4923464 3.891726 LF-RTMS_10-20EEG 1.927267 3.492346 0.0000000 2.094494 LF-RTMS_CM 2.581357 3.891726 2.0944943 0.000000 LF-RTMS_NEURONAV 2.307135 3.715508 1.7453872 2.448555 PRM-RTMS_NEURONAV 2.764942 4.015848 2.3169831 2.884000 SHAM 1.730730 3.387854 0.8478978 1.915196 TACS_10-20EEG 2.575657 3.887947 2.0874652 2.703064 TDCS_10-20EEG 1.897094 3.475786 1.1499862 2.066764 TDCS_10-20EG 3.240043 4.356605 2.8672960 3.342220 LF-RTMS_NEURONAV PRM-RTMS_NEURONAV SHAM TACS_10-20EEG CTBS_10-20EEG 2.091102 2.587420 1.4301261 2.384081 CTBS_CM 3.200042 3.544334 2.8129739 3.398735 CTBS_NEURONAV 3.939763 4.224188 3.6323939 4.102788 DTMS_CM 3.022445 3.384850 2.6091628 3.232075 HD-TDCS_10-10EEG 3.727653 4.027087 3.4011686 3.899555 HD-TDCS_10-20EEG 2.506653 2.933487 1.9889351 2.755802 HF-RTMS_10-20EEG 1.928274 2.457697 1.1793205 2.242627 HF-RTMS_CM 1.827128 2.379166 1.0054608 2.156277 HF-RTMS_NA 3.945689 4.229715 3.6388202 4.108478 HF-RTMS_NEURONAV 1.988531 2.505252 1.2754642 2.294644 ITBS_10-20EEG 2.312924 2.769775 1.7384394 2.580843 ITBS_CM 3.658216 3.962900 3.3249206 3.833233 ITBS_NA 3.686260 3.988803 3.3557512 3.860006 ITBS_NEURONAV 2.307135 2.764942 1.7307299 2.575657 LF-RTMS_10-10EEG 3.715508 4.015848 3.3878537 3.887947 LF-RTMS_10-20EEG 1.745387 2.316983 0.8478978 2.087465 LF-RTMS_CM 2.448555 2.884000 1.9151961 2.703064 LF-RTMS_NEURONAV 0.000000 2.641387 1.5255968 2.442545 PRM-RTMS_NEURONAV 2.641387 0.000000 2.1562653 2.878899 SHAM 1.525597 2.156265 0.0000000 1.907506 TACS_10-20EEG 2.442545 2.878899 1.9075064 0.000000 TDCS_10-20EEG 1.712011 2.291946 0.7768769 2.059640 TDCS_10-20EG 3.135267 3.485963 2.7390611 3.337819 TDCS_10-20EEG TDCS_10-20EG CTBS_10-20EEG 1.6275130 3.089938 CTBS_CM 2.9182803 3.926229 CTBS_NEURONAV 3.7145421 4.549367 DTMS_CM 2.7223645 3.782881 HD-TDCS_10-10EEG 3.4887656 4.366967 HD-TDCS_10-20EEG 2.1352753 3.385014 HF-RTMS_10-20EEG 1.4122091 2.982156 HF-RTMS_CM 1.2706255 2.917774 HF-RTMS_NA 3.7208266 4.554500 HF-RTMS_NEURONAV 1.4934345 3.021467 ITBS_10-20EEG 1.9041295 3.244168 ITBS_CM 3.4144743 4.307848 ITBS_NA 3.4445034 4.331688 ITBS_NEURONAV 1.8970935 3.240043 LF-RTMS_10-10EEG 3.4757863 4.356605 LF-RTMS_10-20EEG 1.1499862 2.867296 LF-RTMS_CM 2.0667640 3.342220 LF-RTMS_NEURONAV 1.7120115 3.135267 PRM-RTMS_NEURONAV 2.2919463 3.485963 SHAM 0.7768769 2.739061 TACS_10-20EEG 2.0596403 3.337819 TDCS_10-20EEG 0.0000000 2.847103 TDCS_10-20EG 2.8471026 0.000000

$lower CTBS_10-20EEG CTBS_CM CTBS_NEURONAV DTMS_CM CTBS_10-20EEG 0.0000000 -10.990450 -11.488268 -10.135019 CTBS_CM -1.3794436 0.000000 -8.036044 -7.017711 CTBS_NEURONAV -3.8142924 -9.973074 0.000000 -9.232026 DTMS_CM -1.5283253 -8.022023 -8.299308 0.000000 HD-TDCS_10-10EEG -3.6745113 -9.899213 -10.033107 -9.148110 HD-TDCS_10-20EEG -1.0860178 -7.842423 -8.238392 -7.018237 HF-RTMS_10-20EEG -0.3114513 -7.462096 -8.000516 -6.593669 HF-RTMS_CM 0.5996597 -6.634368 -7.197986 -5.757706 HF-RTMS_NA -4.8860136 -11.043036 -11.137207 -10.302259 HF-RTMS_NEURONAV -0.3272771 -7.430573 -7.953959 -6.566997 ITBS_10-20EEG -2.2755533 -9.150219 -9.593183 -8.311845 ITBS_CM -2.4069875 -8.654585 -8.801580 -7.900037 ITBS_NA -3.8225371 -10.060805 -10.202483 -9.307658 ITBS_NEURONAV 1.7367051 -5.141688 -5.586072 -4.302880 LF-RTMS_10-10EEG -2.1804619 -8.409119 -8.545289 -7.657419 LF-RTMS_10-20EEG 2.5660804 -4.739158 -5.323048 -3.855773 LF-RTMS_CM -3.2385036 -10.029096 -10.439046 -9.200729 LF-RTMS_NEURONAV -1.0332208 -8.012207 -8.493518 -7.161968 PRM-RTMS_NEURONAV -1.2928433 -7.973864 -8.337838 -7.159125 SHAM 0.1839921 -7.331843 -7.969361 -6.430224 TACS_10-20EEG -1.6273549 -8.421545 -8.832946 -7.592741 TDCS_10-20EEG 0.3649815 -6.970379 -7.562508 -6.084235 TDCS_10-20EG -0.7974293 -7.242034 -7.494846 -6.458919 HD-TDCS_10-10EEG HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM CTBS_10-20EEG -10.788487 -8.516705 -6.9547646 -7.4524879 CTBS_CM -7.402183 -5.662104 -4.4944032 -5.0755095 CTBS_NEURONAV -9.473107 -7.995103 -6.9698537 -7.5761579 DTMS_CM -7.655391 -5.842230 -4.6302884 -5.2031597 HD-TDCS_10-10EEG 0.000000 -7.880666 -6.8201974 -7.4204400 HD-TDCS_10-20EEG -7.563955 0.000000 -4.1383076 -4.6787749 HF-RTMS_10-20EEG -7.290860 -4.925681 0.0000000 -3.7418859 HF-RTMS_CM -6.482268 -4.057314 -2.3330517 0.0000000 HF-RTMS_NA -10.542305 -9.066153 -8.0418345 -8.6482976 HF-RTMS_NEURONAV -7.247944 -4.917751 -3.2978282 -3.7807549 ITBS_10-20EEG -8.906952 -6.756265 -5.3024526 -5.8256848 ITBS_CM -8.192312 -6.622036 -5.5491745 -6.1472596 ITBS_NA -9.594653 -8.033956 -6.9661544 -7.5651220 ITBS_NEURONAV -4.899487 -2.745734 -1.2893571 -1.8120123 LF-RTMS_10-10EEG -7.938950 -6.388150 -5.3255461 -5.9254179 LF-RTMS_10-20EEG -4.602491 -2.128346 -0.3437963 -0.7792274 LF-RTMS_CM -9.761082 -7.680782 -6.2836755 -6.8193618 LF-RTMS_NEURONAV -7.797789 -5.563029 -4.0357419 -4.5419158 PRM-RTMS_NEURONAV -7.671527 -5.686465 -4.3602490 -4.9107475 SHAM -7.236168 -4.626597 -2.6460945 -3.0097529 TACS_10-20EEG -8.154617 -6.071258 -4.6717678 -5.2069420 TDCS_10-20EEG -6.839994 -4.345558 -2.5346873 -2.9616056 TDCS_10-20EG -6.857349 -5.091111 -3.9078366 -4.4860687 HF-RTMS_NA HF-RTMS_NEURONAV ITBS_10-20EEG ITBS_CM CTBS_10-20EEG -10.439989 -7.1843418 -6.5485802 -11.780963 CTBS_CM -6.986006 -4.6766315 -3.8122393 -8.417554 CTBS_NEURONAV -9.017207 -7.1370480 -6.1922344 -10.501580 DTMS_CM -7.249541 -4.8173674 -3.9781778 -8.667319 HD-TDCS_10-10EEG -8.982305 -6.9910329 -6.0660029 -10.452312 HD-TDCS_10-20EEG -7.189442 -4.3441288 -3.5986049 -8.565325 HF-RTMS_10-20EEG -6.952497 -3.5115795 -2.9321661 -8.279837 HF-RTMS_CM -6.150126 -2.5856720 -2.0465641 -7.469088 HF-RTMS_NA 0.000000 -8.2089332 -7.2635975 -11.570875 HF-RTMS_NEURONAV -6.905844 0.0000000 -2.9339564 -8.238213 ITBS_10-20EEG -8.544546 -5.5179942 0.0000000 -9.904198 ITBS_CM -7.750875 -5.7213024 -4.8032490 0.000000 ITBS_NA -9.151738 -7.1377538 -6.2168510 -10.618867 ITBS_NEURONAV -4.537445 -1.5052210 -0.8073472 -5.896609 LF-RTMS_10-10EEG -7.494504 -5.4966037 -4.5727752 -8.963668 LF-RTMS_10-20EEG -4.275314 -0.6056868 -0.1027733 -5.587583 LF-RTMS_CM -9.390189 -6.4922113 -5.7597465 -10.761222 LF-RTMS_NEURONAV -7.445132 -4.2607177 -3.6044978 -8.791696 PRM-RTMS_NEURONAV -7.288672 -4.5603304 -3.7867658 -8.675723 SHAM -6.921957 -2.9414084 -2.5568043 -8.216725 TACS_10-20EEG -7.784099 -4.8805936 -4.1495157 -9.154629 TDCS_10-20EEG -6.514826 -2.8007618 -2.3136904 -7.824386 TDCS_10-20EG -6.444906 -4.0917617 -3.2362285 -7.871477 ITBS_NA ITBS_NEURONAV LF-RTMS_10-10EEG LF-RTMS_10-20EEG CTBS_10-20EEG -10.476513 -10.537521 -12.234437 -9.083297 CTBS_CM -7.103775 -7.804908 -8.852089 -6.777529 CTBS_NEURONAV -9.182483 -10.186323 -10.925289 -9.298449 DTMS_CM -7.354940 -7.970412 -9.104701 -6.898456 HD-TDCS_10-10EEG -9.134653 -10.059738 -10.878950 -9.137893 HD-TDCS_10-20EEG -7.257245 -7.589273 -9.011439 -6.347036 HF-RTMS_10-20EEG -6.976817 -6.920270 -8.736208 -5.349860 HF-RTMS_CM -6.166950 -6.034091 -7.927246 -4.376457 HF-RTMS_NA -10.251738 -11.257695 -11.994504 -10.370716 HF-RTMS_NEURONAV -6.934665 -6.922383 -8.693515 -5.397999 ITBS_10-20EEG -8.597800 -8.808547 -10.353724 -7.479124 ITBS_CM -7.898867 -8.796860 -9.643668 -7.862985 ITBS_NA 0.000000 -10.210512 -11.046094 -9.281554 ITBS_NEURONAV -4.590262 0.000000 -6.346238 -3.464949 LF-RTMS_10-10EEG -7.646094 -8.566489 0.000000 -7.642574 LF-RTMS_10-20EEG -4.286152 -4.089798 -6.047172 0.000000 LF-RTMS_CM -9.453643 -9.750203 -11.208354 -8.483546 LF-RTMS_NEURONAV -7.486661 -7.593751 -9.243986 -6.180321 PRM-RTMS_NEURONAV -7.366491 -7.777894 -9.119498 -6.587486 SHAM -6.917151 -6.542294 -8.680071 -4.499550 TACS_10-20EEG -7.847103 -8.139950 -9.601867 -6.870688 TDCS_10-20EEG -6.523242 -6.300500 -8.284555 -4.523772 TDCS_10-20EG -6.558203 -7.228744 -8.307039 -6.185748 LF-RTMS_CM LF-RTMS_NEURONAV PRM-RTMS_NEURONAV SHAM CTBS_10-20EEG -6.1310564 -7.1637474 -8.849656 -5.7899835 CTBS_CM -3.3106428 -4.5317270 -5.919670 -3.6948123 CTBS_NEURONAV -5.6576227 -6.9500687 -8.220675 -6.2693612 DTMS_CM -3.4865873 -4.6858005 -6.109244 -3.7975060 HD-TDCS_10-10EEG -5.5396594 -6.8143402 -8.114363 -6.0961679 HD-TDCS_10-20EEG -3.1426483 -4.2628692 -5.812591 -3.1698856 HF-RTMS_10-20EEG -2.5329150 -3.5229552 -5.273748 -1.9767568 HF-RTMS_CM -1.6597670 -2.6202948 -4.415412 -0.9315810 HF-RTMS_NA -6.7287664 -8.0216830 -9.291508 -7.3419566 HF-RTMS_NEURONAV -2.5276995 -3.5341797 -5.260078 -2.0583194 ITBS_10-20EEG -4.3792724 -5.4619975 -7.070551 -4.2577530 ITBS_CM -4.2797991 -5.5482467 -6.858560 -4.8167247 ITBS_NA -5.6922207 -6.9632121 -8.269328 -6.2371515 ITBS_NEURONAV -0.3685293 -1.4500516 -3.060480 -0.2420430 LF-RTMS_10-10EEG -4.0469307 -5.3205370 -6.622335 -4.6000712 LF-RTMS_10-20EEG 0.2732787 -0.6614706 -2.494921 1.1758517 LF-RTMS_CM 0.0000000 -6.4180665 -7.984666 -5.2944267 LF-RTMS_NEURONAV -3.1800927 0.0000000 -5.890166 -2.9118393 PRM-RTMS_NEURONAV -3.3204063 -4.4638807 0.000000 -3.4347839 SHAM -2.2130039 -3.0683903 -5.017621 0.0000000 TACS_10-20EEG -3.6988274 -4.8072059 -6.375587 -3.6802739 TDCS_10-20EEG -1.9422112 -2.8658958 -4.715690 -0.9547902 TDCS_10-20EG -2.7381686 -3.9515366 -5.352030 -3.0967112 TACS_10-20EEG TDCS_10-20EEG TDCS_10-20EG CTBS_10-20EEG -7.718070 -6.74471515 -11.314905 CTBS_CM -4.901254 -4.46906952 -8.148503 CTBS_NEURONAV -7.249686 -6.99822925 -10.338345 DTMS_CM -5.076762 -4.58723766 -8.369701 HD-TDCS_10-10EEG -7.131357 -6.83571547 -10.260848 HD-TDCS_10-20EEG -4.731286 -4.02456764 -8.177899 HF-RTMS_10-20EEG -4.119170 -3.00107061 -7.781999 HF-RTMS_CM -3.245510 -2.01915473 -6.951396 HF-RTMS_NA -8.320839 -8.07054660 -11.408405 HF-RTMS_NEURONAV -4.114244 -3.05339388 -7.752172 ITBS_10-20EEG -5.967204 -5.15036021 -9.480677 ITBS_CM -5.871369 -5.56010720 -9.014976 ITBS_NA -7.283843 -6.97896319 -10.421703 ITBS_NEURONAV -1.956439 -1.13597018 -5.471993 LF-RTMS_10-10EEG -5.638606 -5.34027649 -8.770539 LF-RTMS_10-20EEG -1.312026 0.01590867 -5.053846 LF-RTMS_CM -6.896990 -6.15935503 -10.363091 LF-RTMS_NEURONAV -4.767395 -3.84506591 -8.338485 PRM-RTMS_NEURONAV -4.909490 -4.26857431 -8.312693 SHAM -3.797014 -2.09051127 -7.640211 TACS_10-20EEG 0.000000 -4.54631152 -8.755385 TDCS_10-20EEG -3.527330 0.00000000 -7.284108 TDCS_10-20EG -4.328625 -3.87632921 0.000000

$upper CTBS_10-20EEG CTBS_CM CTBS_NEURONAV DTMS_CM CTBS_10-20EEG 0.000000 1.379444 3.814292 1.528325 CTBS_CM 10.990450 0.000000 9.973074 8.022023 CTBS_NEURONAV 11.488268 8.036044 0.000000 8.299308 DTMS_CM 10.135019 7.017711 9.232026 0.000000 HD-TDCS_10-10EEG 10.788487 7.402183 9.473107 7.655391 HD-TDCS_10-20EEG 8.516705 5.662104 7.995103 5.842230 HF-RTMS_10-20EEG 6.954765 4.494403 6.969854 4.630288 HF-RTMS_CM 7.452488 5.075510 7.576158 5.203160 HF-RTMS_NA 10.439989 6.986006 9.017207 7.249541 HF-RTMS_NEURONAV 7.184342 4.676631 7.137048 4.817367 ITBS_10-20EEG 6.548580 3.812239 6.192234 3.978178 ITBS_CM 11.780963 8.417554 10.501580 8.667319 ITBS_NA 10.476513 7.103775 9.182483 7.354940 ITBS_NEURONAV 10.537521 7.804908 10.186323 7.970412 LF-RTMS_10-10EEG 12.234437 8.852089 10.925289 9.104701 LF-RTMS_10-20EEG 9.083297 6.777529 9.298449 6.898456 LF-RTMS_CM 6.131056 3.310643 5.657623 3.486587 LF-RTMS_NEURONAV 7.163747 4.531727 6.950069 4.685800 PRM-RTMS_NEURONAV 8.849656 5.919670 8.220675 6.109244 SHAM 5.789984 3.694812 6.269361 3.797506 TACS_10-20EEG 7.718070 4.901254 7.249686 5.076762 TDCS_10-20EEG 6.744715 4.469070 6.998229 4.587238 TDCS_10-20EG 11.314905 8.148503 10.338345 8.369701 HD-TDCS_10-10EEG HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM CTBS_10-20EEG 3.674511 1.086018 0.3114513 -0.5996597 CTBS_CM 9.899213 7.842423 7.4620961 6.6343681 CTBS_NEURONAV 10.033107 8.238392 8.0005160 7.1979859 DTMS_CM 9.148110 7.018237 6.5936692 5.7577062 HD-TDCS_10-10EEG 0.000000 7.563955 7.2908597 6.4822681 HD-TDCS_10-20EEG 7.880666 0.000000 4.9256812 4.0573142 HF-RTMS_10-20EEG 6.820197 4.138308 0.0000000 2.3330517 HF-RTMS_CM 7.420440 4.678775 3.7418859 0.0000000 HF-RTMS_NA 8.982305 7.189442 6.9524968 6.1501257 HF-RTMS_NEURONAV 6.991033 4.344129 3.5115795 2.5856720 ITBS_10-20EEG 6.066003 3.598605 2.9321661 2.0465641 ITBS_CM 10.452312 8.565325 8.2798368 7.4690877 ITBS_NA 9.134653 7.257245 6.9768167 6.1669500 ITBS_NEURONAV 10.059738 7.589273 6.9202701 6.0340910 LF-RTMS_10-10EEG 10.878950 9.011439 8.7362084 7.9272459 LF-RTMS_10-20EEG 9.137893 6.347036 5.3498602 4.3764571 LF-RTMS_CM 5.539659 3.142648 2.5329150 1.6597670 LF-RTMS_NEURONAV 6.814340 4.262869 3.5229552 2.6202948 PRM-RTMS_NEURONAV 8.114363 5.812591 5.2737481 4.4154124 SHAM 6.096168 3.169886 1.9767568 0.9315810 TACS_10-20EEG 7.131357 4.731286 4.1191698 3.2455098 TDCS_10-20EEG 6.835715 4.024568 3.0010706 2.0191547 TDCS_10-20EG 10.260848 8.177899 7.7819987 6.9513964 HF-RTMS_NA HF-RTMS_NEURONAV ITBS_10-20EEG ITBS_CM ITBS_NA CTBS_10-20EEG 4.886014 0.3272771 2.275553 2.406987 3.822537 CTBS_CM 11.043036 7.4305730 9.150219 8.654585 10.060805 CTBS_NEURONAV 11.137207 7.9539590 9.593183 8.801580 10.202483 DTMS_CM 10.302259 6.5669968 8.311845 7.900037 9.307658 HD-TDCS_10-10EEG 10.542305 7.2479438 8.906952 8.192312 9.594653 HD-TDCS_10-20EEG 9.066153 4.9177510 6.756265 6.622036 8.033956 HF-RTMS_10-20EEG 8.041835 3.2978282 5.302453 5.549175 6.966154 HF-RTMS_CM 8.648298 3.7807549 5.825685 6.147260 7.565122 HF-RTMS_NA 0.000000 6.9058442 8.544546 7.750875 9.151738 HF-RTMS_NEURONAV 8.208933 0.0000000 5.517994 5.721302 7.137754 ITBS_10-20EEG 7.263598 2.9339564 0.000000 4.803249 6.216851 ITBS_CM 11.570875 8.2382133 9.904198 0.000000 10.618867 ITBS_NA 10.251738 6.9346648 8.597800 7.898867 0.000000 ITBS_NEURONAV 11.257695 6.9223827 8.808547 8.796860 10.210512 LF-RTMS_10-10EEG 11.994504 8.6935147 10.353724 9.643668 11.046094 LF-RTMS_10-20EEG 10.370716 5.3979994 7.479124 7.862985 9.281554 LF-RTMS_CM 6.728766 2.5276995 4.379272 4.279799 5.692221 LF-RTMS_NEURONAV 8.021683 3.5341797 5.461998 5.548247 6.963212 PRM-RTMS_NEURONAV 9.291508 5.2600782 7.070551 6.858560 8.269328 SHAM 7.341957 2.0583194 4.257753 4.816725 6.237151 TACS_10-20EEG 8.320839 4.1142442 5.967204 5.871369 7.283843 TDCS_10-20EEG 8.070547 3.0533939 5.150360 5.560107 6.978963 TDCS_10-20EG 11.408405 7.7521724 9.480677 9.014976 10.421703 ITBS_NEURONAV LF-RTMS_10-10EEG LF-RTMS_10-20EEG LF-RTMS_CM CTBS_10-20EEG -1.7367051 2.180462 -2.56608040 3.238504 CTBS_CM 5.1416879 8.409119 4.73915824 10.029096 CTBS_NEURONAV 5.5860721 8.545289 5.32304783 10.439046 DTMS_CM 4.3028799 7.657419 3.85577288 9.200729 HD-TDCS_10-10EEG 4.8994870 7.938950 4.60249112 9.761082 HD-TDCS_10-20EEG 2.7457336 6.388150 2.12834606 7.680782 HF-RTMS_10-20EEG 1.2893571 5.325546 0.34379628 6.283676 HF-RTMS_CM 1.8120123 5.925418 0.77922743 6.819362 HF-RTMS_NA 4.5374446 7.494504 4.27531408 9.390189 HF-RTMS_NEURONAV 1.5052210 5.496604 0.60568680 6.492211 ITBS_10-20EEG 0.8073472 4.572775 0.10277326 5.759746 ITBS_CM 5.8966091 8.963668 5.58758301 10.761222 ITBS_NA 4.5902617 7.646094 4.28615238 9.453643 ITBS_NEURONAV 0.0000000 8.566489 4.08979778 9.750203 LF-RTMS_10-10EEG 6.3462378 0.000000 6.04717232 11.208354 LF-RTMS_10-20EEG 3.4649487 7.642574 0.00000000 8.483546 LF-RTMS_CM 0.3685293 4.046931 -0.27327874 0.000000 LF-RTMS_NEURONAV 1.4500516 5.320537 0.66147063 6.418067 PRM-RTMS_NEURONAV 3.0604805 6.622335 2.49492104 7.984666 SHAM 0.2420430 4.600071 -1.17585171 5.294427 TACS_10-20EEG 1.9564386 5.638606 1.31202573 6.896990 TDCS_10-20EEG 1.1359702 5.340276 -0.01590867 6.159355 TDCS_10-20EG 5.4719930 8.770539 5.05384588 10.363091 LF-RTMS_NEURONAV PRM-RTMS_NEURONAV SHAM TACS_10-20EEG CTBS_10-20EEG 1.033221 1.292843 -0.1839921 1.627355 CTBS_CM 8.012207 7.973864 7.3318428 8.421545 CTBS_NEURONAV 8.493518 8.337838 7.9693612 8.832946 DTMS_CM 7.161968 7.159125 6.4302245 7.592741 HD-TDCS_10-10EEG 7.797789 7.671527 7.2361679 8.154617 HD-TDCS_10-20EEG 5.563029 5.686465 4.6265969 6.071258 HF-RTMS_10-20EEG 4.035742 4.360249 2.6460945 4.671768 HF-RTMS_CM 4.541916 4.910748 3.0097529 5.206942 HF-RTMS_NA 7.445132 7.288672 6.9219566 7.784099 HF-RTMS_NEURONAV 4.260718 4.560330 2.9414084 4.880594 ITBS_10-20EEG 3.604498 3.786766 2.5568043 4.149516 ITBS_CM 8.791696 8.675723 8.2167247 9.154629 ITBS_NA 7.486661 7.366491 6.9171515 7.847103 ITBS_NEURONAV 7.593751 7.777894 6.5422937 8.139950 LF-RTMS_10-10EEG 9.243986 9.119498 8.6800712 9.601867 LF-RTMS_10-20EEG 6.180321 6.587486 4.4995499 6.870688 LF-RTMS_CM 3.180093 3.320406 2.2130039 3.698827 LF-RTMS_NEURONAV 0.000000 4.463881 3.0683903 4.807206 PRM-RTMS_NEURONAV 5.890166 0.000000 5.0176208 6.375587 SHAM 2.911839 3.434784 0.0000000 3.680274 TACS_10-20EEG 4.767395 4.909490 3.7970136 0.000000 TDCS_10-20EEG 3.845066 4.268574 2.0905113 4.546312 TDCS_10-20EG 8.338485 8.312693 7.6402109 8.755385 TDCS_10-20EEG TDCS_10-20EG CTBS_10-20EEG -0.3649815 0.7974293 CTBS_CM 6.9703790 7.2420337 CTBS_NEURONAV 7.5625082 7.4948457 DTMS_CM 6.0842351 6.4589193 HD-TDCS_10-10EEG 6.8399944 6.8573487 HD-TDCS_10-20EEG 4.3455578 5.0911109 HF-RTMS_10-20EEG 2.5346873 3.9078366 HF-RTMS_CM 2.9616056 4.4860687 HF-RTMS_NA 6.5148255 6.4449056 HF-RTMS_NEURONAV 2.8007618 4.0917617 ITBS_10-20EEG 2.3136904 3.2362285 ITBS_CM 7.8243861 7.8714766 ITBS_NA 6.5232421 6.5582028 ITBS_NEURONAV 6.3004998 7.2287440 LF-RTMS_10-10EEG 8.2845554 8.3070392 LF-RTMS_10-20EEG 4.5237719 6.1857478 LF-RTMS_CM 1.9422112 2.7381686 LF-RTMS_NEURONAV 2.8658958 3.9515366 PRM-RTMS_NEURONAV 4.7156901 5.3520298 SHAM 0.9547902 3.0967112 TACS_10-20EEG 3.5273301 4.3286251 TDCS_10-20EEG 0.0000000 3.8763292 TDCS_10-20EG 7.2841079 0.0000000

$statistic CTBS_10-20EEG CTBS_CM CTBS_NEURONAV DTMS_CM CTBS_10-20EEG NaN -1.52282848 -0.98288884 -1.44630986 CTBS_CM 1.5228285 NaN 0.21081044 0.13088101 CTBS_NEURONAV 0.9828888 -0.21081044 NaN -0.10427584 DTMS_CM 1.4463099 -0.13088101 0.10427584 NaN HD-TDCS_10-10EEG 0.9640557 -0.28287255 -0.05626821 -0.17411101 HD-TDCS_10-20EEG 1.5166406 -0.31643813 -0.02937366 -0.17922614 HF-RTMS_10-20EEG 1.7919444 -0.48647777 -0.13493728 -0.34285194 HF-RTMS_CM 2.3029790 -0.26091705 0.05016896 -0.09916107 HF-RTMS_NA 0.7102695 -0.44104584 -0.20616444 -0.34088915 HF-RTMS_NEURONAV 1.7891749 -0.44581937 -0.10609737 -0.30122110 ITBS_10-20EEG 0.9490993 -0.80711909 -0.42227182 -0.69111602 ITBS_CM 1.2949477 -0.02721225 0.17261105 0.09077152 ITBS_NA 0.9120573 -0.33765309 -0.10312957 -0.22969155 ITBS_NEURONAV 2.7335012 0.40318054 0.57165229 0.58568077 LF-RTMS_10-10EEG 1.3670182 0.05029799 0.23957760 0.16922798 LF-RTMS_10-20EEG 3.5033914 0.34689956 0.53288961 0.55453063 LF-RTMS_CM 0.6050764 -0.98712026 -0.58219604 -0.88273290 LF-RTMS_NEURONAV 1.4658604 -0.54381782 -0.19588096 -0.40962981 PRM-RTMS_NEURONAV 1.4602989 -0.28978559 -0.01386813 -0.15508540 SHAM 2.0886184 -0.64647428 -0.23400546 -0.50451402 TACS_10-20EEG 1.2773718 -0.51788245 -0.19294934 -0.38922032 TDCS_10-20EEG 2.1842212 -0.42855882 -0.07595538 -0.27494434 TDCS_10-20EG 1.7018911 0.11543762 0.31251597 0.25255637 HD-TDCS_10-10EEG HD-TDCS_10-20EEG HF-RTMS_10-20EEG CTBS_10-20EEG -0.9640557012 -1.51664058 -1.791944378 CTBS_CM 0.2828725503 0.31643813 0.486477767 CTBS_NEURONAV 0.0562682138 0.02937366 0.134937278 DTMS_CM 0.1741110066 0.17922614 0.342851937 HD-TDCS_10-10EEG NaN -0.04019151 0.065372927 HD-TDCS_10-20EEG 0.0401915090 NaN 0.170258786 HF-RTMS_10-20EEG -0.0653729268 -0.17025879 NaN HF-RTMS_CM 0.1322608002 0.13942631 0.454533786 HF-RTMS_NA -0.1565994816 -0.22627818 -0.142391325 HF-RTMS_NEURONAV -0.0353632330 -0.12138776 0.061524420 ITBS_10-20EEG -0.3718809901 -0.59768012 -0.564164081 ITBS_CM 0.2375761913 0.25078590 0.387012461 ITBS_NA -0.0481375808 -0.09955569 0.001498796 ITBS_NEURONAV 0.6760982408 0.91854443 1.344322505 LF-RTMS_10-10EEG 0.3062134508 0.33387590 0.475386998 LF-RTMS_10-20EEG 0.6469414497 0.97558797 1.723269573 LF-RTMS_CM -0.5407474282 -0.82178927 -0.833809346 LF-RTMS_NEURONAV -0.1319126440 -0.25934190 -0.132965181 PRM-RTMS_NEURONAV 0.0549822788 0.02149755 0.185844494 SHAM -0.1675894582 -0.36620381 -0.283781102 TACS_10-20EEG -0.1312021931 -0.24311827 -0.123203268 TDCS_10-20EEG -0.0006132441 -0.07516365 0.165125458 TDCS_10-20EG 0.3896868855 0.45594918 0.649557316 HF-RTMS_CM HF-RTMS_NA HF-RTMS_NEURONAV ITBS_10-20EEG CTBS_10-20EEG -2.30297900 -0.71026949 -1.78917486 -0.9490993 CTBS_CM 0.26091705 0.44104584 0.44581937 0.8071191 CTBS_NEURONAV -0.05016896 0.20616444 0.10609737 0.4222718 DTMS_CM 0.09916107 0.34088915 0.30122110 0.6911160 HD-TDCS_10-10EEG -0.13226080 0.15659948 0.03536323 0.3718810 HD-TDCS_10-20EEG -0.13942631 0.22627818 0.12138776 0.5976801 HF-RTMS_10-20EEG -0.45453379 0.14239132 -0.06152442 0.5641641 HF-RTMS_CM NaN 0.33086816 0.36791745 0.9408926 HF-RTMS_NA -0.33086816 NaN -0.16897421 0.1588177 HF-RTMS_NEURONAV -0.36791745 0.16897421 NaN 0.5992251 ITBS_10-20EEG -0.94089256 -0.15881772 -0.59922510 NaN ITBS_CM 0.19026654 0.38749401 0.35338295 0.6797696 ITBS_NA -0.19955960 0.11111207 -0.02828563 0.3149972 ITBS_NEURONAV 1.05467923 0.83389254 1.25984114 1.6308481 LF-RTMS_10-10EEG 0.28323150 0.45255450 0.44156294 0.7590830 LF-RTMS_10-20EEG 1.36750814 0.81570008 1.56449884 1.9068290 LF-RTMS_CM -1.19264845 -0.32361233 -0.86146089 -0.2668581 LF-RTMS_NEURONAV -0.52585831 0.07306089 -0.18268212 0.4015479 PRM-RTMS_NEURONAV -0.10409848 0.23675787 0.13965615 0.5927893 SHAM -1.03344257 0.05771101 -0.34618338 0.4892171 TACS_10-20EEG -0.45481911 0.06532099 -0.16698657 0.3521501 TDCS_10-20EEG -0.37086101 0.20905584 0.08458089 0.7448731 TDCS_10-20EG 0.42246718 0.54490065 0.60573397 0.9624113 ITBS_CM ITBS_NA ITBS_NEURONAV LF-RTMS_10-10EEG CTBS_10-20EEG -1.29494774 -0.912057279 -2.7335012 -1.36701822 CTBS_CM 0.02721225 0.337653086 -0.4031805 -0.05029799 CTBS_NEURONAV -0.17261105 0.103129574 -0.5716523 -0.23957760 DTMS_CM -0.09077152 0.229691554 -0.5856808 -0.16922798 HD-TDCS_10-10EEG -0.23757619 0.048137581 -0.6760982 -0.30621345 HD-TDCS_10-20EEG -0.25078590 0.099555690 -0.9185444 -0.33387590 HF-RTMS_10-20EEG -0.38701246 -0.001498796 -1.3443225 -0.47538700 HF-RTMS_CM -0.19026654 0.199559596 -1.0546792 -0.28323150 HF-RTMS_NA -0.38749401 -0.111112066 -0.8338925 -0.45255450 HF-RTMS_NEURONAV -0.35338295 0.028285627 -1.2598411 -0.44156294 ITBS_10-20EEG -0.67976964 -0.314997216 -1.6308481 -0.75908297 ITBS_CM NaN 0.287891700 -0.3868649 -0.07162634 ITBS_NA -0.28789170 NaN -0.7442509 -0.35650603 ITBS_NEURONAV 0.38686487 0.744250870 NaN 0.29180522 LF-RTMS_10-10EEG 0.07162634 0.356506031 -0.2918052 NaN LF-RTMS_10-20EEG 0.33156261 0.721625823 -0.1621076 0.22841400 LF-RTMS_CM -0.84458065 -0.486750254 -1.8171982 -0.92008320 LF-RTMS_NEURONAV -0.44331024 -0.071000014 -1.3314565 -0.52798288 PRM-RTMS_NEURONAV -0.22927189 0.113171408 -0.8530764 -0.31091358 SHAM -0.51129040 -0.101318596 -1.8201137 -0.60215115 TACS_10-20EEG -0.42826252 -0.072961065 -1.2003757 -0.50968546 TDCS_10-20EEG -0.33157065 0.066151926 -1.3611690 -0.42354142 TDCS_10-20EG 0.13272286 0.445957752 -0.2710999 0.05319506 LF-RTMS_10-20EEG LF-RTMS_CM LF-RTMS_NEURONAV CTBS_10-20EEG -3.5033914 -0.6050764 -1.465860439 CTBS_CM -0.3468996 0.9871203 0.543817822 CTBS_NEURONAV -0.5328896 0.5821960 0.195880956 DTMS_CM -0.5545306 0.8827329 0.409629810 HD-TDCS_10-10EEG -0.6469414 0.5407474 0.131912644 HD-TDCS_10-20EEG -0.9755880 0.8217893 0.259341901 HF-RTMS_10-20EEG -1.7232696 0.8338093 0.132965181 HF-RTMS_CM -1.3675081 1.1926485 0.525858310 HF-RTMS_NA -0.8157001 0.3236123 -0.073060885 HF-RTMS_NEURONAV -1.5644988 0.8614609 0.182682120 ITBS_10-20EEG -1.9068290 0.2668581 -0.401547945 ITBS_CM -0.3315626 0.8445806 0.443310235 ITBS_NA -0.7216258 0.4867503 0.071000014 ITBS_NEURONAV 0.1621076 1.8171982 1.331456494 LF-RTMS_10-10EEG -0.2284140 0.9200832 0.527982876 LF-RTMS_10-20EEG NaN 2.0904388 1.580981801 LF-RTMS_CM -2.0904388 NaN -0.661200955 LF-RTMS_NEURONAV -1.5809818 0.6612010 NaN PRM-RTMS_NEURONAV -0.8831667 0.8086442 0.269988035 SHAM -3.3467487 0.8044667 -0.051308116 TACS_10-20EEG -1.3314382 0.5915809 -0.008149553 TDCS_10-20EEG -1.9737978 1.0202287 0.285970647 TDCS_10-20EG -0.1973814 1.1406974 0.699613193 PRM-RTMS_NEURONAV SHAM TACS_10-20EEG TDCS_10-20EEG CTBS_10-20EEG -1.46029891 -2.08861842 -1.277371824 -2.1842211912 CTBS_CM 0.28978559 0.64647428 0.517882449 0.4285588173 CTBS_NEURONAV 0.01386813 0.23400546 0.192949340 0.0759553825 DTMS_CM 0.15508540 0.50451402 0.389220316 0.2749443407 HD-TDCS_10-10EEG -0.05498228 0.16758946 0.131202193 0.0006132441 HD-TDCS_10-20EEG -0.02149755 0.36620381 0.243118273 0.0751636493 HF-RTMS_10-20EEG -0.18584449 0.28378110 0.123203268 -0.1651254584 HF-RTMS_CM 0.10409848 1.03344257 0.454819113 0.3708610142 HF-RTMS_NA -0.23675787 -0.05771101 -0.065320986 -0.2090558431 HF-RTMS_NEURONAV -0.13965615 0.34618338 0.166986568 -0.0845808900 ITBS_10-20EEG -0.59278930 -0.48921714 -0.352150096 -0.7448731156 ITBS_CM 0.22927189 0.51129040 0.428262519 0.3315706500 ITBS_NA -0.11317141 0.10131860 0.072961065 -0.0661519258 ITBS_NEURONAV 0.85307635 1.82011374 1.200375688 1.3611689536 LF-RTMS_10-10EEG 0.31091358 0.60215115 0.509685463 0.4235414208 LF-RTMS_10-20EEG 0.88316674 3.34674873 1.331438201 1.9737977749 LF-RTMS_CM -0.80864418 -0.80446668 -0.591580922 -1.0202286719 LF-RTMS_NEURONAV -0.26998803 0.05130812 0.008149553 -0.2859706473 PRM-RTMS_NEURONAV NaN 0.36703202 0.254628074 0.0975406244 SHAM -0.36703202 NaN -0.030600081 -0.7309530501 TACS_10-20EEG -0.25462807 0.03060008 NaN -0.2473687683 TDCS_10-20EEG -0.09754062 0.73095305 0.247368768 NaN TDCS_10-20EG 0.42465500 0.82939001 0.663121637 0.5984643279 TDCS_10-20EG CTBS_10-20EEG -1.70189105 CTBS_CM -0.11543762 CTBS_NEURONAV -0.31251597 DTMS_CM -0.25255637 HD-TDCS_10-10EEG -0.38968689 HD-TDCS_10-20EEG -0.45594918 HF-RTMS_10-20EEG -0.64955732 HF-RTMS_CM -0.42246718 HF-RTMS_NA -0.54490065 HF-RTMS_NEURONAV -0.60573397 ITBS_10-20EEG -0.96241134 ITBS_CM -0.13272286 ITBS_NA -0.44595775 ITBS_NEURONAV 0.27109990 LF-RTMS_10-10EEG -0.05319506 LF-RTMS_10-20EEG 0.19738142 LF-RTMS_CM -1.14069744 LF-RTMS_NEURONAV -0.69961319 PRM-RTMS_NEURONAV -0.42465500 SHAM -0.82939001 TACS_10-20EEG -0.66312164 TDCS_10-20EEG -0.59846433 TDCS_10-20EG NaN

$p CTBS_10-20EEG CTBS_CM CTBS_NEURONAV DTMS_CM CTBS_10-20EEG NaN 0.1278016 0.3256622 0.1480903 CTBS_CM 0.127801623 NaN 0.8330352 0.8958694 CTBS_NEURONAV 0.325662151 0.8330352 NaN 0.9169504 DTMS_CM 0.148090312 0.8958694 0.9169504 NaN HD-TDCS_10-10EEG 0.335018000 0.7772745 0.9551281 0.8617782 HD-TDCS_10-20EEG 0.129357455 0.7516700 0.9765666 0.8577601 HF-RTMS_10-20EEG 0.073141876 0.6266285 0.8926615 0.7317099 HF-RTMS_CM 0.021280025 0.7941565 0.9599877 0.9210104 HF-RTMS_NA 0.477537035 0.6591798 0.8366625 0.7331870 HF-RTMS_NEURONAV 0.073586659 0.6557277 0.9155051 0.7632459 ITBS_10-20EEG 0.342570116 0.4195979 0.6728266 0.4894926 ITBS_CM 0.195338257 0.9782904 0.8629572 0.9276741 ITBS_NA 0.361738566 0.7356246 0.9178601 0.8183315 ITBS_NEURONAV 0.006266490 0.6868154 0.5675576 0.5580901 LF-RTMS_10-10EEG 0.171619595 0.9598849 0.8106577 0.8656173 LF-RTMS_10-20EEG 0.000459374 0.7286668 0.5941100 0.5792157 LF-RTMS_CM 0.545128257 0.3235837 0.5604346 0.3773806 LF-RTMS_NEURONAV 0.142686312 0.5865668 0.8447033 0.6820775 PRM-RTMS_NEURONAV 0.144207942 0.7719803 0.9889352 0.8767540 SHAM 0.036742086 0.5179722 0.8149807 0.6139002 TACS_10-20EEG 0.201471007 0.6045403 0.8469986 0.6971132 TDCS_10-20EEG 0.028945998 0.6682443 0.9394546 0.7833590 TDCS_10-20EG 0.088775794 0.9080983 0.7546484 0.8006110 HD-TDCS_10-10EEG HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM CTBS_10-20EEG 0.3350180 0.1293575 0.07314188 0.02128002 CTBS_CM 0.7772745 0.7516700 0.62662846 0.79415648 CTBS_NEURONAV 0.9551281 0.9765666 0.89266147 0.95998774 DTMS_CM 0.8617782 0.8577601 0.73170985 0.92101038 HD-TDCS_10-10EEG NaN 0.9679404 0.94787708 0.89477801 HD-TDCS_10-20EEG 0.9679404 NaN 0.86480662 0.88911328 HF-RTMS_10-20EEG 0.9478771 0.8648066 NaN 0.64944468 HF-RTMS_CM 0.8947780 0.8891133 0.64944468 NaN HF-RTMS_NA 0.8755605 0.8209851 0.88677091 0.74074407 HF-RTMS_NEURONAV 0.9717901 0.9033839 0.95094157 0.71293479 ITBS_10-20EEG 0.7099815 0.5500534 0.57264247 0.34675992 ITBS_CM 0.8122098 0.8019796 0.69874698 0.84910027 ITBS_NA 0.9616066 0.9206971 0.99880413 0.84182503 ITBS_NEURONAV 0.4989783 0.3583339 0.17884412 0.29157206 LF-RTMS_10-10EEG 0.7594421 0.7384732 0.63451116 0.77699938 LF-RTMS_10-20EEG 0.5176698 0.3292687 0.08483979 0.17146609 LF-RTMS_CM 0.5886817 0.4111968 0.40438843 0.23300708 LF-RTMS_NEURONAV 0.8950534 0.7953715 0.89422092 0.59898666 PRM-RTMS_NEURONAV 0.9561526 0.9828488 0.85256671 0.91709120 SHAM 0.8669063 0.7142130 0.77657814 0.30139683 TACS_10-20EEG 0.8956154 0.8079138 0.90194614 0.64923938 TDCS_10-20EEG 0.9995107 0.9400845 0.86884524 0.71074105 TDCS_10-20EG 0.6967681 0.6484265 0.51597821 0.67268405 HF-RTMS_NA HF-RTMS_NEURONAV ITBS_10-20EEG ITBS_CM ITBS_NA CTBS_10-20EEG 0.4775370 0.07358666 0.34257012 0.1953383 0.3617386 CTBS_CM 0.6591798 0.65572773 0.41959787 0.9782904 0.7356246 CTBS_NEURONAV 0.8366625 0.91550510 0.67282662 0.8629572 0.9178601 DTMS_CM 0.7331870 0.76324590 0.48949263 0.9276741 0.8183315 HD-TDCS_10-10EEG 0.8755605 0.97179010 0.70998146 0.8122098 0.9616066 HD-TDCS_10-20EEG 0.8209851 0.90338391 0.55005340 0.8019796 0.9206971 HF-RTMS_10-20EEG 0.8867709 0.95094157 0.57264247 0.6987470 0.9988041 HF-RTMS_CM 0.7407441 0.71293479 0.34675992 0.8491003 0.8418250 HF-RTMS_NA NaN 0.86581693 0.87381249 0.6983905 0.9115275 HF-RTMS_NEURONAV 0.8658169 NaN 0.54902279 0.7238014 0.9774343 ITBS_10-20EEG 0.8738125 0.54902279 NaN 0.4966503 0.7527638 ITBS_CM 0.6983905 0.72380137 0.49665033 NaN 0.7734296 ITBS_NA 0.9115275 0.97743434 0.75276377 0.7734296 NaN ITBS_NEURONAV 0.4043415 0.20772668 0.10292237 0.6988562 0.4567247 LF-RTMS_10-10EEG 0.6508696 0.65880551 0.44780292 0.9428993 0.7214616 LF-RTMS_10-20EEG 0.4146717 0.11770047 0.05654273 0.7402196 0.4705246 LF-RTMS_CM 0.7462316 0.38898425 0.78957841 0.3983450 0.6264353 LF-RTMS_NEURONAV 0.9417577 0.85504745 0.68801675 0.6575414 0.9433977 PRM-RTMS_NEURONAV 0.8128446 0.88893167 0.55332217 0.8186576 0.9098947 SHAM 0.9539788 0.72920490 0.62468797 0.6091477 0.9192976 TACS_10-20EEG 0.9479184 0.86738062 0.72472570 0.6684600 0.9418371 TDCS_10-20EEG 0.8344046 0.93259459 0.45634843 0.7402135 0.9472569 TDCS_10-20EG 0.5858219 0.54469142 0.33584302 0.8944126 0.6556278 ITBS_NEURONAV LF-RTMS_10-10EEG LF-RTMS_10-20EEG LF-RTMS_CM CTBS_10-20EEG 0.00626649 0.1716196 0.0004593740 0.54512826 CTBS_CM 0.68681542 0.9598849 0.7286667751 0.32358368 CTBS_NEURONAV 0.56755756 0.8106577 0.5941099959 0.56043464 DTMS_CM 0.55809006 0.8656173 0.5792157463 0.37738060 HD-TDCS_10-10EEG 0.49897827 0.7594421 0.5176698381 0.58868168 HD-TDCS_10-20EEG 0.35833391 0.7384732 0.3292686873 0.41119684 HF-RTMS_10-20EEG 0.17884412 0.6345112 0.0848397874 0.40438843 HF-RTMS_CM 0.29157206 0.7769994 0.1714660863 0.23300708 HF-RTMS_NA 0.40434154 0.6508696 0.4146716932 0.74623155 HF-RTMS_NEURONAV 0.20772668 0.6588055 0.1177004653 0.38898425 ITBS_10-20EEG 0.10292237 0.4478029 0.0565427316 0.78957841 ITBS_CM 0.69885625 0.9428993 0.7402195601 0.39834502 ITBS_NA 0.45672472 0.7214616 0.4705245583 0.62643533 ITBS_NEURONAV NaN 0.7704356 0.8712211400 0.06918676 LF-RTMS_10-10EEG 0.77043555 NaN 0.8193244041 0.35752928 LF-RTMS_10-20EEG 0.87122114 0.8193244 NaN 0.03657840 LF-RTMS_CM 0.06918676 0.3575293 0.0365784015 NaN LF-RTMS_NEURONAV 0.18303885 0.5975112 0.1138821990 0.50848345 PRM-RTMS_NEURONAV 0.39361696 0.7558663 0.3771461910 0.41871985 SHAM 0.06874169 0.5470735 0.0008176529 0.42112751 TACS_10-20EEG 0.22999347 0.6102718 0.1830448666 0.55413125 TDCS_10-20EEG 0.17346030 0.6719003 0.0484047420 0.30762002 TDCS_10-20EG 0.78631420 0.9575765 0.8435290704 0.25399585 LF-RTMS_NEURONAV PRM-RTMS_NEURONAV SHAM TACS_10-20EEG CTBS_10-20EEG 0.1426863 0.1442079 0.0367420860 0.2014710 CTBS_CM 0.5865668 0.7719803 0.5179722467 0.6045403 CTBS_NEURONAV 0.8447033 0.9889352 0.8149807395 0.8469986 DTMS_CM 0.6820775 0.8767540 0.6139002097 0.6971132 HD-TDCS_10-10EEG 0.8950534 0.9561526 0.8669062650 0.8956154 HD-TDCS_10-20EEG 0.7953715 0.9828488 0.7142130011 0.8079138 HF-RTMS_10-20EEG 0.8942209 0.8525667 0.7765781380 0.9019461 HF-RTMS_CM 0.5989867 0.9170912 0.3013968336 0.6492394 HF-RTMS_NA 0.9417577 0.8128446 0.9539788215 0.9479184 HF-RTMS_NEURONAV 0.8550474 0.8889317 0.7292049018 0.8673806 ITBS_10-20EEG 0.6880167 0.5533222 0.6246879727 0.7247257 ITBS_CM 0.6575414 0.8186576 0.6091477240 0.6684600 ITBS_NA 0.9433977 0.9098947 0.9192975547 0.9418371 ITBS_NEURONAV 0.1830389 0.3936170 0.0687416863 0.2299935 LF-RTMS_10-10EEG 0.5975112 0.7558663 0.5470735287 0.6102718 LF-RTMS_10-20EEG 0.1138822 0.3771462 0.0008176529 0.1830449 LF-RTMS_CM 0.5084834 0.4187198 0.4211275069 0.5541313 LF-RTMS_NEURONAV NaN 0.7871695 0.9590800008 0.9934977 PRM-RTMS_NEURONAV 0.7871695 NaN 0.7135951356 0.7990104 SHAM 0.9590800 0.7135951 NaN 0.9755885 TACS_10-20EEG 0.9934977 0.7990104 0.9755884779 NaN TDCS_10-20EEG 0.7749006 0.9222971 0.4648078308 0.8046228 TDCS_10-20EG 0.4841689 0.6710882 0.4068837533 0.5072527 TDCS_10-20EEG TDCS_10-20EG CTBS_10-20EEG 0.02894600 0.08877579 CTBS_CM 0.66824432 0.90809826 CTBS_NEURONAV 0.93945460 0.75464843 DTMS_CM 0.78335900 0.80061105 HD-TDCS_10-10EEG 0.99951070 0.69676810 HD-TDCS_10-20EEG 0.94008451 0.64842653 HF-RTMS_10-20EEG 0.86884524 0.51597821 HF-RTMS_CM 0.71074105 0.67268405 HF-RTMS_NA 0.83440465 0.58582185 HF-RTMS_NEURONAV 0.93259459 0.54469142 ITBS_10-20EEG 0.45634843 0.33584302 ITBS_CM 0.74021348 0.89441256 ITBS_NA 0.94725687 0.65562776 ITBS_NEURONAV 0.17346030 0.78631420 LF-RTMS_10-10EEG 0.67190028 0.95757649 LF-RTMS_10-20EEG 0.04840474 0.84352907 LF-RTMS_CM 0.30762002 0.25399585 LF-RTMS_NEURONAV 0.77490060 0.48416890 PRM-RTMS_NEURONAV 0.92229707 0.67108819 SHAM 0.46480783 0.40688375 TACS_10-20EEG 0.80462284 0.50725265 TDCS_10-20EEG NaN 0.54953015 TDCS_10-20EG 0.54953015 NaN

Quantifying heterogeneity / inconsistency: I^2 = 86.0% [83.5%; 88.1%]

Tests of heterogeneity (within designs) and inconsistency (between designs): [1] 707.0534

Details of network meta-analysis methods:

  • Calculation of I^2 based on Q

Generating Forest Plot for: positive_symptoms Generating Network Graph for: positive_symptoms Calculating SUCRA/P-score values for: positive_symptoms Mean rank column not found in netrank results. SUCRA/P-score Results: Treatment SUCRA 1 CTBS_10-20EEG 91.0 2 LF-RTMS_CM 76.7 3 ITBS_10-20EEG 69.8 4 SHAM 61.4 5 HF-RTMS_NA 58.0 6 LF-RTMS_NEURONAV 58.0 7 TACS_10-20EEG 57.7 8 HF-RTMS_10-20EEG 54.6 9 ITBS_NA 53.1 10 HF-RTMS_NEURONAV 52.9 11 HD-TDCS_10-10EEG 50.8 12 TDCS_10-20EEG 50.6 13 HD-TDCS_10-20EEG 48.8 14 CTBS_NEURONAV 48.2 15 PRM-RTMS_NEURONAV 48.1 16 HF-RTMS_CM 43.2 17 DTMS_CM 42.4 18 ITBS_CM 39.7 19 CTBS_CM 37.4 20 LF-RTMS_10-10EEG 36.7 21 TDCS_10-20EG 32.5 22 ITBS_NEURONAV 19.5 23 LF-RTMS_10-20EEG 19.0 — Performing Split Analysis (Direct vs Indirect) for: positive_symptoms — Summary of Direct vs Indirect Evidence: Length Class Mode
comparison 253 -none- character k 253 -none- numeric
show 1 -none- character overall 1 -none- logical
direct 1 -none- logical
indirect 1 -none- logical
ci 1 -none- logical
test 1 -none- logical
only.reference 1 -none- logical
prop.common 253 -none- numeric
common 7 data.frame list
direct.common 12 data.frame list
indirect.common 7 data.frame list
compare.common 8 data.frame list
prop.random 253 -none- numeric
random 7 data.frame list
direct.random 12 data.frame list
indirect.random 7 data.frame list
compare.random 8 data.frame list
predict 3 data.frame list
method 1 -none- character sm 1 -none- character level.ma 1 -none- numeric
prediction 1 -none- logical
level.predict 1 -none- numeric
tau 1 -none- numeric
reference.group 1 -none- character baseline.reference 1 -none- logical
order 0 -none- NULL
sep.trts 1 -none- character quote.trts 1 -none- character nchar.trts 1 -none- numeric
tol.direct 1 -none- numeric
backtransf 1 -none- logical
x 198 netmeta list
version 1 -none- character prop.fixed 253 -none- numeric
fixed 7 data.frame list
direct.fixed 12 data.frame list
indirect.fixed 7 data.frame list
compare.fixed 8 data.frame list

‘p’ value column (’ p.random ’) not found in netsplit results. Cannot check for inconsistency. This might happen if there are no closed loops for indirect evidence calculation.

— Generating League Table for: positive_symptoms — League Table (Model: random ):
League Table: positive_symptoms ( random effects)
CTBS_10-20EEG CTBS_CM CTBS_NEURONAV DTMS_CM HD-TDCS_10-10EEG HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM HF-RTMS_NA HF-RTMS_NEURONAV ITBS_10-20EEG ITBS_CM ITBS_NA ITBS_NEURONAV LF-RTMS_10-10EEG LF-RTMS_10-20EEG LF-RTMS_CM LF-RTMS_NEURONAV PRM-RTMS_NEURONAV SHAM TACS_10-20EEG TDCS_10-20EEG TDCS_10-20EG
CTBS_10-20EEG CTBS_10-20EEG . . . . . . . . . . . . . . . . . . -2.99 [-5.79, -0.18] . . .
CTBS_CM -4.81 [-10.99, 1.38] CTBS_CM . . . . . . . . . . . . . . . . . 1.82 [-3.69, 7.33] . . .
CTBS_NEURONAV -3.84 [-11.49, 3.81] 0.97 [ -8.04, 9.97] CTBS_NEURONAV . . . . . . . . . . . . . . . . 0.85 [-6.27, 7.97] . . .
DTMS_CM -4.30 [-10.14, 1.53] 0.50 [ -7.02, 8.02] -0.47 [ -9.23, 8.30] DTMS_CM . . . . . . . . . . . . . . . 1.32 [-3.80, 6.43] . . .
HD-TDCS_10-10EEG -3.56 [-10.79, 3.67] 1.25 [ -7.40, 9.90] 0.28 [ -9.47, 10.03] 0.75 [ -7.66, 9.15] HD-TDCS_10-10EEG . . . . . . . . . . . . . . 0.57 [-6.10, 7.24] . . .
HD-TDCS_10-20EEG -3.72 [ -8.52, 1.09] 1.09 [ -5.66, 7.84] 0.12 [ -8.00, 8.24] 0.59 [ -5.84, 7.02] -0.16 [ -7.88, 7.56] HD-TDCS_10-20EEG . . . . . . . . . . . . . 0.73 [-3.17, 4.63] . . .
HF-RTMS_10-20EEG -3.32 [ -6.95, 0.31] 1.48 [ -4.49, 7.46] 0.52 [ -6.97, 8.00] 0.98 [ -4.63, 6.59] 0.24 [ -6.82, 7.29] 0.39 [ -4.14, 4.93] HF-RTMS_10-20EEG . . . . . . . . . . . . 0.33 [-1.98, 2.65] . . .
HF-RTMS_CM -4.03 [ -7.45, -0.60] 0.78 [ -5.08, 6.63] -0.19 [ -7.58, 7.20] 0.28 [ -5.20, 5.76] -0.47 [ -7.42, 6.48] -0.31 [ -4.68, 4.06] -0.70 [ -3.74, 2.33] HF-RTMS_CM . . . . . . . . . . . 1.04 [-0.93, 3.01] . . .
HF-RTMS_NA -2.78 [-10.44, 4.89] 2.03 [ -6.99, 11.04] 1.06 [ -9.02, 11.14] 1.53 [ -7.25, 10.30] 0.78 [ -8.98, 10.54] 0.94 [ -7.19, 9.07] 0.54 [ -6.95, 8.04] 1.25 [ -6.15, 8.65] HF-RTMS_NA . . . . . . . . . . -0.21 [-7.34, 6.92] . . .
HF-RTMS_NEURONAV -3.43 [ -7.18, 0.33] 1.38 [ -4.68, 7.43] 0.41 [ -7.14, 7.95] 0.87 [ -4.82, 6.57] 0.13 [ -6.99, 7.25] 0.29 [ -4.34, 4.92] -0.11 [ -3.51, 3.30] 0.60 [ -2.59, 3.78] -0.65 [ -8.21, 6.91] HF-RTMS_NEURONAV . . . . . . . . . 0.44 [-2.06, 2.94] . . .
ITBS_10-20EEG -2.14 [ -6.55, 2.28] 2.67 [ -3.81, 9.15] 1.70 [ -6.19, 9.59] 2.17 [ -3.98, 8.31] 1.42 [ -6.07, 8.91] 1.58 [ -3.60, 6.76] 1.19 [ -2.93, 5.30] 1.89 [ -2.05, 5.83] 0.64 [ -7.26, 8.54] 1.29 [ -2.93, 5.52] ITBS_10-20EEG . . . . . . . . -0.85 [-4.26, 2.56] . . .
ITBS_CM -4.69 [-11.78, 2.41] 0.12 [ -8.42, 8.65] -0.85 [-10.50, 8.80] -0.38 [ -8.67, 7.90] -1.13 [-10.45, 8.19] -0.97 [ -8.57, 6.62] -1.37 [ -8.28, 5.55] -0.66 [ -7.47, 6.15] -1.91 [-11.57, 7.75] -1.26 [ -8.24, 5.72] -2.55 [ -9.90, 4.80] ITBS_CM . . . . . . . 1.70 [-4.82, 8.22] . . .
ITBS_NA -3.33 [-10.48, 3.82] 1.48 [ -7.10, 10.06] 0.51 [ -9.18, 10.20] 0.98 [ -7.35, 9.31] 0.23 [ -9.13, 9.59] 0.39 [ -7.26, 8.03] -0.01 [ -6.98, 6.97] 0.70 [ -6.17, 7.57] -0.55 [-10.25, 9.15] 0.10 [ -6.93, 7.14] -1.19 [ -8.60, 6.22] 1.36 [ -7.90, 10.62] ITBS_NA . . . . . . 0.34 [-6.24, 6.92] . . .
ITBS_NEURONAV -6.14 [-10.54, -1.74] -1.33 [ -7.80, 5.14] -2.30 [-10.19, 5.59] -1.83 [ -7.97, 4.30] -2.58 [-10.06, 4.90] -2.42 [ -7.59, 2.75] -2.82 [ -6.92, 1.29] -2.11 [ -6.03, 1.81] -3.36 [-11.26, 4.54] -2.71 [ -6.92, 1.51] -4.00 [ -8.81, 0.81] -1.45 [ -8.80, 5.90] -2.81 [-10.21, 4.59] ITBS_NEURONAV . . . . . 3.15 [-0.24, 6.54] . . .
LF-RTMS_10-10EEG -5.03 [-12.23, 2.18] -0.22 [ -8.85, 8.41] -1.19 [-10.93, 8.55] -0.72 [ -9.10, 7.66] -1.47 [-10.88, 7.94] -1.31 [ -9.01, 6.39] -1.71 [ -8.74, 5.33] -1.00 [ -7.93, 5.93] -2.25 [-11.99, 7.49] -1.60 [ -8.69, 5.50] -2.89 [-10.35, 4.57] -0.34 [ -9.64, 8.96] -1.70 [-11.05, 7.65] 1.11 [ -6.35, 8.57] LF-RTMS_10-10EEG . . . . 2.04 [-4.60, 8.68] . . .
LF-RTMS_10-20EEG -5.82 [ -9.08, -2.57] -1.02 [ -6.78, 4.74] -1.99 [ -9.30, 5.32] -1.52 [ -6.90, 3.86] -2.27 [ -9.14, 4.60] -2.11 [ -6.35, 2.13] -2.50 [ -5.35, 0.34] -1.80 [ -4.38, 0.78] -3.05 [-10.37, 4.28] -2.40 [ -5.40, 0.61] -3.69 [ -7.48, 0.10] -1.14 [ -7.86, 5.59] -2.50 [ -9.28, 4.29] 0.31 [ -3.46, 4.09] -0.80 [ -7.64, 6.05] LF-RTMS_10-20EEG . . . 2.84 [ 1.18, 4.50] . . .
LF-RTMS_CM -1.45 [ -6.13, 3.24] 3.36 [ -3.31, 10.03] 2.39 [ -5.66, 10.44] 2.86 [ -3.49, 9.20] 2.11 [ -5.54, 9.76] 2.27 [ -3.14, 7.68] 1.88 [ -2.53, 6.28] 2.58 [ -1.66, 6.82] 1.33 [ -6.73, 9.39] 1.98 [ -2.53, 6.49] 0.69 [ -4.38, 5.76] 3.24 [ -4.28, 10.76] 1.88 [ -5.69, 9.45] 4.69 [ -0.37, 9.75] 3.58 [ -4.05, 11.21] 4.38 [ 0.27, 8.48] LF-RTMS_CM . . -1.54 [-5.29, 2.21] . . .
LF-RTMS_NEURONAV -3.07 [ -7.16, 1.03] 1.74 [ -4.53, 8.01] 0.77 [ -6.95, 8.49] 1.24 [ -4.69, 7.16] 0.49 [ -6.81, 7.80] 0.65 [ -4.26, 5.56] 0.26 [ -3.52, 4.04] 0.96 [ -2.62, 4.54] -0.29 [ -8.02, 7.45] 0.36 [ -3.53, 4.26] -0.93 [ -5.46, 3.60] 1.62 [ -5.55, 8.79] 0.26 [ -6.96, 7.49] 3.07 [ -1.45, 7.59] 1.96 [ -5.32, 9.24] 2.76 [ -0.66, 6.18] -1.62 [ -6.42, 3.18] LF-RTMS_NEURONAV . 0.08 [-2.91, 3.07] . . .
PRM-RTMS_NEURONAV -3.78 [ -8.85, 1.29] 1.03 [ -5.92, 7.97] 0.06 [ -8.22, 8.34] 0.52 [ -6.11, 7.16] -0.22 [ -8.11, 7.67] -0.06 [ -5.81, 5.69] -0.46 [ -5.27, 4.36] 0.25 [ -4.42, 4.91] -1.00 [ -9.29, 7.29] -0.35 [ -5.26, 4.56] -1.64 [ -7.07, 3.79] 0.91 [ -6.86, 8.68] -0.45 [ -8.27, 7.37] 2.36 [ -3.06, 7.78] 1.25 [ -6.62, 9.12] 2.05 [ -2.49, 6.59] -2.33 [ -7.98, 3.32] -0.71 [ -5.89, 4.46] PRM-RTMS_NEURONAV 0.79 [-3.43, 5.02] . . .
SHAM -2.99 [ -5.79, -0.18] 1.82 [ -3.69, 7.33] 0.85 [ -6.27, 7.97] 1.32 [ -3.80, 6.43] 0.57 [ -6.10, 7.24] 0.73 [ -3.17, 4.63] 0.33 [ -1.98, 2.65] 1.04 [ -0.93, 3.01] -0.21 [ -7.34, 6.92] 0.44 [ -2.06, 2.94] -0.85 [ -4.26, 2.56] 1.70 [ -4.82, 8.22] 0.34 [ -6.24, 6.92] 3.15 [ -0.24, 6.54] 2.04 [ -4.60, 8.68] 2.84 [ 1.18, 4.50] -1.54 [ -5.29, 2.21] 0.08 [ -2.91, 3.07] 0.79 [ -3.43, 5.02] SHAM -0.06 [-3.80, 3.68] -0.57 [-2.09, 0.95] -2.27 [-7.64, 3.10]
TACS_10-20EEG -3.05 [ -7.72, 1.63] 1.76 [ -4.90, 8.42] 0.79 [ -7.25, 8.83] 1.26 [ -5.08, 7.59] 0.51 [ -7.13, 8.15] 0.67 [ -4.73, 6.07] 0.28 [ -4.12, 4.67] 0.98 [ -3.25, 5.21] -0.27 [ -8.32, 7.78] 0.38 [ -4.11, 4.88] -0.91 [ -5.97, 4.15] 1.64 [ -5.87, 9.15] 0.28 [ -7.28, 7.85] 3.09 [ -1.96, 8.14] 1.98 [ -5.64, 9.60] 2.78 [ -1.31, 6.87] -1.60 [ -6.90, 3.70] 0.02 [ -4.77, 4.81] 0.73 [ -4.91, 6.38] -0.06 [ -3.80, 3.68] TACS_10-20EEG . .
TDCS_10-20EEG -3.55 [ -6.74, -0.36] 1.25 [ -4.47, 6.97] 0.28 [ -7.00, 7.56] 0.75 [ -4.59, 6.08] 0.00 [ -6.84, 6.84] 0.16 [ -4.02, 4.35] -0.23 [ -3.00, 2.53] 0.47 [ -2.02, 2.96] -0.78 [ -8.07, 6.51] -0.13 [ -3.05, 2.80] -1.42 [ -5.15, 2.31] 1.13 [ -5.56, 7.82] -0.23 [ -6.98, 6.52] 2.58 [ -1.14, 6.30] 1.47 [ -5.34, 8.28] 2.27 [ 0.02, 4.52] -2.11 [ -6.16, 1.94] -0.49 [ -3.85, 2.87] 0.22 [ -4.27, 4.72] -0.57 [ -2.09, 0.95] -0.51 [ -4.55, 3.53] TDCS_10-20EEG .
TDCS_10-20EG -5.26 [-11.31, 0.80] -0.45 [ -8.15, 7.24] -1.42 [-10.34, 7.49] -0.96 [ -8.37, 6.46] -1.70 [-10.26, 6.86] -1.54 [ -8.18, 5.09] -1.94 [ -7.78, 3.91] -1.23 [ -6.95, 4.49] -2.48 [-11.41, 6.44] -1.83 [ -7.75, 4.09] -3.12 [ -9.48, 3.24] -0.57 [ -9.01, 7.87] -1.93 [-10.42, 6.56] 0.88 [ -5.47, 7.23] -0.23 [ -8.77, 8.31] 0.57 [ -5.05, 6.19] -3.81 [-10.36, 2.74] -2.19 [ -8.34, 3.95] -1.48 [ -8.31, 5.35] -2.27 [ -7.64, 3.10] -2.21 [ -8.76, 4.33] -1.70 [ -7.28, 3.88] TDCS_10-20EG

Interpretation Guide: - Comparisons are ‘Column Treatment’ vs ‘Row Treatment’. - Cells contain: MD [95% CI]. - Positive MD favors the column treatment (assuming positive TE = benefit after direction adjustment).

Generating Comparison-Adjusted Funnel Plot for: positive_symptoms Visual assessment of funnel plot asymmetry recommended. Asymmetry may suggest publication bias or other systematic differences between small and large studies.

Generating Rankogram for: positive_symptoms

— Performing Network Meta-Regression for: positive_symptoms using covariate: Overall_RoB_Level — !!! Error during netmetareg execution for positive_symptoms with covariate Overall_RoB_Level : object ‘netmetareg’ not found -> Double-check if the covariate ’ Overall_RoB_Level ’ exists in the data frame used by the nma_result object. — Meta-regression failed for: positive_symptoms using covariate: Overall_RoB_Level —

Skipping meta-regression for Diagnosis - ‘Diagnosis’ column not found or contains only NA values.

========================================================== Finished NMA Workflow for Domain: positive_symptoms ==========================================================

========================================================== Starting NMA Workflow for Domain: negative_symptoms ==========================================================

— Running Network Meta-Analysis for: negative_symptoms — Number of comparisons: 110 Number of unique studies (studlab): 110 Treatments included: LF-RTMS_10-20EEG, HF-RTMS_NEURONAV, ITBS_NEURONAV, ITBS_CM, TDCS_10-20EEG, TACS_10-20EEG, ITBS_10-20EEG, HD-TDCS_10-10EEG, HF-RTMS_10-20EEG, LF-RTMS_CM, DTMS_CM, HF-RTMS_CM, HD-TDCS_10-20EEG, LF-RTMS_10-10EEG, ITBS_NA, CTBS_CM, HF-RTMS_NA, TDCS_10-20EG, LF-RTMS_NEURONAV, CTBS_NEURONAV, CTBS_10-20EEG, SHAM Reference treatment: SHAM Model type: Random Effects (tau method: REML ) — NMA completed successfully for: negative_symptoms — Estimated heterogeneity (tau^2): 13.2148 I^2 statistic (overall inconsistency): 82.1% Cochran’s Q: 496.63 , df = 89 , p-value = <2e-16

— NMA Summary —

Results ( effects model): Number of studies: k = 110 Number of pairwise comparisons: m = 110 Number of treatments: n = 22 Number of designs: d = 21

Treatment estimates (sm = ‘MD’, comparison: other treatments vs ‘SHAM’): $TE CTBS_10-20EEG CTBS_CM CTBS_NEURONAV DTMS_CM CTBS_10-20EEG 0.0000000 0.26000000 -0.70000000 -1.9891037632 CTBS_CM -0.2600000 0.00000000 -0.96000000 -2.2491037632 CTBS_NEURONAV 0.7000000 0.96000000 0.00000000 -1.2891037632 DTMS_CM 1.9891038 2.24910376 1.28910376 0.0000000000 HD-TDCS_10-10EEG 3.4384162 3.69841621 2.73841621 1.4493124452 HD-TDCS_10-20EEG 0.5737902 0.83379021 -0.12620979 -1.4153135511 HF-RTMS_10-20EEG 4.2337142 4.49371421 3.53371421 2.2446104438 HF-RTMS_CM 4.6380455 4.89804547 3.93804547 2.6489417110 HF-RTMS_NA 1.1800000 1.44000000 0.48000000 -0.8091037632 HF-RTMS_NEURONAV -0.1900805 0.06991953 -0.89008047 -2.1791842342 ITBS_10-20EEG 7.4365160 7.69651600 6.73651600 5.4474122350 ITBS_CM 0.4205771 0.68057708 -0.27942292 -1.5685266880 ITBS_NA 1.2800000 1.54000000 0.58000000 -0.7091037632 ITBS_NEURONAV 4.6686491 4.92864908 3.96864908 2.6795453129 LF-RTMS_10-10EEG 1.9900000 2.25000000 1.29000000 0.0008962368 LF-RTMS_10-20EEG 0.7719635 1.03196345 0.07196345 -1.2171403123 LF-RTMS_CM 0.6611241 0.92112412 -0.03887588 -1.3279796407 LF-RTMS_NEURONAV -2.9500000 -2.69000000 -3.65000000 -4.9391037632 SHAM -0.3200000 -0.06000000 -1.02000000 -2.3091037632 TACS_10-20EEG 1.4778250 1.73782501 0.77782501 -0.5112787536 TDCS_10-20EEG 0.2098078 0.46980778 -0.49019222 -1.7792959837 TDCS_10-20EG 2.6800000 2.94000000 1.98000000 0.6908962368 HD-TDCS_10-10EEG HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM CTBS_10-20EEG -3.4384162 -0.57379021 -4.2337142 -4.6380455 CTBS_CM -3.6984162 -0.83379021 -4.4937142 -4.8980455 CTBS_NEURONAV -2.7384162 0.12620979 -3.5337142 -3.9380455 DTMS_CM -1.4493124 1.41531355 -2.2446104 -2.6489417 HD-TDCS_10-10EEG 0.0000000 2.86462600 -0.7952980 -1.1996293 HD-TDCS_10-20EEG -2.8646260 0.00000000 -3.6599240 -4.0642553 HF-RTMS_10-20EEG 0.7952980 3.65992399 0.0000000 -0.4043313 HF-RTMS_CM 1.1996293 4.06425526 0.4043313 0.0000000 HF-RTMS_NA -2.2584162 0.60620979 -3.0537142 -3.4580455 HF-RTMS_NEURONAV -3.6284967 -0.76387068 -4.4237947 -4.8281259 ITBS_10-20EEG 3.9980998 6.86272579 3.2028018 2.7984705 ITBS_CM -3.0178391 -0.15321314 -3.8131371 -4.2174684 ITBS_NA -2.1584162 0.70620979 -2.9537142 -3.3580455 ITBS_NEURONAV 1.2302329 4.09485886 0.4349349 0.0306036 LF-RTMS_10-10EEG -1.4484162 1.41620979 -2.2437142 -2.6480455 LF-RTMS_10-20EEG -2.6664528 0.19817324 -3.4617508 -3.8660820 LF-RTMS_CM -2.7772921 0.08733391 -3.5725901 -3.9769214 LF-RTMS_NEURONAV -6.3884162 -3.52379021 -7.1837142 -7.5880455 SHAM -3.7584162 -0.89379021 -4.5537142 -4.9580455 TACS_10-20EEG -1.9605912 0.90403480 -2.7558892 -3.1602205 TDCS_10-20EEG -3.2286084 -0.36398243 -4.0239064 -4.4282377 TDCS_10-20EG -0.7584162 2.10620979 -1.5537142 -1.9580455 HF-RTMS_NA HF-RTMS_NEURONAV ITBS_10-20EEG ITBS_CM CTBS_10-20EEG -1.1800000 0.19008047 -7.436516 -0.4205771 CTBS_CM -1.4400000 -0.06991953 -7.696516 -0.6805771 CTBS_NEURONAV -0.4800000 0.89008047 -6.736516 0.2794229 DTMS_CM 0.8091038 2.17918423 -5.447412 1.5685267 HD-TDCS_10-10EEG 2.2584162 3.62849668 -3.998100 3.0178391 HD-TDCS_10-20EEG -0.6062098 0.76387068 -6.862726 0.1532131 HF-RTMS_10-20EEG 3.0537142 4.42379468 -3.202802 3.8131371 HF-RTMS_CM 3.4580455 4.82812595 -2.798471 4.2174684 HF-RTMS_NA 0.0000000 1.37008047 -6.256516 0.7594229 HF-RTMS_NEURONAV -1.3700805 0.00000000 -7.626596 -0.6106575 ITBS_10-20EEG 6.2565160 7.62659647 0.000000 7.0159389 ITBS_CM -0.7594229 0.61065755 -7.015939 0.0000000 ITBS_NA 0.1000000 1.47008047 -6.156516 0.8594229 ITBS_NEURONAV 3.4886491 4.85872955 -2.767867 4.2480720 LF-RTMS_10-10EEG 0.8100000 2.18008047 -5.446516 1.5694229 LF-RTMS_10-20EEG -0.4080365 0.96204392 -6.664553 0.3513864 LF-RTMS_CM -0.5188759 0.85120459 -6.775392 0.2405470 LF-RTMS_NEURONAV -4.1300000 -2.75991953 -10.386516 -3.3705771 SHAM -1.5000000 -0.12991953 -7.756516 -0.7405771 TACS_10-20EEG 0.2978250 1.66790548 -5.958691 1.0572479 TDCS_10-20EEG -0.9701922 0.39988825 -7.226708 -0.2107693 TDCS_10-20EG 1.5000000 2.87008047 -4.756516 2.2594229 ITBS_NA ITBS_NEURONAV LF-RTMS_10-10EEG LF-RTMS_10-20EEG CTBS_10-20EEG -1.2800000 -4.6686491 -1.9900000000 -0.77196345 CTBS_CM -1.5400000 -4.9286491 -2.2500000000 -1.03196345 CTBS_NEURONAV -0.5800000 -3.9686491 -1.2900000000 -0.07196345 DTMS_CM 0.7091038 -2.6795453 -0.0008962368 1.21714031 HD-TDCS_10-10EEG 2.1584162 -1.2302329 1.4484162084 2.66645276 HD-TDCS_10-20EEG -0.7062098 -4.0948589 -1.4162097879 -0.19817324 HF-RTMS_10-20EEG 2.9537142 -0.4349349 2.2437142071 3.46175076 HF-RTMS_CM 3.3580455 -0.0306036 2.6480454743 3.86608202 HF-RTMS_NA -0.1000000 -3.4886491 -0.8100000000 0.40803655 HF-RTMS_NEURONAV -1.4700805 -4.8587295 -2.1800804709 -0.96204392 ITBS_10-20EEG 6.1565160 2.7678669 5.4465159982 6.66455255 ITBS_CM -0.8594229 -4.2480720 -1.5694229248 -0.35138638 ITBS_NA 0.0000000 -3.3886491 -0.7100000000 0.50803655 ITBS_NEURONAV 3.3886491 0.0000000 2.6786490761 3.89668563 LF-RTMS_10-10EEG 0.7100000 -2.6786491 0.0000000000 1.21803655 LF-RTMS_10-20EEG -0.5080365 -3.8966856 -1.2180365491 0.00000000 LF-RTMS_CM -0.6188759 -4.0075250 -1.3288758775 -0.11083933 LF-RTMS_NEURONAV -4.2300000 -7.6186491 -4.9400000000 -3.72196345 SHAM -1.6000000 -4.9886491 -2.3100000000 -1.09196345 TACS_10-20EEG 0.1978250 -3.1908241 -0.5121749904 0.70586156 TDCS_10-20EEG -1.0701922 -4.4588413 -1.7801922205 -0.56215567 TDCS_10-20EG 1.4000000 -1.9886491 0.6900000000 1.90803655 LF-RTMS_CM LF-RTMS_NEURONAV SHAM TACS_10-20EEG CTBS_10-20EEG -0.66112412 2.950000 0.3200000 -1.4778250 CTBS_CM -0.92112412 2.690000 0.0600000 -1.7378250 CTBS_NEURONAV 0.03887588 3.650000 1.0200000 -0.7778250 DTMS_CM 1.32797964 4.939104 2.3091038 0.5112788 HD-TDCS_10-10EEG 2.77729209 6.388416 3.7584162 1.9605912 HD-TDCS_10-20EEG -0.08733391 3.523790 0.8937902 -0.9040348 HF-RTMS_10-20EEG 3.57259008 7.183714 4.5537142 2.7558892 HF-RTMS_CM 3.97692135 7.588045 4.9580455 3.1602205 HF-RTMS_NA 0.51887588 4.130000 1.5000000 -0.2978250 HF-RTMS_NEURONAV -0.85120459 2.759920 0.1299195 -1.6679055 ITBS_10-20EEG 6.77539188 10.386516 7.7565160 5.9586910 ITBS_CM -0.24054705 3.370577 0.7405771 -1.0572479 ITBS_NA 0.61887588 4.230000 1.6000000 -0.1978250 ITBS_NEURONAV 4.00752495 7.618649 4.9886491 3.1908241 LF-RTMS_10-10EEG 1.32887588 4.940000 2.3100000 0.5121750 LF-RTMS_10-20EEG 0.11083933 3.721963 1.0919635 -0.7058616 LF-RTMS_CM 0.00000000 3.611124 0.9811241 -0.8167009 LF-RTMS_NEURONAV -3.61112412 0.000000 -2.6300000 -4.4278250 SHAM -0.98112412 2.630000 0.0000000 -1.7978250 TACS_10-20EEG 0.81670089 4.427825 1.7978250 0.0000000 TDCS_10-20EEG -0.45131634 3.159808 0.5298078 -1.2680172 TDCS_10-20EG 2.01887588 5.630000 3.0000000 1.2021750 TDCS_10-20EEG TDCS_10-20EG CTBS_10-20EEG -0.2098078 -2.6800000 CTBS_CM -0.4698078 -2.9400000 CTBS_NEURONAV 0.4901922 -1.9800000 DTMS_CM 1.7792960 -0.6908962 HD-TDCS_10-10EEG 3.2286084 0.7584162 HD-TDCS_10-20EEG 0.3639824 -2.1062098 HF-RTMS_10-20EEG 4.0239064 1.5537142 HF-RTMS_CM 4.4282377 1.9580455 HF-RTMS_NA 0.9701922 -1.5000000 HF-RTMS_NEURONAV -0.3998883 -2.8700805 ITBS_10-20EEG 7.2267082 4.7565160 ITBS_CM 0.2107693 -2.2594229 ITBS_NA 1.0701922 -1.4000000 ITBS_NEURONAV 4.4588413 1.9886491 LF-RTMS_10-10EEG 1.7801922 -0.6900000 LF-RTMS_10-20EEG 0.5621557 -1.9080365 LF-RTMS_CM 0.4513163 -2.0188759 LF-RTMS_NEURONAV -3.1598078 -5.6300000 SHAM -0.5298078 -3.0000000 TACS_10-20EEG 1.2680172 -1.2021750 TDCS_10-20EEG 0.0000000 -2.4701922 TDCS_10-20EG 2.4701922 0.0000000

$seTE CTBS_10-20EEG CTBS_CM CTBS_NEURONAV DTMS_CM HD-TDCS_10-10EEG CTBS_10-20EEG 0.000000 5.511886 5.652804 4.393795 5.446978 CTBS_CM 5.511886 0.000000 5.787178 4.565377 5.586305 CTBS_NEURONAV 5.652804 5.787178 0.000000 4.734551 5.725392 DTMS_CM 4.393795 4.565377 4.734551 0.000000 4.486797 HD-TDCS_10-10EEG 5.446978 5.586305 5.725392 4.486797 0.000000 HD-TDCS_10-20EEG 4.234430 4.412214 4.587041 2.896926 4.330856 HF-RTMS_10-20EEG 3.976844 4.165636 4.350383 2.505408 4.079364 HF-RTMS_CM 3.985142 4.173558 4.357970 2.518558 4.087453 HF-RTMS_NA 5.446550 5.585887 5.724985 4.486278 5.521850 HF-RTMS_NEURONAV 4.075874 4.260279 4.441091 2.659798 4.175963 ITBS_10-20EEG 4.133359 4.315309 4.493907 2.747078 4.232089 ITBS_CM 4.259845 4.436611 4.610512 2.933950 4.355709 ITBS_NA 5.289763 5.433123 5.576032 4.294575 5.367263 ITBS_NEURONAV 4.223849 4.402060 4.577275 2.881437 4.320511 LF-RTMS_10-10EEG 5.342359 5.484344 5.625952 4.359195 5.419106 LF-RTMS_10-20EEG 3.976877 4.165667 4.350413 2.505460 4.079395 LF-RTMS_CM 4.351183 4.524381 4.695033 3.065057 4.445077 LF-RTMS_NEURONAV 9.681019 9.760090 9.840359 9.175179 9.723582 SHAM 3.797608 3.994879 4.187167 2.209888 3.904836 TACS_10-20EEG 4.312159 4.486864 4.658890 3.009401 4.406885 TDCS_10-20EEG 3.911903 4.103683 4.291099 2.400993 4.016080 TDCS_10-20EG 5.572149 5.708422 5.844603 4.637955 5.645774 HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM HF-RTMS_NA CTBS_10-20EEG 4.234430 3.976844 3.985142 5.446550 CTBS_CM 4.412214 4.165636 4.173558 5.585887 CTBS_NEURONAV 4.587041 4.350383 4.357970 5.724985 DTMS_CM 2.896926 2.505408 2.518558 4.486278 HD-TDCS_10-10EEG 4.330856 4.079364 4.087453 5.521850 HD-TDCS_10-20EEG 0.000000 2.214055 2.228925 4.330318 HF-RTMS_10-20EEG 2.214055 0.000000 1.689081 4.078792 HF-RTMS_CM 2.228925 1.689081 0.000000 4.086883 HF-RTMS_NA 4.330318 4.078792 4.086883 0.000000 HF-RTMS_NEURONAV 2.387362 1.893247 1.910616 4.175404 ITBS_10-20EEG 2.484232 2.014025 2.030360 4.231538 ITBS_CM 2.689430 2.262282 2.276837 4.355174 ITBS_NA 4.131385 3.866941 3.875474 5.366829 ITBS_NEURONAV 2.632043 2.193750 2.208756 4.319971 LF-RTMS_10-10EEG 4.198517 3.938583 3.946961 5.418676 LF-RTMS_10-20EEG 2.214113 1.669487 1.689158 4.078824 LF-RTMS_CM 2.831880 2.429903 2.443460 4.444552 LF-RTMS_NEURONAV 9.099938 8.982971 8.986647 9.723342 SHAM 1.873119 1.180451 1.208110 3.904239 TACS_10-20EEG 2.771546 2.359312 2.373272 4.406356 TDCS_10-20EEG 2.095169 1.508185 1.529931 4.015500 TDCS_10-20EG 4.487270 4.245054 4.252828 5.645361 HF-RTMS_NEURONAV ITBS_10-20EEG ITBS_CM ITBS_NA ITBS_NEURONAV CTBS_10-20EEG 4.075874 4.133359 4.259845 5.289763 4.223849 CTBS_CM 4.260279 4.315309 4.436611 5.433123 4.402060 CTBS_NEURONAV 4.441091 4.493907 4.610512 5.576032 4.577275 DTMS_CM 2.659798 2.747078 2.933950 4.294575 2.881437 HD-TDCS_10-10EEG 4.175963 4.232089 4.355709 5.367263 4.320511 HD-TDCS_10-20EEG 2.387362 2.484232 2.689430 4.131385 2.632043 HF-RTMS_10-20EEG 1.893247 2.014025 2.262282 3.866941 2.193750 HF-RTMS_CM 1.910616 2.030360 2.276837 3.875474 2.208756 HF-RTMS_NA 4.175404 4.231538 4.355174 5.366829 4.319971 HF-RTMS_NEURONAV 0.000000 2.203124 2.432155 3.968714 2.368543 ITBS_10-20EEG 2.203124 0.000000 2.527309 4.027729 2.466152 ITBS_CM 2.432155 2.527309 0.000000 4.157430 2.672738 ITBS_NA 3.968714 4.027729 4.157430 0.000000 4.120539 ITBS_NEURONAV 2.368543 2.466152 2.672738 4.120539 0.000000 LF-RTMS_10-10EEG 4.038551 4.096560 4.224148 5.261059 4.187845 LF-RTMS_10-20EEG 1.893316 2.014089 2.262339 3.866975 2.193809 LF-RTMS_CM 2.588801 2.678395 2.869743 4.250969 2.816033 LF-RTMS_NEURONAV 9.027249 9.053349 9.111792 9.636393 9.095019 SHAM 1.480176 1.631819 1.929885 3.682359 1.849074 TACS_10-20EEG 2.522660 2.614522 2.810222 4.211016 2.755352 TDCS_10-20EEG 1.752735 1.882549 2.146070 3.800122 2.073700 TDCS_10-20EG 4.337965 4.392021 4.511261 5.494250 4.477286 LF-RTMS_10-10EEG LF-RTMS_10-20EEG LF-RTMS_CM LF-RTMS_NEURONAV CTBS_10-20EEG 5.342359 3.976877 4.351183 9.681019 CTBS_CM 5.484344 4.165667 4.524381 9.760090 CTBS_NEURONAV 5.625952 4.350413 4.695033 9.840359 DTMS_CM 4.359195 2.505460 3.065057 9.175179 HD-TDCS_10-10EEG 5.419106 4.079395 4.445077 9.723582 HD-TDCS_10-20EEG 4.198517 2.214113 2.831880 9.099938 HF-RTMS_10-20EEG 3.938583 1.669487 2.429903 8.982971 HF-RTMS_CM 3.946961 1.689158 2.443460 8.986647 HF-RTMS_NA 5.418676 4.078824 4.444552 9.723342 HF-RTMS_NEURONAV 4.038551 1.893316 2.588801 9.027249 ITBS_10-20EEG 4.096560 2.014089 2.678395 9.053349 ITBS_CM 4.224148 2.262339 2.869743 9.111792 ITBS_NA 5.261059 3.866975 4.250969 9.636393 ITBS_NEURONAV 4.187845 2.193809 2.816033 9.095019 LF-RTMS_10-10EEG 0.000000 3.938616 4.316241 9.665364 LF-RTMS_10-20EEG 3.938616 0.000000 2.429957 8.982985 LF-RTMS_CM 4.316241 2.429957 0.000000 9.154849 LF-RTMS_NEURONAV 9.665364 8.982985 9.154849 0.000000 SHAM 3.757522 1.180560 2.123904 8.905072 TACS_10-20EEG 4.276899 2.359367 2.946838 9.136366 TDCS_10-20EEG 3.873000 1.508271 2.322095 8.954410 TDCS_10-20EG 5.544907 4.245084 4.597606 9.794249 SHAM TACS_10-20EEG TDCS_10-20EEG TDCS_10-20EG CTBS_10-20EEG 3.7976080 4.312159 3.9119030 5.572149 CTBS_CM 3.9948790 4.486864 4.1036834 5.708422 CTBS_NEURONAV 4.1871671 4.658890 4.2910986 5.844603 DTMS_CM 2.2098883 3.009401 2.4009925 4.637955 HD-TDCS_10-10EEG 3.9048358 4.406885 4.0160803 5.645774 HD-TDCS_10-20EEG 1.8731191 2.771546 2.0951691 4.487270 HF-RTMS_10-20EEG 1.1804507 2.359312 1.5081852 4.245054 HF-RTMS_CM 1.2081102 2.373272 1.5299310 4.252828 HF-RTMS_NA 3.9042387 4.406356 4.0154998 5.645361 HF-RTMS_NEURONAV 1.4801762 2.522660 1.7527350 4.337965 ITBS_10-20EEG 1.6318190 2.614522 1.8825493 4.392021 ITBS_CM 1.9298851 2.810222 2.1460697 4.511261 ITBS_NA 3.6823593 4.211016 3.8001221 5.494250 ITBS_NEURONAV 1.8490738 2.755352 2.0737002 4.477286 LF-RTMS_10-10EEG 3.7575220 4.276899 3.8730001 5.544907 LF-RTMS_10-20EEG 1.1805604 2.359367 1.5082710 4.245084 LF-RTMS_CM 2.1239037 2.946838 2.3220950 4.597606 LF-RTMS_NEURONAV 8.9050716 9.136366 8.9544100 9.794249 SHAM 0.0000000 2.042765 0.9387004 4.077624 TACS_10-20EEG 2.0427653 0.000000 2.2481211 4.560692 TDCS_10-20EEG 0.9387004 2.248121 0.0000000 4.184277 TDCS_10-20EG 4.0776241 4.560692 4.1842773 0.000000

$lower CTBS_10-20EEG CTBS_CM CTBS_NEURONAV DTMS_CM CTBS_10-20EEG 0.0000000 -10.5430976 -11.779293 -10.60078335 CTBS_CM -11.0630976 0.0000000 -12.302660 -11.19707782 CTBS_NEURONAV -10.3792926 -10.3826601 0.000000 -10.56865358 DTMS_CM -6.6225758 -6.6988703 -7.990446 0.00000000 HD-TDCS_10-10EEG -7.2374645 -7.2505400 -8.483146 -7.34464850 HD-TDCS_10-20EEG -7.7255410 -7.8139906 -9.116645 -7.09318464 HF-RTMS_10-20EEG -3.5607573 -3.6707822 -4.992880 -2.66589948 HF-RTMS_CM -3.1726893 -3.2819785 -4.603418 -2.28734219 HF-RTMS_NA -9.4950417 -9.5081382 -10.740764 -9.60204620 HF-RTMS_NEURONAV -8.1786465 -8.2800746 -9.594459 -7.39229349 ITBS_10-20EEG -0.6647195 -0.7613343 -2.071380 0.06323747 ITBS_CM -7.9285665 -8.0150203 -9.315861 -7.31896320 ITBS_NA -9.0877456 -9.1087259 -10.348823 -9.12631651 ITBS_NEURONAV -3.6099428 -3.6992300 -5.002644 -2.96796783 LF-RTMS_10-10EEG -8.4808309 -8.4991169 -9.736664 -8.54296822 LF-RTMS_10-20EEG -7.0225719 -7.1325938 -8.454689 -6.12775153 LF-RTMS_CM -7.8670378 -7.9465001 -9.240972 -7.33538060 LF-RTMS_NEURONAV -21.9244483 -21.8194250 -22.936750 -22.92212377 SHAM -7.7631749 -7.8898191 -9.226697 -6.64040533 TACS_10-20EEG -6.9738516 -7.0562669 -8.353432 -6.40959705 TDCS_10-20EEG -7.4573812 -7.5732638 -8.900591 -6.48515483 TDCS_10-20EG -8.2412113 -8.2483007 -9.475212 -8.39932809 HD-TDCS_10-10EEG HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM CTBS_10-20EEG -14.114297 -8.8731214 -12.028186 -12.448780 CTBS_CM -14.647372 -9.4815710 -12.658211 -13.078069 CTBS_NEURONAV -13.959978 -8.8642250 -12.060308 -12.479509 DTMS_CM -10.243273 -4.2625575 -7.155120 -7.585226 HD-TDCS_10-10EEG 0.000000 -5.6236967 -8.790704 -9.210890 HD-TDCS_10-20EEG -11.352949 0.0000000 -7.999392 -8.432867 HF-RTMS_10-20EEG -7.200108 -0.6795439 0.000000 -3.714869 HF-RTMS_CM -6.811632 -0.3043569 -2.906206 0.000000 HF-RTMS_NA -13.081042 -7.8810577 -11.048000 -11.468188 HF-RTMS_NEURONAV -11.813233 -5.4430139 -8.134491 -8.572864 ITBS_10-20EEG -4.296642 1.9937206 -0.744615 -1.180963 ITBS_CM -11.554872 -5.4243984 -8.247129 -8.679987 ITBS_NA -12.678058 -7.3911567 -10.532780 -10.953835 ITBS_NEURONAV -7.237813 -1.0638501 -3.864736 -4.298479 LF-RTMS_10-10EEG -12.069670 -6.8127326 -9.963195 -10.383947 LF-RTMS_10-20EEG -10.661921 -4.1414092 -6.733885 -7.176770 LF-RTMS_CM -11.489483 -5.4630480 -8.335113 -8.766015 LF-RTMS_NEURONAV -25.446286 -21.3593413 -24.790013 -25.201551 SHAM -11.411754 -4.5650362 -6.867355 -7.325898 TACS_10-20EEG -10.597927 -4.5280948 -7.380056 -7.811748 TDCS_10-20EEG -11.099981 -4.4704385 -6.979895 -7.426847 TDCS_10-20EG -11.823929 -6.6886780 -9.873867 -10.293436 HF-RTMS_NA HF-RTMS_NEURONAV ITBS_10-20EEG ITBS_CM CTBS_10-20EEG -11.855042 -7.7984855 -15.537752 -8.7697207 CTBS_CM -12.388138 -8.4199136 -16.154366 -9.3761744 CTBS_NEURONAV -11.700764 -7.8142981 -15.544412 -8.7570154 DTMS_CM -7.983839 -3.0339250 -10.831587 -4.1819098 HD-TDCS_10-10EEG -8.564210 -4.5562398 -12.292842 -5.5191933 HD-TDCS_10-20EEG -9.093477 -3.9152726 -11.731731 -5.1179721 HF-RTMS_10-20EEG -4.940571 0.7130981 -7.150219 -0.6208544 HF-RTMS_CM -4.552097 1.0833883 -6.777904 -0.2450502 HF-RTMS_NA 0.000000 -6.8135616 -14.550178 -7.7765603 HF-RTMS_NEURONAV -9.553723 0.0000000 -11.944640 -5.3775938 ITBS_10-20EEG -2.037146 3.3085530 0.000000 2.0625046 ITBS_CM -9.295406 -4.1562787 -11.969373 0.0000000 ITBS_NA -10.418791 -6.3084562 -14.050720 -7.2889907 ITBS_NEURONAV -4.978339 0.2164708 -7.601437 -0.9903990 LF-RTMS_10-10EEG -9.810410 -5.7353337 -13.475626 -6.7097554 LF-RTMS_10-20EEG -8.402384 -2.7487867 -10.612095 -4.0827174 LF-RTMS_CM -9.230039 -4.2227512 -12.024950 -5.3840454 LF-RTMS_NEURONAV -23.187400 -20.4530021 -28.130755 -21.2293615 SHAM -9.152167 -3.0310115 -10.954823 -4.5230824 TACS_10-20EEG -8.338473 -3.2764165 -11.083059 -4.4506856 TDCS_10-20EEG -8.840427 -3.0354093 -10.916437 -4.4169886 TDCS_10-20EG -9.564704 -5.6321745 -13.364720 -6.5824859 ITBS_NA ITBS_NEURONAV LF-RTMS_10-10EEG LF-RTMS_10-20EEG CTBS_10-20EEG -11.647746 -12.947241 -12.460831 -8.5664988 CTBS_CM -12.188726 -13.556528 -12.999117 -9.1965207 CTBS_NEURONAV -11.508823 -12.939942 -12.316664 -8.5986158 DTMS_CM -7.708109 -8.327058 -8.544761 -3.6934709 HD-TDCS_10-10EEG -8.361226 -9.698279 -9.172837 -5.3290150 HD-TDCS_10-20EEG -8.803576 -9.253568 -9.645152 -4.5377557 HF-RTMS_10-20EEG -4.625351 -4.734605 -5.475766 0.1896163 HF-RTMS_CM -4.237744 -4.359686 -5.087856 0.5553941 HF-RTMS_NA -10.618791 -11.955638 -11.430410 -7.5863110 HF-RTMS_NEURONAV -9.248617 -9.500988 -10.095495 -4.6728746 ITBS_10-20EEG -1.737688 -2.065703 -2.582594 2.7170098 ITBS_CM -9.007837 -9.486543 -9.848601 -4.7854901 ITBS_NA 0.000000 -11.464758 -11.021486 -7.0710944 ITBS_NEURONAV -4.687459 0.000000 -5.529376 -0.4031005 LF-RTMS_10-10EEG -9.601486 -10.886674 0.000000 -6.5015085 LF-RTMS_10-20EEG -8.087168 -8.196472 -8.937582 0.0000000 LF-RTMS_CM -8.950622 -9.526848 -9.788553 -4.8734670 LF-RTMS_NEURONAV -23.116983 -25.444559 -23.883766 -21.3282909 SHAM -8.817292 -8.612767 -9.674608 -3.4058194 TACS_10-20EEG -8.055616 -8.591215 -8.894742 -3.9184129 TDCS_10-20EEG -8.518295 -8.523219 -9.371133 -3.5183125 TDCS_10-20EG -9.368533 -10.763969 -10.177817 -6.4121758 LF-RTMS_CM LF-RTMS_NEURONAV SHAM TACS_10-20EEG CTBS_10-20EEG -9.1892860 -16.024448 -7.123175 -9.9295016 CTBS_CM -9.7887484 -16.439425 -7.769819 -10.5319169 CTBS_NEURONAV -9.1632198 -15.636750 -7.186697 -9.9090821 DTMS_CM -4.6794213 -13.043916 -2.022198 -5.3870395 HD-TDCS_10-10EEG -5.9348987 -12.669454 -3.894921 -6.6767441 HD-TDCS_10-20EEG -5.6377159 -14.311761 -2.777456 -6.3361644 HF-RTMS_10-20EEG -1.1899331 -10.422585 2.240073 -1.8682777 HF-RTMS_CM -0.8121723 -10.025460 2.590193 -1.4913073 HF-RTMS_NA -8.1922869 -14.927400 -6.152167 -8.9341233 HF-RTMS_NEURONAV -5.9251604 -14.933163 -2.771172 -6.6122275 ITBS_10-20EEG 1.5258340 -7.357723 4.558209 0.8343227 ITBS_CM -5.8651395 -14.488207 -3.041928 -6.5651815 ITBS_NA -7.7128700 -14.656983 -5.617292 -8.4512657 ITBS_NEURONAV -1.5117979 -10.207261 1.364531 -2.2095664 LF-RTMS_10-10EEG -7.1308014 -14.003766 -5.054608 -7.8703922 LF-RTMS_10-20EEG -4.6517883 -13.884364 -1.221892 -5.3301361 LF-RTMS_CM 0.0000000 -14.332051 -3.181651 -6.5923981 LF-RTMS_NEURONAV -21.5542991 0.000000 -20.083620 -22.3347740 SHAM -5.1438988 -14.823620 0.000000 -5.8015714 TACS_10-20EEG -4.9589963 -13.479124 -2.205921 0.0000000 TDCS_10-20EEG -5.0025389 -14.390513 -1.310011 -5.6742537 TDCS_10-20EG -6.9922671 -13.566376 -4.991996 -7.7366163 TDCS_10-20EEG TDCS_10-20EG CTBS_10-20EEG -7.8769967 -13.601211 CTBS_CM -8.5128794 -14.128301 CTBS_NEURONAV -7.9202064 -13.435212 DTMS_CM -2.9265629 -9.781121 HD-TDCS_10-10EEG -4.6427644 -10.307097 HD-TDCS_10-20EEG -3.7424736 -10.901098 HF-RTMS_10-20EEG 1.0679178 -6.766438 HF-RTMS_CM 1.4296281 -6.377345 HF-RTMS_NA -6.9000427 -12.564704 HF-RTMS_NEURONAV -3.8351858 -11.372335 ITBS_10-20EEG 3.5369794 -3.851688 ITBS_CM -3.9954500 -11.101332 ITBS_NA -6.3779103 -12.168533 ITBS_NEURONAV 0.3944637 -6.786671 LF-RTMS_10-10EEG -5.8107485 -11.557817 LF-RTMS_10-20EEG -2.3940012 -10.228249 LF-RTMS_CM -4.0999063 -11.030019 LF-RTMS_NEURONAV -20.7101288 -24.826376 SHAM -2.3696268 -10.991996 TACS_10-20EEG -3.1382192 -10.140966 TDCS_10-20EEG 0.0000000 -10.671225 TDCS_10-20EG -5.7308406 0.000000

$upper CTBS_10-20EEG CTBS_CM CTBS_NEURONAV DTMS_CM CTBS_10-20EEG 0.000000 11.063098 10.379293 6.622576 CTBS_CM 10.543098 0.000000 10.382660 6.698870 CTBS_NEURONAV 11.779293 12.302660 0.000000 7.990446 DTMS_CM 10.600783 11.197078 10.568654 0.000000 HD-TDCS_10-10EEG 14.114297 14.647372 13.959978 10.243273 HD-TDCS_10-20EEG 8.873121 9.481571 8.864225 4.262558 HF-RTMS_10-20EEG 12.028186 12.658211 12.060308 7.155120 HF-RTMS_CM 12.448780 13.078069 12.479509 7.585226 HF-RTMS_NA 11.855042 12.388138 11.700764 7.983839 HF-RTMS_NEURONAV 7.798486 8.419914 7.814298 3.033925 ITBS_10-20EEG 15.537752 16.154366 15.544412 10.831587 ITBS_CM 8.769721 9.376174 8.757015 4.181910 ITBS_NA 11.647746 12.188726 11.508823 7.708109 ITBS_NEURONAV 12.947241 13.556528 12.939942 8.327058 LF-RTMS_10-10EEG 12.460831 12.999117 12.316664 8.544761 LF-RTMS_10-20EEG 8.566499 9.196521 8.598616 3.693471 LF-RTMS_CM 9.189286 9.788748 9.163220 4.679421 LF-RTMS_NEURONAV 16.024448 16.439425 15.636750 13.043916 SHAM 7.123175 7.769819 7.186697 2.022198 TACS_10-20EEG 9.929502 10.531917 9.909082 5.387040 TDCS_10-20EEG 7.876997 8.512879 7.920206 2.926563 TDCS_10-20EG 13.601211 14.128301 13.435212 9.781121 HD-TDCS_10-10EEG HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM CTBS_10-20EEG 7.237464 7.725541 3.5607573 3.1726893 CTBS_CM 7.250540 7.813991 3.6707822 3.2819785 CTBS_NEURONAV 8.483146 9.116645 4.9928798 4.6034179 DTMS_CM 7.344648 7.093185 2.6658995 2.2873422 HD-TDCS_10-10EEG 0.000000 11.352949 7.2001076 6.8116316 HD-TDCS_10-20EEG 5.623697 0.000000 0.6795439 0.3043569 HF-RTMS_10-20EEG 8.790704 7.999392 0.0000000 2.9062064 HF-RTMS_CM 9.210890 8.432867 3.7148690 0.0000000 HF-RTMS_NA 8.564210 9.093477 4.9405711 4.5520974 HF-RTMS_NEURONAV 4.556240 3.915273 -0.7130981 -1.0833883 ITBS_10-20EEG 12.292842 11.731731 7.1502186 6.7779039 ITBS_CM 5.519193 5.117972 0.6208544 0.2450502 ITBS_NA 8.361226 8.803576 4.6253511 4.2377443 ITBS_NEURONAV 9.698279 9.253568 4.7346053 4.3596863 LF-RTMS_10-10EEG 9.172837 9.645152 5.4757664 5.0878560 LF-RTMS_10-20EEG 5.329015 4.537756 -0.1896163 -0.5553941 LF-RTMS_CM 5.934899 5.637716 1.1899331 0.8121723 LF-RTMS_NEURONAV 12.669454 14.311761 10.4225849 10.0254596 SHAM 3.894921 2.777456 -2.2400733 -2.5901930 TACS_10-20EEG 6.676744 6.336164 1.8682777 1.4913073 TDCS_10-20EEG 4.642764 3.742474 -1.0679178 -1.4296281 TDCS_10-20EG 10.307097 10.901098 6.7664384 6.3773448 HF-RTMS_NA HF-RTMS_NEURONAV ITBS_10-20EEG ITBS_CM ITBS_NA CTBS_10-20EEG 9.495042 8.178646 0.66471951 7.928567 9.087746 CTBS_CM 9.508138 8.280075 0.76133427 8.015020 9.108726 CTBS_NEURONAV 10.740764 9.594459 2.07138024 9.315861 10.348823 DTMS_CM 9.602046 7.392293 -0.06323747 7.318963 9.126317 HD-TDCS_10-10EEG 13.081042 11.813233 4.29664195 11.554872 12.678058 HD-TDCS_10-20EEG 7.881058 5.443014 -1.99372060 5.424398 7.391157 HF-RTMS_10-20EEG 11.048000 8.134491 0.74461498 8.247129 10.532780 HF-RTMS_CM 11.468188 8.572864 1.18096287 8.679987 10.953835 HF-RTMS_NA 0.000000 9.553723 2.03714592 9.295406 10.418791 HF-RTMS_NEURONAV 6.813562 0.000000 -3.30855299 4.156279 6.308456 ITBS_10-20EEG 14.550178 11.944640 0.00000000 11.969373 14.050720 ITBS_CM 7.776560 5.377594 -2.06250461 0.000000 7.288991 ITBS_NA 10.618791 9.248617 1.73768832 9.007837 0.000000 ITBS_NEURONAV 11.955638 9.500988 2.06570278 9.486543 11.464758 LF-RTMS_10-10EEG 11.430410 10.095495 2.58259424 9.848601 11.021486 LF-RTMS_10-20EEG 7.586311 4.672875 -2.71700977 4.785490 7.071094 LF-RTMS_CM 8.192287 5.925160 -1.52583402 5.865139 7.712870 LF-RTMS_NEURONAV 14.927400 14.933163 7.35772251 14.488207 14.656983 SHAM 6.152167 2.771172 -4.55820947 3.041928 5.617292 TACS_10-20EEG 8.934123 6.612228 -0.83432272 6.565182 8.451266 TDCS_10-20EEG 6.900043 3.835186 -3.53697939 3.995450 6.377910 TDCS_10-20EG 12.564704 11.372335 3.85168763 11.101332 12.168533 ITBS_NEURONAV LF-RTMS_10-10EEG LF-RTMS_10-20EEG LF-RTMS_CM CTBS_10-20EEG 3.6099428 8.480831 7.022572 7.867038 CTBS_CM 3.6992300 8.499117 7.132594 7.946500 CTBS_NEURONAV 5.0026442 9.736664 8.454689 9.240972 DTMS_CM 2.9679678 8.542968 6.127752 7.335381 HD-TDCS_10-10EEG 7.2378134 12.069670 10.661921 11.489483 HD-TDCS_10-20EEG 1.0638501 6.812733 4.141409 5.463048 HF-RTMS_10-20EEG 3.8647356 9.963195 6.733885 8.335113 HF-RTMS_CM 4.2984791 10.383947 7.176770 8.766015 HF-RTMS_NA 4.9783395 9.810410 8.402384 9.230039 HF-RTMS_NEURONAV -0.2164708 5.735334 2.748787 4.222751 ITBS_10-20EEG 7.6014366 13.475626 10.612095 12.024950 ITBS_CM 0.9903990 6.709755 4.082717 5.384045 ITBS_NA 4.6874594 9.601486 8.087168 8.950622 ITBS_NEURONAV 0.0000000 10.886674 8.196472 9.526848 LF-RTMS_10-10EEG 5.5293761 0.000000 8.937582 9.788553 LF-RTMS_10-20EEG 0.4031005 6.501509 0.000000 4.873467 LF-RTMS_CM 1.5117979 7.130801 4.651788 0.000000 LF-RTMS_NEURONAV 10.2072609 14.003766 13.884364 14.332051 SHAM -1.3645311 5.054608 1.221892 3.181651 TACS_10-20EEG 2.2095664 7.870392 5.330136 6.592398 TDCS_10-20EEG -0.3944637 5.810748 2.394001 4.099906 TDCS_10-20EG 6.7866707 11.557817 10.228249 11.030019 LF-RTMS_NEURONAV SHAM TACS_10-20EEG TDCS_10-20EEG CTBS_10-20EEG 21.92445 7.763175 6.973852 7.457381 CTBS_CM 21.81943 7.889819 7.056267 7.573264 CTBS_NEURONAV 22.93675 9.226697 8.353432 8.900591 DTMS_CM 22.92212 6.640405 6.409597 6.485155 HD-TDCS_10-10EEG 25.44629 11.411754 10.597927 11.099981 HD-TDCS_10-20EEG 21.35934 4.565036 4.528095 4.470438 HF-RTMS_10-20EEG 24.79001 6.867355 7.380056 6.979895 HF-RTMS_CM 25.20155 7.325898 7.811748 7.426847 HF-RTMS_NA 23.18740 9.152167 8.338473 8.840427 HF-RTMS_NEURONAV 20.45300 3.031012 3.276417 3.035409 ITBS_10-20EEG 28.13075 10.954823 11.083059 10.916437 ITBS_CM 21.22936 4.523082 4.450686 4.416989 ITBS_NA 23.11698 8.817292 8.055616 8.518295 ITBS_NEURONAV 25.44456 8.612767 8.591215 8.523219 LF-RTMS_10-10EEG 23.88377 9.674608 8.894742 9.371133 LF-RTMS_10-20EEG 21.32829 3.405819 3.918413 3.518313 LF-RTMS_CM 21.55430 5.143899 4.958996 5.002539 LF-RTMS_NEURONAV 0.00000 14.823620 13.479124 14.390513 SHAM 20.08362 0.000000 2.205921 1.310011 TACS_10-20EEG 22.33477 5.801571 0.000000 5.674254 TDCS_10-20EEG 20.71013 2.369627 3.138219 0.000000 TDCS_10-20EG 24.82638 10.991996 10.140966 10.671225 TDCS_10-20EG CTBS_10-20EEG 8.241211 CTBS_CM 8.248301 CTBS_NEURONAV 9.475212 DTMS_CM 8.399328 HD-TDCS_10-10EEG 11.823929 HD-TDCS_10-20EEG 6.688678 HF-RTMS_10-20EEG 9.873867 HF-RTMS_CM 10.293436 HF-RTMS_NA 9.564704 HF-RTMS_NEURONAV 5.632175 ITBS_10-20EEG 13.364720 ITBS_CM 6.582486 ITBS_NA 9.368533 ITBS_NEURONAV 10.763969 LF-RTMS_10-10EEG 10.177817 LF-RTMS_10-20EEG 6.412176 LF-RTMS_CM 6.992267 LF-RTMS_NEURONAV 13.566376 SHAM 4.991996 TACS_10-20EEG 7.736616 TDCS_10-20EEG 5.730841 TDCS_10-20EG 0.000000

$statistic CTBS_10-20EEG CTBS_CM CTBS_NEURONAV DTMS_CM CTBS_10-20EEG NaN 0.04717079 -0.123832346 -0.4527074767 CTBS_CM -0.04717079 NaN -0.165883965 -0.4926436247 CTBS_NEURONAV 0.12383235 0.16588396 NaN -0.2722758107 DTMS_CM 0.45270748 0.49264362 0.272275811 NaN HD-TDCS_10-10EEG 0.63125209 0.66205056 0.478293243 0.3230171493 HD-TDCS_10-20EEG 0.13550588 0.18897320 -0.027514424 -0.4885569859 HF-RTMS_10-20EEG 1.06459140 1.07875827 0.812276572 0.8959060659 HF-RTMS_CM 1.16383444 1.17358981 0.903642262 1.0517689946 HF-RTMS_NA 0.21665091 0.25779252 0.083843021 -0.1803508038 HF-RTMS_NEURONAV -0.04663551 0.01641196 -0.200419324 -0.8193042592 ITBS_10-20EEG 1.79914576 1.78353762 1.499033183 1.9829838832 ITBS_CM 0.09873060 0.15340022 -0.060605611 -0.5346126004 ITBS_NA 0.24197680 0.28344654 0.104016611 -0.1651161589 ITBS_NEURONAV 1.10530682 1.11962332 0.867033216 0.9299336143 LF-RTMS_10-10EEG 0.37249464 0.41025872 0.229294513 0.0002055969 LF-RTMS_10-20EEG 0.19411299 0.24773066 0.016541752 -0.4857951627 LF-RTMS_CM 0.15194124 0.20359118 -0.008280214 -0.4332642829 LF-RTMS_NEURONAV -0.30471999 -0.27561221 -0.370921421 -0.5383114453 SHAM -0.08426357 -0.01501923 -0.243601455 -1.0448961224 TACS_10-20EEG 0.34271115 0.38731395 0.166954997 -0.1698938398 TDCS_10-20EEG 0.05363318 0.11448441 -0.114234668 -0.7410668617 TDCS_10-20EG 0.48096345 0.51502854 0.338774068 0.1489657122 HD-TDCS_10-10EEG HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM CTBS_10-20EEG -0.6312521 -0.13550588 -1.0645914 -1.16383444 CTBS_CM -0.6620506 -0.18897320 -1.0787583 -1.17358981 CTBS_NEURONAV -0.4782932 0.02751442 -0.8122766 -0.90364226 DTMS_CM -0.3230171 0.48855699 -0.8959061 -1.05176899 HD-TDCS_10-10EEG NaN 0.66144561 -0.1949564 -0.29349065 HD-TDCS_10-20EEG -0.6614456 NaN -1.6530412 -1.82341522 HF-RTMS_10-20EEG 0.1949564 1.65304121 NaN -0.23937946 HF-RTMS_CM 0.2934906 1.82341522 0.2393795 NaN HF-RTMS_NA -0.4089963 0.13999198 -0.7486810 -0.84613280 HF-RTMS_NEURONAV -0.8689006 -0.31996435 -2.3366174 -2.52700023 ITBS_10-20EEG 0.9447107 2.76251408 1.5902492 1.37831216 ITBS_CM -0.6928468 -0.05696864 -1.6855268 -1.85233652 ITBS_NA -0.4021447 0.17093777 -0.7638374 -0.86648635 ITBS_NEURONAV 0.2847424 1.55577218 0.1982609 0.01385558 LF-RTMS_10-10EEG -0.2672795 0.33731190 -0.5696755 -0.67090743 LF-RTMS_10-20EEG -0.6536392 0.08950456 -2.0735416 -2.28876343 LF-RTMS_CM -0.6248018 0.03083956 -1.4702601 -1.62757781 LF-RTMS_NEURONAV -0.6570024 -0.38723232 -0.7997036 -0.84436890 SHAM -0.9625030 -0.47716678 -3.8576063 -4.10396787 TACS_10-20EEG -0.4448928 0.32618434 -1.1680901 -1.33158793 TDCS_10-20EEG -0.8039203 -0.17372461 -2.6680454 -2.89440357 TDCS_10-20EG -0.1343334 0.46937441 -0.3660058 -0.46041019 HF-RTMS_NA HF-RTMS_NEURONAV ITBS_10-20EEG ITBS_CM CTBS_10-20EEG -0.21665091 0.04663551 -1.7991458 -0.09873060 CTBS_CM -0.25779252 -0.01641196 -1.7835376 -0.15340022 CTBS_NEURONAV -0.08384302 0.20041932 -1.4990332 0.06060561 DTMS_CM 0.18035080 0.81930426 -1.9829839 0.53461260 HD-TDCS_10-10EEG 0.40899633 0.86890065 -0.9447107 0.69284685 HD-TDCS_10-20EEG -0.13999198 0.31996435 -2.7625141 0.05696864 HF-RTMS_10-20EEG 0.74868104 2.33661740 -1.5902492 1.68552676 HF-RTMS_CM 0.84613280 2.52700023 -1.3783122 1.85233652 HF-RTMS_NA NaN 0.32813121 -1.4785442 0.17437260 HF-RTMS_NEURONAV -0.32813121 NaN -3.4617193 -0.25107673 ITBS_10-20EEG 1.47854424 3.46171929 NaN 2.77605127 ITBS_CM -0.17437260 0.25107673 -2.7760513 NaN ITBS_NA 0.01863298 0.37041733 -1.5285327 0.20671975 ITBS_NEURONAV 0.80756299 2.05135807 -1.1223422 1.58940808 LF-RTMS_10-10EEG 0.14948301 0.53981752 -1.3295340 0.37153595 LF-RTMS_10-20EEG -0.10003780 0.50812651 -3.3089655 0.15531992 LF-RTMS_CM -0.11674424 0.32880269 -2.5296462 0.08382182 LF-RTMS_NEURONAV -0.42475108 -0.30573208 -1.1472567 -0.36991374 SHAM -0.38419782 -0.08777302 -4.7532942 -0.38374153 TACS_10-20EEG 0.06758987 0.66116945 -2.2790750 0.37621512 TDCS_10-20EEG -0.24161182 0.22815100 -3.8387883 -0.09821177 TDCS_10-20EG 0.26570490 0.66161911 -1.0829902 0.50084067 ITBS_NA ITBS_NEURONAV LF-RTMS_10-10EEG LF-RTMS_10-20EEG CTBS_10-20EEG -0.24197680 -1.10530682 -0.3724946363 -0.19411299 CTBS_CM -0.28344654 -1.11962332 -0.4102587242 -0.24773066 CTBS_NEURONAV -0.10401661 -0.86703322 -0.2292945128 -0.01654175 DTMS_CM 0.16511616 -0.92993361 -0.0002055969 0.48579516 HD-TDCS_10-10EEG 0.40214467 -0.28474244 0.2672795303 0.65363923 HD-TDCS_10-20EEG -0.17093777 -1.55577218 -0.3373118968 -0.08950456 HF-RTMS_10-20EEG 0.76383739 -0.19826093 0.5696755071 2.07354158 HF-RTMS_CM 0.86648635 -0.01385558 0.6709074253 2.28876343 HF-RTMS_NA -0.01863298 -0.80756299 -0.1494830066 0.10003780 HF-RTMS_NEURONAV -0.37041733 -2.05135807 -0.5398175151 -0.50812651 ITBS_10-20EEG 1.52853272 1.12234225 1.3295340176 3.30896553 ITBS_CM -0.20671975 -1.58940808 -0.3715359539 -0.15531992 ITBS_NA NaN -0.82238000 -0.1349538202 0.13137830 ITBS_NEURONAV 0.82238000 NaN 0.6396247057 1.77621939 LF-RTMS_10-10EEG 0.13495382 -0.63962471 NaN 0.30925498 LF-RTMS_10-20EEG -0.13137830 -1.77621939 -0.3092549820 NaN LF-RTMS_CM -0.14558466 -1.42311019 -0.3078780401 -0.04561370 LF-RTMS_NEURONAV -0.43896093 -0.83767268 -0.5111033321 -0.41433481 SHAM -0.43450405 -2.69791780 -0.6147668671 -0.92495345 TACS_10-20EEG 0.04697797 -1.15804595 -0.1197538316 0.29917411 TDCS_10-20EEG -0.28162048 -2.15018611 -0.4596416666 -0.37271529 TDCS_10-20EG 0.25481183 -0.44416394 0.1244385251 0.44946965 LF-RTMS_CM LF-RTMS_NEURONAV SHAM TACS_10-20EEG CTBS_10-20EEG -0.151941237 0.3047200 0.08426357 -0.34271115 CTBS_CM -0.203591183 0.2756122 0.01501923 -0.38731395 CTBS_NEURONAV 0.008280214 0.3709214 0.24360145 -0.16695500 DTMS_CM 0.433264283 0.5383114 1.04489612 0.16989384 HD-TDCS_10-10EEG 0.624801795 0.6570024 0.96250301 0.44489278 HD-TDCS_10-20EEG -0.030839557 0.3872323 0.47716678 -0.32618434 HF-RTMS_10-20EEG 1.470260105 0.7997036 3.85760627 1.16809009 HF-RTMS_CM 1.627577807 0.8443689 4.10396787 1.33158793 HF-RTMS_NA 0.116744235 0.4247511 0.38419782 -0.06758987 HF-RTMS_NEURONAV -0.328802694 0.3057321 0.08777302 -0.66116945 ITBS_10-20EEG 2.529646196 1.1472567 4.75329424 2.27907503 ITBS_CM -0.083821816 0.3699137 0.38374153 -0.37621512 ITBS_NA 0.145584664 0.4389609 0.43450405 -0.04697797 ITBS_NEURONAV 1.423110194 0.8376727 2.69791780 1.15804595 LF-RTMS_10-10EEG 0.307878040 0.5111033 0.61476687 0.11975383 LF-RTMS_10-20EEG 0.045613705 0.4143348 0.92495345 -0.29917411 LF-RTMS_CM NaN 0.3944493 0.46194380 -0.27714478 LF-RTMS_NEURONAV -0.394449323 NaN -0.29533732 -0.48463742 SHAM -0.461943798 0.2953373 NaN -0.88009377 TACS_10-20EEG 0.277144778 0.4846374 0.88009377 NaN TDCS_10-20EEG -0.194357397 0.3528773 0.56440559 -0.56403421 TDCS_10-20EG 0.439114551 0.5748271 0.73572256 0.26359489 TDCS_10-20EEG TDCS_10-20EG CTBS_10-20EEG -0.05363318 -0.4809634 CTBS_CM -0.11448441 -0.5150285 CTBS_NEURONAV 0.11423467 -0.3387741 DTMS_CM 0.74106686 -0.1489657 HD-TDCS_10-10EEG 0.80392028 0.1343334 HD-TDCS_10-20EEG 0.17372461 -0.4693744 HF-RTMS_10-20EEG 2.66804535 0.3660058 HF-RTMS_CM 2.89440357 0.4604102 HF-RTMS_NA 0.24161182 -0.2657049 HF-RTMS_NEURONAV -0.22815100 -0.6616191 ITBS_10-20EEG 3.83878829 1.0829902 ITBS_CM 0.09821177 -0.5008407 ITBS_NA 0.28162048 -0.2548118 ITBS_NEURONAV 2.15018611 0.4441639 LF-RTMS_10-10EEG 0.45964167 -0.1244385 LF-RTMS_10-20EEG 0.37271529 -0.4494696 LF-RTMS_CM 0.19435740 -0.4391146 LF-RTMS_NEURONAV -0.35287727 -0.5748271 SHAM -0.56440559 -0.7357226 TACS_10-20EEG 0.56403421 -0.2635949 TDCS_10-20EEG NaN -0.5903510 TDCS_10-20EG 0.59035098 NaN

$p CTBS_10-20EEG CTBS_CM CTBS_NEURONAV DTMS_CM CTBS_10-20EEG NaN 0.96237711 0.9014480 0.65075940 CTBS_CM 0.96237711 NaN 0.8682483 0.62226442 CTBS_NEURONAV 0.90144802 0.86824827 NaN 0.78540995 DTMS_CM 0.65075940 0.62226442 0.7854100 NaN HD-TDCS_10-10EEG 0.52787571 0.50793882 0.6324415 0.74668225 HD-TDCS_10-20EEG 0.89221192 0.85011382 0.9780494 0.62515537 HF-RTMS_10-20EEG 0.28706087 0.28069550 0.4166330 0.37030293 HF-RTMS_CM 0.24449111 0.24055937 0.3661851 0.29290555 HF-RTMS_NA 0.82848041 0.79656704 0.9331812 0.85687717 HF-RTMS_NEURONAV 0.96280373 0.98690574 0.8411526 0.41261284 ITBS_10-20EEG 0.07199563 0.07449883 0.1338650 0.04736923 ITBS_CM 0.92135218 0.87808267 0.9516733 0.59291777 ITBS_NA 0.80879814 0.77683456 0.9171562 0.86885255 ITBS_NEURONAV 0.26902666 0.26287431 0.3859238 0.35240546 LF-RTMS_10-10EEG 0.70952460 0.68161617 0.8186400 0.99983596 LF-RTMS_10-20EEG 0.84608741 0.80434280 0.9868022 0.62711240 LF-RTMS_CM 0.87923328 0.83867298 0.9933934 0.66482278 LF-RTMS_NEURONAV 0.76057942 0.78284593 0.7106961 0.59036205 SHAM 0.93284688 0.98801684 0.8075395 0.29607098 TACS_10-20EEG 0.73181578 0.69852380 0.8674055 0.86509363 TDCS_10-20EEG 0.95722742 0.90885380 0.9090518 0.45865290 TDCS_10-20EG 0.63054248 0.60653308 0.7347799 0.88158069 HD-TDCS_10-10EEG HD-TDCS_10-20EEG HF-RTMS_10-20EEG CTBS_10-20EEG 0.5278757 0.892211919 0.2870608733 CTBS_CM 0.5079388 0.850113824 0.2806955006 CTBS_NEURONAV 0.6324415 0.978049435 0.4166329506 DTMS_CM 0.7466823 0.625155372 0.3703029342 HD-TDCS_10-10EEG NaN 0.508326586 0.8454270856 HD-TDCS_10-20EEG 0.5083266 NaN 0.0983224764 HF-RTMS_10-20EEG 0.8454271 0.098322476 NaN HF-RTMS_CM 0.7691471 0.068240526 0.8108113572 HF-RTMS_NA 0.6825424 0.888666330 0.4540494728 HF-RTMS_NEURONAV 0.3849015 0.748995356 0.0194590870 ITBS_10-20EEG 0.3448066 0.005735809 0.1117786555 ITBS_CM 0.4884057 0.954570180 0.0918869865 ITBS_NA 0.6875776 0.864272700 0.4449641545 ITBS_NEURONAV 0.7758415 0.119762276 0.8428409148 LF-RTMS_10-10EEG 0.7892539 0.735881792 0.5688978053 LF-RTMS_10-20EEG 0.5133443 0.928680932 0.0381219055 LF-RTMS_CM 0.5321012 0.975397494 0.1414913216 LF-RTMS_NEURONAV 0.5111794 0.698584222 0.4238825366 SHAM 0.3357970 0.633243362 0.0001145029 TACS_10-20EEG 0.6563972 0.744284885 0.2427704278 TDCS_10-20EEG 0.4214430 0.862081898 0.0076293959 TDCS_10-20EG 0.8931389 0.638802033 0.7143607679 HF-RTMS_CM HF-RTMS_NA HF-RTMS_NEURONAV ITBS_10-20EEG CTBS_10-20EEG 2.444911e-01 0.8284804 0.9628037272 7.199563e-02 CTBS_CM 2.405594e-01 0.7965670 0.9869057393 7.449883e-02 CTBS_NEURONAV 3.661851e-01 0.9331812 0.8411526479 1.338650e-01 DTMS_CM 2.929055e-01 0.8568772 0.4126128432 4.736923e-02 HD-TDCS_10-10EEG 7.691471e-01 0.6825424 0.3849014744 3.448066e-01 HD-TDCS_10-20EEG 6.824053e-02 0.8886663 0.7489953565 5.735809e-03 HF-RTMS_10-20EEG 8.108114e-01 0.4540495 0.0194590870 1.117787e-01 HF-RTMS_CM NaN 0.3974787 0.0115041427 1.681069e-01 HF-RTMS_NA 3.974787e-01 NaN 0.7428124578 1.392622e-01 HF-RTMS_NEURONAV 1.150414e-02 0.7428125 NaN 5.367367e-04 ITBS_10-20EEG 1.681069e-01 0.1392622 0.0005367367 NaN ITBS_CM 6.397751e-02 0.8615726 0.8017547832 5.502353e-03 ITBS_NA 3.862235e-01 0.9851339 0.7110715622 1.263803e-01 ITBS_NEURONAV 9.889452e-01 0.4193422 0.0402320895 2.617170e-01 LF-RTMS_10-10EEG 5.022795e-01 0.8811725 0.5893228868 1.836719e-01 LF-RTMS_10-20EEG 2.209310e-02 0.9203143 0.6113646227 9.364137e-04 LF-RTMS_CM 1.036144e-01 0.9070627 0.7423048269 1.141776e-02 LF-RTMS_NEURONAV 3.984633e-01 0.6710181 0.7598086481 2.512755e-01 SHAM 4.061239e-05 0.7008318 0.9300570843 2.001288e-06 TACS_10-20EEG 1.829956e-01 0.9461121 0.5085036507 2.266261e-02 TDCS_10-20EEG 3.798796e-03 0.8090810 0.8195288519 1.236430e-04 TDCS_10-20EG 6.452218e-01 0.7904665 0.5082153589 2.788128e-01 ITBS_CM ITBS_NA ITBS_NEURONAV LF-RTMS_10-10EEG CTBS_10-20EEG 0.921352176 0.8087981 0.269026665 0.7095246 CTBS_CM 0.878082671 0.7768346 0.262874312 0.6816162 CTBS_NEURONAV 0.951673305 0.9171562 0.385923810 0.8186400 DTMS_CM 0.592917769 0.8688526 0.352405458 0.9998360 HD-TDCS_10-10EEG 0.488405668 0.6875776 0.775841477 0.7892539 HD-TDCS_10-20EEG 0.954570180 0.8642727 0.119762276 0.7358818 HF-RTMS_10-20EEG 0.091886987 0.4449642 0.842840915 0.5688978 HF-RTMS_CM 0.063977515 0.3862235 0.988945199 0.5022795 HF-RTMS_NA 0.861572648 0.9851339 0.419342201 0.8811725 HF-RTMS_NEURONAV 0.801754783 0.7110716 0.040232090 0.5893229 ITBS_10-20EEG 0.005502353 0.1263803 0.261716950 0.1836719 ITBS_CM NaN 0.8362287 0.111968291 0.7102384 ITBS_NA 0.836228736 NaN 0.410860656 0.8926484 ITBS_NEURONAV 0.111968291 0.4108607 NaN 0.5224166 LF-RTMS_10-10EEG 0.710238382 0.8926484 0.522416617 NaN LF-RTMS_10-20EEG 0.876569112 0.8954761 0.075696764 0.7571276 LF-RTMS_CM 0.933198103 0.8842493 0.154704214 0.7581751 LF-RTMS_NEURONAV 0.711446767 0.6606898 0.402214561 0.6092787 SHAM 0.701170028 0.6639225 0.006977467 0.5387087 TACS_10-20EEG 0.706756978 0.9625308 0.246845287 0.9046782 TDCS_10-20EEG 0.921764140 0.7782345 0.031540496 0.6457734 TDCS_10-20EG 0.616483259 0.7988684 0.656924063 0.9009681 LF-RTMS_10-20EEG LF-RTMS_CM LF-RTMS_NEURONAV SHAM CTBS_10-20EEG 0.8460874107 0.87923328 0.7605794 9.328469e-01 CTBS_CM 0.8043428049 0.83867298 0.7828459 9.880168e-01 CTBS_NEURONAV 0.9868021931 0.99339342 0.7106961 8.075395e-01 DTMS_CM 0.6271124044 0.66482278 0.5903621 2.960710e-01 HD-TDCS_10-10EEG 0.5133442664 0.53210115 0.5111794 3.357970e-01 HD-TDCS_10-20EEG 0.9286809317 0.97539749 0.6985842 6.332434e-01 HF-RTMS_10-20EEG 0.0381219055 0.14149132 0.4238825 1.145029e-04 HF-RTMS_CM 0.0220931011 0.10361444 0.3984633 4.061239e-05 HF-RTMS_NA 0.9203143159 0.90706274 0.6710181 7.008318e-01 HF-RTMS_NEURONAV 0.6113646227 0.74230483 0.7598086 9.300571e-01 ITBS_10-20EEG 0.0009364137 0.01141776 0.2512755 2.001288e-06 ITBS_CM 0.8765691122 0.93319810 0.7114468 7.011700e-01 ITBS_NA 0.8954760545 0.88424928 0.6606898 6.639225e-01 ITBS_NEURONAV 0.0756967636 0.15470421 0.4022146 6.977467e-03 LF-RTMS_10-10EEG 0.7571275727 0.75817514 0.6092787 5.387087e-01 LF-RTMS_10-20EEG NaN 0.96361815 0.6786289 3.549901e-01 LF-RTMS_CM 0.9636181458 NaN 0.6932493 6.441216e-01 LF-RTMS_NEURONAV 0.6786289241 0.69324933 NaN 7.677362e-01 SHAM 0.3549901202 0.64412162 0.7677362 NaN TACS_10-20EEG 0.7648071986 0.78166894 0.6279336 3.788085e-01 TDCS_10-20EEG 0.7093603550 0.84589605 0.7241804 5.724781e-01 TDCS_10-20EG 0.6530929004 0.66057854 0.5654082 4.618996e-01 TACS_10-20EEG TDCS_10-20EEG TDCS_10-20EG CTBS_10-20EEG 0.73181578 0.957227424 0.6305425 CTBS_CM 0.69852380 0.908853802 0.6065331 CTBS_NEURONAV 0.86740546 0.909051771 0.7347799 DTMS_CM 0.86509363 0.458652901 0.8815807 HD-TDCS_10-10EEG 0.65639724 0.421443017 0.8931389 HD-TDCS_10-20EEG 0.74428489 0.862081898 0.6388020 HF-RTMS_10-20EEG 0.24277043 0.007629396 0.7143608 HF-RTMS_CM 0.18299563 0.003798796 0.6452218 HF-RTMS_NA 0.94611212 0.809080959 0.7904665 HF-RTMS_NEURONAV 0.50850365 0.819528852 0.5082154 ITBS_10-20EEG 0.02266261 0.000123643 0.2788128 ITBS_CM 0.70675698 0.921764140 0.6164833 ITBS_NA 0.96253078 0.778234535 0.7988684 ITBS_NEURONAV 0.24684529 0.031540496 0.6569241 LF-RTMS_10-10EEG 0.90467816 0.645773446 0.9009681 LF-RTMS_10-20EEG 0.76480720 0.709360355 0.6530929 LF-RTMS_CM 0.78166894 0.845896046 0.6605785 LF-RTMS_NEURONAV 0.62793356 0.724180449 0.5654082 SHAM 0.37880852 0.572478135 0.4618996 TACS_10-20EEG NaN 0.572730849 0.7920921 TDCS_10-20EEG 0.57273085 NaN 0.5549554 TDCS_10-20EG 0.79209210 0.554955365 NaN

Quantifying heterogeneity / inconsistency: I^2 = 82.1% [78.4%; 85.1%]

Tests of heterogeneity (within designs) and inconsistency (between designs): [1] 496.6347

Details of network meta-analysis methods:

  • Calculation of I^2 based on Q

Generating Forest Plot for: negative_symptoms Generating Network Graph for: negative_symptoms Calculating SUCRA/P-score values for: negative_symptoms Mean rank column not found in netrank results. SUCRA/P-score Results: Treatment SUCRA 1 SHAM 73.4 2 HF-RTMS_NEURONAV 69.6 3 LF-RTMS_NEURONAV 69.0 4 TDCS_10-20EEG 65.4 5 CTBS_CM 64.6 6 CTBS_10-20EEG 63.0 7 ITBS_CM 62.2 8 HD-TDCS_10-20EEG 60.6 9 LF-RTMS_CM 59.5 10 LF-RTMS_10-20EEG 58.3 11 CTBS_NEURONAV 57.1 12 HF-RTMS_NA 53.6 13 ITBS_NA 52.9 14 TACS_10-20EEG 50.9 15 LF-RTMS_10-10EEG 47.1 16 DTMS_CM 45.8 17 TDCS_10-20EG 41.9 18 HD-TDCS_10-10EEG 35.9 19 HF-RTMS_10-20EEG 23.0 20 ITBS_NEURONAV 21.0 21 HF-RTMS_CM 19.9 22 ITBS_10-20EEG 5.3 Skipping Split Analysis (Direct vs Indirect) for: negative_symptoms - Requires at least 3 treatments or k.trts is missing/invalid.

— Generating League Table for: negative_symptoms — League Table (Model: random ):
League Table: negative_symptoms ( random effects)
CTBS_10-20EEG CTBS_CM CTBS_NEURONAV DTMS_CM HD-TDCS_10-10EEG HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM HF-RTMS_NA HF-RTMS_NEURONAV ITBS_10-20EEG ITBS_CM ITBS_NA ITBS_NEURONAV LF-RTMS_10-10EEG LF-RTMS_10-20EEG LF-RTMS_CM LF-RTMS_NEURONAV SHAM TACS_10-20EEG TDCS_10-20EEG TDCS_10-20EG
CTBS_10-20EEG CTBS_10-20EEG . . . . . . . . . . . . . . . . . 0.32 [ -7.12, 7.76] . . .
CTBS_CM 0.26 [-10.54, 11.06] CTBS_CM . . . . . . . . . . . . . . . . 0.06 [ -7.77, 7.89] . . .
CTBS_NEURONAV -0.70 [-11.78, 10.38] -0.96 [-12.30, 10.38] CTBS_NEURONAV . . . . . . . . . . . . . . . 1.02 [ -7.19, 9.23] . . .
DTMS_CM -1.99 [-10.60, 6.62] -2.25 [-11.20, 6.70] -1.29 [-10.57, 7.99] DTMS_CM . . . . . . . . . . . . . . 2.31 [ -2.02, 6.64] . . .
HD-TDCS_10-10EEG -3.44 [-14.11, 7.24] -3.70 [-14.65, 7.25] -2.74 [-13.96, 8.48] -1.45 [-10.24, 7.34] HD-TDCS_10-10EEG . . . . . . . . . . . . . 3.76 [ -3.89, 11.41] . . .
HD-TDCS_10-20EEG -0.57 [ -8.87, 7.73] -0.83 [ -9.48, 7.81] 0.13 [ -8.86, 9.12] 1.42 [ -4.26, 7.09] 2.86 [ -5.62, 11.35] HD-TDCS_10-20EEG . . . . . . . . . . . . 0.89 [ -2.78, 4.57] . . .
HF-RTMS_10-20EEG -4.23 [-12.03, 3.56] -4.49 [-12.66, 3.67] -3.53 [-12.06, 4.99] -2.24 [ -7.16, 2.67] -0.80 [ -8.79, 7.20] -3.66 [ -8.00, 0.68] HF-RTMS_10-20EEG . . . . . . . . . . . 4.55 [ 2.24, 6.87] . . .
HF-RTMS_CM -4.64 [-12.45, 3.17] -4.90 [-13.08, 3.28] -3.94 [-12.48, 4.60] -2.65 [ -7.59, 2.29] -1.20 [ -9.21, 6.81] -4.06 [ -8.43, 0.30] -0.40 [ -3.71, 2.91] HF-RTMS_CM . . . . . . . . . . 4.96 [ 2.59, 7.33] . . .
HF-RTMS_NA -1.18 [-11.86, 9.50] -1.44 [-12.39, 9.51] -0.48 [-11.70, 10.74] 0.81 [ -7.98, 9.60] 2.26 [ -8.56, 13.08] -0.61 [ -9.09, 7.88] 3.05 [ -4.94, 11.05] 3.46 [ -4.55, 11.47] HF-RTMS_NA . . . . . . . . . 1.50 [ -6.15, 9.15] . . .
HF-RTMS_NEURONAV 0.19 [ -7.80, 8.18] -0.07 [ -8.42, 8.28] 0.89 [ -7.81, 9.59] 2.18 [ -3.03, 7.39] 3.63 [ -4.56, 11.81] 0.76 [ -3.92, 5.44] 4.42 [ 0.71, 8.13] 4.83 [ 1.08, 8.57] 1.37 [ -6.81, 9.55] HF-RTMS_NEURONAV . . . . . . . . 0.13 [ -2.77, 3.03] . . .
ITBS_10-20EEG -7.44 [-15.54, 0.66] -7.70 [-16.15, 0.76] -6.74 [-15.54, 2.07] -5.45 [-10.83, -0.06] -4.00 [-12.29, 4.30] -6.86 [-11.73, -1.99] -3.20 [ -7.15, 0.74] -2.80 [ -6.78, 1.18] -6.26 [-14.55, 2.04] -7.63 [-11.94, -3.31] ITBS_10-20EEG . . . . . . . 7.76 [ 4.56, 10.95] . . .
ITBS_CM -0.42 [ -8.77, 7.93] -0.68 [ -9.38, 8.02] 0.28 [ -8.76, 9.32] 1.57 [ -4.18, 7.32] 3.02 [ -5.52, 11.55] 0.15 [ -5.12, 5.42] 3.81 [ -0.62, 8.25] 4.22 [ -0.25, 8.68] 0.76 [ -7.78, 9.30] -0.61 [ -5.38, 4.16] 7.02 [ 2.06, 11.97] ITBS_CM . . . . . . 0.74 [ -3.04, 4.52] . . .
ITBS_NA -1.28 [-11.65, 9.09] -1.54 [-12.19, 9.11] -0.58 [-11.51, 10.35] 0.71 [ -7.71, 9.13] 2.16 [ -8.36, 12.68] -0.71 [ -8.80, 7.39] 2.95 [ -4.63, 10.53] 3.36 [ -4.24, 10.95] -0.10 [-10.62, 10.42] -1.47 [ -9.25, 6.31] 6.16 [ -1.74, 14.05] -0.86 [ -9.01, 7.29] ITBS_NA . . . . . 1.60 [ -5.62, 8.82] . . .
ITBS_NEURONAV -4.67 [-12.95, 3.61] -4.93 [-13.56, 3.70] -3.97 [-12.94, 5.00] -2.68 [ -8.33, 2.97] -1.23 [ -9.70, 7.24] -4.09 [ -9.25, 1.06] -0.43 [ -4.73, 3.86] -0.03 [ -4.36, 4.30] -3.49 [-11.96, 4.98] -4.86 [ -9.50, -0.22] 2.77 [ -2.07, 7.60] -4.25 [ -9.49, 0.99] -3.39 [-11.46, 4.69] ITBS_NEURONAV . . . . 4.99 [ 1.36, 8.61] . . .
LF-RTMS_10-10EEG -1.99 [-12.46, 8.48] -2.25 [-13.00, 8.50] -1.29 [-12.32, 9.74] -0.00 [ -8.54, 8.54] 1.45 [ -9.17, 12.07] -1.42 [ -9.65, 6.81] 2.24 [ -5.48, 9.96] 2.65 [ -5.09, 10.38] -0.81 [-11.43, 9.81] -2.18 [-10.10, 5.74] 5.45 [ -2.58, 13.48] -1.57 [ -9.85, 6.71] -0.71 [-11.02, 9.60] 2.68 [ -5.53, 10.89] LF-RTMS_10-10EEG . . . 2.31 [ -5.05, 9.67] . . .
LF-RTMS_10-20EEG -0.77 [ -8.57, 7.02] -1.03 [ -9.20, 7.13] -0.07 [ -8.60, 8.45] 1.22 [ -3.69, 6.13] 2.67 [ -5.33, 10.66] -0.20 [ -4.54, 4.14] 3.46 [ 0.19, 6.73] 3.87 [ 0.56, 7.18] 0.41 [ -7.59, 8.40] -0.96 [ -4.67, 2.75] 6.66 [ 2.72, 10.61] -0.35 [ -4.79, 4.08] 0.51 [ -7.07, 8.09] 3.90 [ -0.40, 8.20] 1.22 [ -6.50, 8.94] LF-RTMS_10-20EEG . . 1.09 [ -1.22, 3.41] . . .
LF-RTMS_CM -0.66 [ -9.19, 7.87] -0.92 [ -9.79, 7.95] 0.04 [ -9.16, 9.24] 1.33 [ -4.68, 7.34] 2.78 [ -5.93, 11.49] -0.09 [ -5.64, 5.46] 3.57 [ -1.19, 8.34] 3.98 [ -0.81, 8.77] 0.52 [ -8.19, 9.23] -0.85 [ -5.93, 4.22] 6.78 [ 1.53, 12.02] -0.24 [ -5.87, 5.38] 0.62 [ -7.71, 8.95] 4.01 [ -1.51, 9.53] 1.33 [ -7.13, 9.79] 0.11 [ -4.65, 4.87] LF-RTMS_CM . 0.98 [ -3.18, 5.14] . . .
LF-RTMS_NEURONAV 2.95 [-16.02, 21.92] 2.69 [-16.44, 21.82] 3.65 [-15.64, 22.94] 4.94 [-13.04, 22.92] 6.39 [-12.67, 25.45] 3.52 [-14.31, 21.36] 7.18 [-10.42, 24.79] 7.59 [-10.03, 25.20] 4.13 [-14.93, 23.19] 2.76 [-14.93, 20.45] 10.39 [ -7.36, 28.13] 3.37 [-14.49, 21.23] 4.23 [-14.66, 23.12] 7.62 [-10.21, 25.44] 4.94 [-14.00, 23.88] 3.72 [-13.88, 21.33] 3.61 [-14.33, 21.55] LF-RTMS_NEURONAV -2.63 [-20.08, 14.82] . . .
SHAM 0.32 [ -7.12, 7.76] 0.06 [ -7.77, 7.89] 1.02 [ -7.19, 9.23] 2.31 [ -2.02, 6.64] 3.76 [ -3.89, 11.41] 0.89 [ -2.78, 4.57] 4.55 [ 2.24, 6.87] 4.96 [ 2.59, 7.33] 1.50 [ -6.15, 9.15] 0.13 [ -2.77, 3.03] 7.76 [ 4.56, 10.95] 0.74 [ -3.04, 4.52] 1.60 [ -5.62, 8.82] 4.99 [ 1.36, 8.61] 2.31 [ -5.05, 9.67] 1.09 [ -1.22, 3.41] 0.98 [ -3.18, 5.14] -2.63 [-20.08, 14.82] SHAM -1.80 [ -5.80, 2.21] -0.53 [ -2.37, 1.31] -3.00 [-10.99, 4.99]
TACS_10-20EEG -1.48 [ -9.93, 6.97] -1.74 [-10.53, 7.06] -0.78 [ -9.91, 8.35] 0.51 [ -5.39, 6.41] 1.96 [ -6.68, 10.60] -0.90 [ -6.34, 4.53] 2.76 [ -1.87, 7.38] 3.16 [ -1.49, 7.81] -0.30 [ -8.93, 8.34] -1.67 [ -6.61, 3.28] 5.96 [ 0.83, 11.08] -1.06 [ -6.57, 4.45] -0.20 [ -8.45, 8.06] 3.19 [ -2.21, 8.59] 0.51 [ -7.87, 8.89] -0.71 [ -5.33, 3.92] -0.82 [ -6.59, 4.96] -4.43 [-22.33, 13.48] -1.80 [ -5.80, 2.21] TACS_10-20EEG . .
TDCS_10-20EEG -0.21 [ -7.88, 7.46] -0.47 [ -8.51, 7.57] 0.49 [ -7.92, 8.90] 1.78 [ -2.93, 6.49] 3.23 [ -4.64, 11.10] 0.36 [ -3.74, 4.47] 4.02 [ 1.07, 6.98] 4.43 [ 1.43, 7.43] 0.97 [ -6.90, 8.84] -0.40 [ -3.84, 3.04] 7.23 [ 3.54, 10.92] 0.21 [ -4.00, 4.42] 1.07 [ -6.38, 8.52] 4.46 [ 0.39, 8.52] 1.78 [ -5.81, 9.37] 0.56 [ -2.39, 3.52] 0.45 [ -4.10, 5.00] -3.16 [-20.71, 14.39] -0.53 [ -2.37, 1.31] 1.27 [ -3.14, 5.67] TDCS_10-20EEG .
TDCS_10-20EG -2.68 [-13.60, 8.24] -2.94 [-14.13, 8.25] -1.98 [-13.44, 9.48] -0.69 [ -9.78, 8.40] 0.76 [-10.31, 11.82] -2.11 [-10.90, 6.69] 1.55 [ -6.77, 9.87] 1.96 [ -6.38, 10.29] -1.50 [-12.56, 9.56] -2.87 [-11.37, 5.63] 4.76 [ -3.85, 13.36] -2.26 [-11.10, 6.58] -1.40 [-12.17, 9.37] 1.99 [ -6.79, 10.76] -0.69 [-11.56, 10.18] -1.91 [-10.23, 6.41] -2.02 [-11.03, 6.99] -5.63 [-24.83, 13.57] -3.00 [-10.99, 4.99] -1.20 [-10.14, 7.74] -2.47 [-10.67, 5.73] TDCS_10-20EG

Interpretation Guide: - Comparisons are ‘Column Treatment’ vs ‘Row Treatment’. - Cells contain: MD [95% CI]. - Positive MD favors the column treatment (assuming positive TE = benefit after direction adjustment).

Generating Comparison-Adjusted Funnel Plot for: negative_symptoms Visual assessment of funnel plot asymmetry recommended. Asymmetry may suggest publication bias or other systematic differences between small and large studies.

Generating Rankogram for: negative_symptoms

— Performing Network Meta-Regression for: negative_symptoms using covariate: Overall_RoB_Level — !!! Error during netmetareg execution for negative_symptoms with covariate Overall_RoB_Level : object ‘netmetareg’ not found -> Double-check if the covariate ’ Overall_RoB_Level ’ exists in the data frame used by the nma_result object. — Meta-regression failed for: negative_symptoms using covariate: Overall_RoB_Level —

Skipping meta-regression for Diagnosis - ‘Diagnosis’ column not found or contains only NA values.

========================================================== Finished NMA Workflow for Domain: negative_symptoms ==========================================================

========================================================== Starting NMA Workflow for Domain: total_psychopathology ==========================================================

— Running Network Meta-Analysis for: total_psychopathology — Number of comparisons: 74 Number of unique studies (studlab): 74 Treatments included: ITBS_CM, LF-RTMS_NEURONAV, PRM-RTMS_NEURONAV, TDCS_10-20EEG, TACS_10-20EEG, ITBS_10-20EEG, LF-RTMS_10-20EEG, HF-RTMS_NEURONAV, HF-RTMS_10-20EEG, LF-RTMS_CM, DTMS_CM, HD-TDCS_10-20EEG, LF-RTMS_10-10EEG, HF-RTMS_CM, ITBS_NA, CTBS_CM, HF-RTMS_NA, CTBS_NEURONAV, CTBS_10-20EEG, ITBS_NEURONAV, SHAM Reference treatment: SHAM Model type: Random Effects (tau method: REML ) — NMA completed successfully for: total_psychopathology — Estimated heterogeneity (tau^2): 13.8512 I^2 statistic (overall inconsistency): 63.4% Cochran’s Q: 147.45 , df = 54 , p-value = 1.31e-10

— NMA Summary —

Results ( effects model): Number of studies: k = 74 Number of pairwise comparisons: m = 74 Number of treatments: n = 21 Number of designs: d = 20

Treatment estimates (sm = ‘MD’, comparison: other treatments vs ‘SHAM’): $TE CTBS_10-20EEG CTBS_CM CTBS_NEURONAV DTMS_CM CTBS_10-20EEG 0.0000000 -0.8600000 2.32000000 -2.147478573 CTBS_CM 0.8600000 0.0000000 3.18000000 -1.287478573 CTBS_NEURONAV -2.3200000 -3.1800000 0.00000000 -4.467478573 DTMS_CM 2.1474786 1.2874786 4.46747857 0.000000000 HD-TDCS_10-20EEG 0.2041868 -0.6558132 2.52418679 -1.943291782 HF-RTMS_10-20EEG 4.5155463 3.6555463 6.83554631 2.368067741 HF-RTMS_CM 2.8463853 1.9863853 5.16638531 0.698906739 HF-RTMS_NA -2.3927867 -3.2527867 -0.07278672 -4.540265292 HF-RTMS_NEURONAV -3.4975087 -4.3575087 -1.17750869 -5.644987260 ITBS_10-20EEG 2.7857905 1.9257905 5.10579054 0.638311965 ITBS_CM 2.1488248 1.2888248 4.46882484 0.001346268 ITBS_NA -0.4100000 -1.2700000 1.91000000 -2.557478573 ITBS_NEURONAV 10.5324865 9.6724865 12.85248647 8.385007897 LF-RTMS_10-10EEG 7.8200000 6.9600000 10.14000000 5.672521427 LF-RTMS_10-20EEG 7.0415237 6.1815237 9.36152370 4.894045129 LF-RTMS_CM -3.3275215 -4.1875215 -1.00752150 -5.475000074 LF-RTMS_NEURONAV -0.3100000 -1.1700000 2.01000000 -2.457478573 PRM-RTMS_NEURONAV 3.7600000 2.9000000 6.08000000 1.612521427 SHAM -2.1100000 -2.9700000 0.21000000 -4.257478573 TACS_10-20EEG 0.6280189 -0.2319811 2.94801887 -1.519459699 TDCS_10-20EEG -0.3279067 -1.1879067 1.99209330 -2.475385277 HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM HF-RTMS_NA CTBS_10-20EEG -0.2041868 -4.5155463 -2.84638531 2.39278672 CTBS_CM 0.6558132 -3.6555463 -1.98638531 3.25278672 CTBS_NEURONAV -2.5241868 -6.8355463 -5.16638531 0.07278672 DTMS_CM 1.9432918 -2.3680677 -0.69890674 4.54026529 HD-TDCS_10-20EEG 0.0000000 -4.3113595 -2.64219852 2.59697351 HF-RTMS_10-20EEG 4.3113595 0.0000000 1.66916100 6.90833303 HF-RTMS_CM 2.6421985 -1.6691610 0.00000000 5.23917203 HF-RTMS_NA -2.5969735 -6.9083330 -5.23917203 0.00000000 HF-RTMS_NEURONAV -3.7016955 -8.0130550 -6.34389400 -1.10472197 ITBS_10-20EEG 2.5816037 -1.7297558 -0.06059477 5.17857726 ITBS_CM 1.9446380 -2.3667215 -0.69756047 4.54161156 ITBS_NA -0.6141868 -4.9255463 -3.25638531 1.98278672 ITBS_NEURONAV 10.3282997 6.0169402 7.68610116 12.92527319 LF-RTMS_10-10EEG 7.6158132 3.3044537 4.97361469 10.21278672 LF-RTMS_10-20EEG 6.8373369 2.5259774 4.19513839 9.43431042 LF-RTMS_CM -3.5317083 -7.8430678 -6.17390681 -0.93473478 LF-RTMS_NEURONAV -0.5141868 -4.8255463 -3.15638531 2.08278672 PRM-RTMS_NEURONAV 3.5558132 -0.7555463 0.91361469 6.15278672 SHAM -2.3141868 -6.6255463 -4.95638531 0.28278672 TACS_10-20EEG 0.4238321 -3.8875274 -2.21836644 3.02080559 TDCS_10-20EEG -0.5320935 -4.8434530 -3.17429202 2.06488002 HF-RTMS_NEURONAV ITBS_10-20EEG ITBS_CM ITBS_NA CTBS_10-20EEG 3.4975087 -2.78579054 -2.148824841 0.4100000 CTBS_CM 4.3575087 -1.92579054 -1.288824841 1.2700000 CTBS_NEURONAV 1.1775087 -5.10579054 -4.468824841 -1.9100000 DTMS_CM 5.6449873 -0.63831197 -0.001346268 2.5574786 HD-TDCS_10-20EEG 3.7016955 -2.58160375 -1.944638050 0.6141868 HF-RTMS_10-20EEG 8.0130550 1.72975578 2.366721473 4.9255463 HF-RTMS_CM 6.3438940 0.06059477 0.697560471 3.2563853 HF-RTMS_NA 1.1047220 -5.17857726 -4.541611560 -1.9827867 HF-RTMS_NEURONAV 0.0000000 -6.28329923 -5.646333528 -3.0875087 ITBS_10-20EEG 6.2832992 0.00000000 0.636965697 3.1957905 ITBS_CM 5.6463335 -0.63696570 0.000000000 2.5588248 ITBS_NA 3.0875087 -3.19579054 -2.558824841 0.0000000 ITBS_NEURONAV 14.0299952 7.74669593 8.383661629 10.9424865 LF-RTMS_10-10EEG 11.3175087 5.03420946 5.671175159 8.2300000 LF-RTMS_10-20EEG 10.5390324 4.25573316 4.892698861 7.4515237 LF-RTMS_CM 0.1699872 -6.11331204 -5.476346342 -2.9175215 LF-RTMS_NEURONAV 3.1875087 -3.09579054 -2.458824841 0.1000000 PRM-RTMS_NEURONAV 7.2575087 0.97420946 1.611175159 4.1700000 SHAM 1.3875087 -4.89579054 -4.258824841 -1.7000000 TACS_10-20EEG 4.1255276 -2.15777166 -1.520805967 1.0380189 TDCS_10-20EEG 3.1696020 -3.11369724 -2.476731544 0.0820933 ITBS_NEURONAV LF-RTMS_10-10EEG LF-RTMS_10-20EEG LF-RTMS_CM CTBS_10-20EEG -10.532486 -7.8200000 -7.0415237 3.3275215 CTBS_CM -9.672486 -6.9600000 -6.1815237 4.1875215 CTBS_NEURONAV -12.852486 -10.1400000 -9.3615237 1.0075215 DTMS_CM -8.385008 -5.6725214 -4.8940451 5.4750001 HD-TDCS_10-20EEG -10.328300 -7.6158132 -6.8373369 3.5317083 HF-RTMS_10-20EEG -6.016940 -3.3044537 -2.5259774 7.8430678 HF-RTMS_CM -7.686101 -4.9736147 -4.1951384 6.1739068 HF-RTMS_NA -12.925273 -10.2127867 -9.4343104 0.9347348 HF-RTMS_NEURONAV -14.029995 -11.3175087 -10.5390324 -0.1699872 ITBS_10-20EEG -7.746696 -5.0342095 -4.2557332 6.1133120 ITBS_CM -8.383662 -5.6711752 -4.8926989 5.4763463 ITBS_NA -10.942486 -8.2300000 -7.4515237 2.9175215 ITBS_NEURONAV 0.000000 2.7124865 3.4909628 13.8600080 LF-RTMS_10-10EEG -2.712486 0.0000000 0.7784763 11.1475215 LF-RTMS_10-20EEG -3.490963 -0.7784763 0.0000000 10.3690452 LF-RTMS_CM -13.860008 -11.1475215 -10.3690452 0.0000000 LF-RTMS_NEURONAV -10.842486 -8.1300000 -7.3515237 3.0175215 PRM-RTMS_NEURONAV -6.772486 -4.0600000 -3.2815237 7.0875215 SHAM -12.642486 -9.9300000 -9.1515237 1.2175215 TACS_10-20EEG -9.904468 -7.1919811 -6.4135048 3.9555404 TDCS_10-20EEG -10.860393 -8.1479067 -7.3694304 2.9996148 LF-RTMS_NEURONAV PRM-RTMS_NEURONAV SHAM TACS_10-20EEG CTBS_10-20EEG 0.3100000 -3.7600000 2.1100000 -0.6280189 CTBS_CM 1.1700000 -2.9000000 2.9700000 0.2319811 CTBS_NEURONAV -2.0100000 -6.0800000 -0.2100000 -2.9480189 DTMS_CM 2.4574786 -1.6125214 4.2574786 1.5194597 HD-TDCS_10-20EEG 0.5141868 -3.5558132 2.3141868 -0.4238321 HF-RTMS_10-20EEG 4.8255463 0.7555463 6.6255463 3.8875274 HF-RTMS_CM 3.1563853 -0.9136147 4.9563853 2.2183664 HF-RTMS_NA -2.0827867 -6.1527867 -0.2827867 -3.0208056 HF-RTMS_NEURONAV -3.1875087 -7.2575087 -1.3875087 -4.1255276 ITBS_10-20EEG 3.0957905 -0.9742095 4.8957905 2.1577717 ITBS_CM 2.4588248 -1.6111752 4.2588248 1.5208060 ITBS_NA -0.1000000 -4.1700000 1.7000000 -1.0380189 ITBS_NEURONAV 10.8424865 6.7724865 12.6424865 9.9044676 LF-RTMS_10-10EEG 8.1300000 4.0600000 9.9300000 7.1919811 LF-RTMS_10-20EEG 7.3515237 3.2815237 9.1515237 6.4135048 LF-RTMS_CM -3.0175215 -7.0875215 -1.2175215 -3.9555404 LF-RTMS_NEURONAV 0.0000000 -4.0700000 1.8000000 -0.9380189 PRM-RTMS_NEURONAV 4.0700000 0.0000000 5.8700000 3.1319811 SHAM -1.8000000 -5.8700000 0.0000000 -2.7380189 TACS_10-20EEG 0.9380189 -3.1319811 2.7380189 0.0000000 TDCS_10-20EEG -0.0179067 -4.0879067 1.7820933 -0.9559256 TDCS_10-20EEG CTBS_10-20EEG 0.3279067 CTBS_CM 1.1879067 CTBS_NEURONAV -1.9920933 DTMS_CM 2.4753853 HD-TDCS_10-20EEG 0.5320935 HF-RTMS_10-20EEG 4.8434530 HF-RTMS_CM 3.1742920 HF-RTMS_NA -2.0648800 HF-RTMS_NEURONAV -3.1696020 ITBS_10-20EEG 3.1136972 ITBS_CM 2.4767315 ITBS_NA -0.0820933 ITBS_NEURONAV 10.8603932 LF-RTMS_10-10EEG 8.1479067 LF-RTMS_10-20EEG 7.3694304 LF-RTMS_CM -2.9996148 LF-RTMS_NEURONAV 0.0179067 PRM-RTMS_NEURONAV 4.0879067 SHAM -1.7820933 TACS_10-20EEG 0.9559256 TDCS_10-20EEG 0.0000000

$seTE CTBS_10-20EEG CTBS_CM CTBS_NEURONAV DTMS_CM CTBS_10-20EEG 0.000000 6.926986 7.536658 5.660757 CTBS_CM 6.926986 0.000000 8.135392 6.436424 CTBS_NEURONAV 7.536658 8.135392 0.000000 7.088416 DTMS_CM 5.660757 6.436424 7.088416 0.000000 HD-TDCS_10-20EEG 5.056733 5.912185 6.616042 4.360615 HF-RTMS_10-20EEG 4.731238 5.636311 6.370721 3.978571 HF-RTMS_CM 4.691694 5.603158 6.341408 3.931464 HF-RTMS_NA 5.390051 6.199680 6.874163 4.743107 HF-RTMS_NEURONAV 4.935439 5.808782 6.523805 4.219357 ITBS_10-20EEG 4.830343 5.719755 6.444663 4.095928 ITBS_CM 5.449264 6.251229 6.920690 4.810291 ITBS_NA 5.834366 6.589629 7.227814 5.242542 ITBS_NEURONAV 5.678705 6.452215 7.102757 5.068739 LF-RTMS_10-10EEG 6.129195 6.852038 7.467831 5.568793 LF-RTMS_10-20EEG 4.855965 5.741409 6.463889 4.126114 LF-RTMS_CM 5.399291 6.207715 6.881410 4.753605 LF-RTMS_NEURONAV 7.237240 7.858819 8.401138 6.769199 PRM-RTMS_NEURONAV 7.444222 8.049834 8.580088 6.990054 SHAM 4.393163 5.355676 6.123834 3.569915 TACS_10-20EEG 5.325691 6.143808 6.823815 4.669840 TDCS_10-20EEG 4.609174 5.534245 6.280601 3.832610 HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM HF-RTMS_NA CTBS_10-20EEG 5.056733 4.731238 4.691694 5.390051 CTBS_CM 5.912185 5.636311 5.603158 6.199680 CTBS_NEURONAV 6.616042 6.370721 6.341408 6.874163 DTMS_CM 4.360615 3.978571 3.931464 4.743107 HD-TDCS_10-20EEG 0.000000 3.058661 2.997130 4.002929 HF-RTMS_10-20EEG 3.058661 0.000000 2.407665 3.582946 HF-RTMS_CM 2.997130 2.407665 0.000000 3.530564 HF-RTMS_NA 4.002929 3.582946 3.530564 0.000000 HF-RTMS_NEURONAV 3.365911 2.853668 2.787615 3.848565 ITBS_10-20EEG 3.209830 2.667784 2.597008 3.712830 ITBS_CM 4.082312 3.671422 3.620320 4.488582 ITBS_NA 4.583734 4.221929 4.177567 4.949012 ITBS_NEURONAV 4.383890 4.004067 3.957264 4.764513 LF-RTMS_10-10EEG 4.953568 4.620811 4.580314 5.293385 LF-RTMS_10-20EEG 3.248260 2.713901 2.644360 3.746103 LF-RTMS_CM 4.015363 3.596832 3.544655 4.427780 LF-RTMS_NEURONAV 6.272834 6.013527 5.982465 6.544504 PRM-RTMS_NEURONAV 6.510548 6.261094 6.231266 6.772690 SHAM 2.504131 1.756342 1.646850 3.122942 TACS_10-20EEG 3.915838 3.485376 3.431505 4.337728 TDCS_10-20EEG 2.866231 2.242620 2.157944 3.420143 HF-RTMS_NEURONAV ITBS_10-20EEG ITBS_CM ITBS_NA CTBS_10-20EEG 4.935439 4.830343 5.449264 5.834366 CTBS_CM 5.808782 5.719755 6.251229 6.589629 CTBS_NEURONAV 6.523805 6.444663 6.920690 7.227814 DTMS_CM 4.219357 4.095928 4.810291 5.242542 HD-TDCS_10-20EEG 3.365911 3.209830 4.082312 4.583734 HF-RTMS_10-20EEG 2.853668 2.667784 3.671422 4.221929 HF-RTMS_CM 2.787615 2.597008 3.620320 4.177567 HF-RTMS_NA 3.848565 3.712830 4.488582 4.949012 HF-RTMS_NEURONAV 0.000000 3.015131 3.931067 4.449565 ITBS_10-20EEG 3.015131 0.000000 3.798281 4.332699 ITBS_CM 3.931067 3.798281 0.000000 5.013437 ITBS_NA 4.449565 4.332699 5.013437 0.000000 ITBS_NEURONAV 4.243407 4.120698 4.831399 5.261917 LF-RTMS_10-10EEG 4.829684 4.722234 5.353668 5.745181 LF-RTMS_10-20EEG 3.056011 2.883203 3.830812 4.361247 LF-RTMS_CM 3.861496 3.726231 4.499674 4.959074 LF-RTMS_NEURONAV 6.175472 6.091806 6.593358 6.915036 PRM-RTMS_NEURONAV 6.416794 6.336316 6.819909 7.131375 SHAM 2.249152 2.008067 3.224066 3.839264 TACS_10-20EEG 3.757898 3.618763 4.411090 4.878838 TDCS_10-20EEG 2.646373 2.444779 3.512721 4.084674 ITBS_NEURONAV LF-RTMS_10-10EEG LF-RTMS_10-20EEG LF-RTMS_CM CTBS_10-20EEG 5.678705 6.129195 4.855965 5.399291 CTBS_CM 6.452215 6.852038 5.741409 6.207715 CTBS_NEURONAV 7.102757 7.467831 6.463889 6.881410 DTMS_CM 5.068739 5.568793 4.126114 4.753605 HD-TDCS_10-20EEG 4.383890 4.953568 3.248260 4.015363 HF-RTMS_10-20EEG 4.004067 4.620811 2.713901 3.596832 HF-RTMS_CM 3.957264 4.580314 2.644360 3.544655 HF-RTMS_NA 4.764513 5.293385 3.746103 4.427780 HF-RTMS_NEURONAV 4.243407 4.829684 3.056011 3.861496 ITBS_10-20EEG 4.120698 4.722234 2.883203 3.726231 ITBS_CM 4.831399 5.353668 3.830812 4.499674 ITBS_NA 5.261917 5.745181 4.361247 4.959074 ITBS_NEURONAV 0.000000 5.587037 4.150704 4.774964 LF-RTMS_10-10EEG 5.587037 0.000000 4.748440 5.302794 LF-RTMS_10-20EEG 4.150704 4.748440 0.000000 3.759387 LF-RTMS_CM 4.774964 5.302794 3.759387 0.000000 LF-RTMS_NEURONAV 6.784216 7.165538 6.112143 6.552117 PRM-RTMS_NEURONAV 7.004597 7.374532 6.355870 6.780046 SHAM 3.598308 4.274010 2.068942 3.138864 TACS_10-20EEG 4.691581 5.227836 3.652894 4.349204 TDCS_10-20EEG 3.859071 4.495750 2.495021 3.434687 LF-RTMS_NEURONAV PRM-RTMS_NEURONAV SHAM TACS_10-20EEG CTBS_10-20EEG 7.237240 7.444222 4.393163 5.325691 CTBS_CM 7.858819 8.049834 5.355676 6.143808 CTBS_NEURONAV 8.401138 8.580088 6.123834 6.823815 DTMS_CM 6.769199 6.990054 3.569915 4.669840 HD-TDCS_10-20EEG 6.272834 6.510548 2.504131 3.915838 HF-RTMS_10-20EEG 6.013527 6.261094 1.756342 3.485376 HF-RTMS_CM 5.982465 6.231266 1.646850 3.431505 HF-RTMS_NA 6.544504 6.772690 3.122942 4.337728 HF-RTMS_NEURONAV 6.175472 6.416794 2.249152 3.757898 ITBS_10-20EEG 6.091806 6.336316 2.008067 3.618763 ITBS_CM 6.593358 6.819909 3.224066 4.411090 ITBS_NA 6.915036 7.131375 3.839264 4.878838 ITBS_NEURONAV 6.784216 7.004597 3.598308 4.691581 LF-RTMS_10-10EEG 7.165538 7.374532 4.274010 5.227836 LF-RTMS_10-20EEG 6.112143 6.355870 2.068942 3.652894 LF-RTMS_CM 6.552117 6.780046 3.138864 4.349204 LF-RTMS_NEURONAV 0.000000 8.318313 5.751328 6.491601 PRM-RTMS_NEURONAV 8.318313 0.000000 6.009706 6.721583 SHAM 5.751328 6.009706 0.000000 3.010500 TACS_10-20EEG 6.491601 6.721583 3.010500 0.000000 TDCS_10-20EEG 5.917971 6.169374 1.394492 3.317789 TDCS_10-20EEG CTBS_10-20EEG 4.609174 CTBS_CM 5.534245 CTBS_NEURONAV 6.280601 DTMS_CM 3.832610 HD-TDCS_10-20EEG 2.866231 HF-RTMS_10-20EEG 2.242620 HF-RTMS_CM 2.157944 HF-RTMS_NA 3.420143 HF-RTMS_NEURONAV 2.646373 ITBS_10-20EEG 2.444779 ITBS_CM 3.512721 ITBS_NA 4.084674 ITBS_NEURONAV 3.859071 LF-RTMS_10-10EEG 4.495750 LF-RTMS_10-20EEG 2.495021 LF-RTMS_CM 3.434687 LF-RTMS_NEURONAV 5.917971 PRM-RTMS_NEURONAV 6.169374 SHAM 1.394492 TACS_10-20EEG 3.317789 TDCS_10-20EEG 0.000000

$lower CTBS_10-20EEG CTBS_CM CTBS_NEURONAV DTMS_CM CTBS_10-20EEG 0.0000000 -14.436643 -12.451579 -13.242358 CTBS_CM -12.7166434 0.000000 -12.765075 -13.902638 CTBS_NEURONAV -17.0915791 -19.125075 0.000000 -18.360518 DTMS_CM -8.9474013 -11.327681 -9.425561 0.000000 HD-TDCS_10-20EEG -9.7068278 -12.243483 -10.443018 -10.489941 HF-RTMS_10-20EEG -4.7575099 -7.391420 -5.650837 -5.429789 HF-RTMS_CM -6.3491659 -8.995602 -7.262547 -7.006621 HF-RTMS_NA -12.9570917 -15.403936 -13.545898 -13.836584 HF-RTMS_NEURONAV -13.1707917 -15.742511 -13.963931 -13.914776 ITBS_10-20EEG -6.6815074 -9.284723 -7.525516 -7.389560 ITBS_CM -8.5315364 -10.963359 -9.095478 -9.426650 ITBS_NA -11.8451471 -14.185435 -12.256255 -12.832671 ITBS_NEURONAV -0.5975718 -2.973623 -1.068662 -1.549537 LF-RTMS_10-10EEG -4.1930024 -6.469747 -4.496680 -5.242112 LF-RTMS_10-20EEG -2.4759935 -5.071432 -3.307467 -3.192989 LF-RTMS_CM -13.9099373 -16.354419 -14.494838 -14.791894 LF-RTMS_NEURONAV -14.4947301 -16.573001 -14.455927 -15.724866 PRM-RTMS_NEURONAV -10.8304067 -12.877384 -10.736663 -12.087733 SHAM -10.7204403 -13.466931 -11.792494 -11.254383 TACS_10-20EEG -9.8101446 -12.273623 -10.426413 -10.672178 TDCS_10-20EEG -9.3617219 -12.034828 -10.317659 -9.987164 HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM HF-RTMS_NA CTBS_10-20EEG -10.1152014 -13.788603 -12.04193655 -8.1715183 CTBS_CM -10.9318567 -14.702512 -12.96837259 -8.8983623 CTBS_NEURONAV -15.4913914 -19.321929 -17.59531720 -13.4003245 DTMS_CM -6.6033570 -10.165924 -8.40443448 -4.7560531 HD-TDCS_10-20EEG 0.0000000 -10.306225 -8.51646520 -5.2486231 HF-RTMS_10-20EEG -1.6835065 0.000000 -3.04977634 -0.1141129 HF-RTMS_CM -3.2320682 -6.388098 0.00000000 -1.6806067 HF-RTMS_NA -10.4425702 -13.930779 -12.15895080 0.0000000 HF-RTMS_NEURONAV -10.2987592 -13.606141 -11.80751929 -8.6477704 ITBS_10-20EEG -3.7095469 -6.958516 -5.15063678 -2.0984349 ITBS_CM -6.0565471 -9.562576 -7.79325742 -4.2558479 ITBS_NA -9.5981411 -13.200375 -11.44426583 -7.7170981 ITBS_NEURONAV 1.7360332 -1.830888 -0.06999284 3.5869986 LF-RTMS_10-10EEG -2.0930010 -5.752170 -4.00363574 -0.1620580 LF-RTMS_10-20EEG 0.4708639 -2.793171 -0.98771129 2.0920827 LF-RTMS_CM -11.4016747 -14.892730 -13.12130361 -9.6130238 LF-RTMS_NEURONAV -12.8087146 -16.611842 -14.88180065 -10.7442060 PRM-RTMS_NEURONAV -9.2046262 -13.027065 -11.29944249 -7.1214418 SHAM -7.2221934 -10.067913 -8.18415238 -5.8380676 TACS_10-20EEG -7.2510687 -10.718740 -8.94399308 -5.4809843 TDCS_10-20EEG -6.1498033 -9.238908 -7.40378549 -4.6384768 HF-RTMS_NEURONAV ITBS_10-20EEG ITBS_CM ITBS_NA CTBS_10-20EEG -6.1757743 -12.2530884 -12.829186 -11.0251471 CTBS_CM -7.0274940 -13.1363040 -13.541008 -11.6454354 CTBS_NEURONAV -11.6089134 -17.7370975 -18.033127 -16.0762548 DTMS_CM -2.6248010 -8.6661837 -9.429342 -7.7177141 HD-TDCS_10-20EEG -2.8953682 -8.8727544 -9.945823 -8.3697676 HF-RTMS_10-20EEG 2.4199691 -3.4990048 -4.829133 -3.3492828 HF-RTMS_CM 0.8802687 -5.0294472 -6.398136 -4.9314952 HF-RTMS_NA -6.4383264 -12.4555894 -13.339071 -11.6826715 HF-RTMS_NEURONAV 0.0000000 -12.1928481 -13.351082 -11.8084965 ITBS_10-20EEG 0.3737503 0.0000000 -6.807528 -5.2961441 ITBS_CM -2.0584154 -8.0814591 0.000000 -7.2673312 ITBS_NA -5.6334791 -11.6877252 -12.384981 0.0000000 ITBS_NEURONAV 5.7130706 -0.3297241 -1.085707 0.6293191 LF-RTMS_10-10EEG 1.8515029 -4.2211994 -4.821822 -3.0303487 LF-RTMS_10-20EEG 4.5493603 -1.3952400 -2.615556 -1.0963624 LF-RTMS_CM -7.3984052 -13.4165914 -14.295546 -12.6371279 LF-RTMS_NEURONAV -8.9161935 -15.0355113 -15.381569 -13.4532207 PRM-RTMS_NEURONAV -5.3191763 -11.4447411 -11.755602 -9.8072384 SHAM -3.0207473 -8.8315303 -10.577878 -9.2248194 TACS_10-20EEG -3.2398166 -9.2504172 -10.166383 -8.5243281 TDCS_10-20EEG -2.0171943 -7.9053757 -9.361539 -7.9237197 ITBS_NEURONAV LF-RTMS_10-10EEG LF-RTMS_10-20EEG LF-RTMS_CM CTBS_10-20EEG -21.66254 -19.833002 -16.559041 -7.2548943 CTBS_CM -22.31860 -20.389747 -17.434480 -7.9793765 CTBS_NEURONAV -26.77364 -24.776680 -22.030514 -12.4797951 DTMS_CM -18.31955 -16.587155 -12.981080 -3.8418942 HD-TDCS_10-20EEG -18.92057 -17.324627 -13.203810 -4.3382581 HF-RTMS_10-20EEG -13.86477 -12.361077 -7.845126 0.7934060 HF-RTMS_CM -15.44220 -13.950865 -9.377988 -0.7734900 HF-RTMS_NA -22.26355 -20.587631 -16.776538 -7.7435542 HF-RTMS_NEURONAV -22.34692 -20.783514 -16.528704 -7.7383795 ITBS_10-20EEG -15.82312 -14.289618 -9.906706 -1.1899673 ITBS_CM -17.85303 -16.164172 -12.400953 -3.3428530 ITBS_NA -21.25565 -19.490349 -15.999410 -6.8020849 ITBS_NEURONAV 0.00000 -8.237904 -4.644267 4.5012497 LF-RTMS_10-10EEG -13.66288 0.000000 -8.528295 0.7542358 LF-RTMS_10-20EEG -11.62619 -10.085248 0.000000 3.0007827 LF-RTMS_CM -23.21877 -21.540807 -17.737308 0.0000000 LF-RTMS_NEURONAV -24.13931 -22.174196 -19.331104 -9.8243914 PRM-RTMS_NEURONAV -20.50124 -18.513817 -15.738800 -6.2011251 SHAM -19.69504 -18.306905 -13.206576 -4.9345385 TACS_10-20EEG -19.09980 -17.438352 -13.573046 -4.5687435 TDCS_10-20EEG -18.42403 -16.959415 -12.259582 -3.7322480 LF-RTMS_NEURONAV PRM-RTMS_NEURONAV SHAM TACS_10-20EEG CTBS_10-20EEG -13.874730 -18.350407 -6.5004403 -11.0661823 CTBS_CM -14.233001 -18.677384 -7.5269312 -11.8096607 CTBS_NEURONAV -18.475927 -22.896663 -12.2124942 -16.3224512 DTMS_CM -10.809909 -15.312776 -2.7394263 -7.6332585 HD-TDCS_10-20EEG -11.780341 -16.316253 -2.5938198 -8.0987329 HF-RTMS_10-20EEG -6.960750 -11.515973 3.1831795 -2.9436850 HF-RTMS_CM -8.569030 -13.126672 1.7286182 -4.5072602 HF-RTMS_NA -14.909779 -19.427015 -6.4036411 -11.5225955 HF-RTMS_NEURONAV -15.291211 -19.834194 -5.7957647 -11.4908717 ITBS_10-20EEG -8.843930 -13.393160 0.9600508 -4.9348739 ITBS_CM -10.463919 -14.977952 -2.0602285 -7.1247714 ITBS_NA -13.653221 -18.147238 -5.8248194 -10.6003659 ITBS_NEURONAV -2.454333 -6.956272 5.5899328 0.7091379 LF-RTMS_10-10EEG -5.914196 -10.393817 1.5530945 -3.0543899 LF-RTMS_10-20EEG -4.628056 -9.175753 5.0964712 -0.7460359 LF-RTMS_CM -15.859434 -20.376168 -7.3695815 -12.4798242 LF-RTMS_NEURONAV 0.000000 -20.373594 -9.4723948 -13.6613226 PRM-RTMS_NEURONAV -12.233594 0.000000 -5.9088066 -10.0420789 SHAM -13.072395 -17.648807 0.0000000 -8.6384912 TACS_10-20EEG -11.785285 -16.306041 -3.1624534 0.0000000 TDCS_10-20EEG -11.616916 -16.179657 -0.9510614 -7.4586718 TDCS_10-20EEG CTBS_10-20EEG -8.7059085 CTBS_CM -9.6590145 CTBS_NEURONAV -14.3018456 DTMS_CM -5.0363930 HD-TDCS_10-20EEG -5.0856163 HF-RTMS_10-20EEG 0.4479981 HF-RTMS_CM -1.0552015 HF-RTMS_NA -8.7682368 HF-RTMS_NEURONAV -8.3563983 ITBS_10-20EEG -1.6779812 ITBS_CM -4.4080756 ITBS_NA -8.0879063 ITBS_NEURONAV 3.2967533 LF-RTMS_10-10EEG -0.6636017 LF-RTMS_10-20EEG 2.4792785 LF-RTMS_CM -9.7314776 LF-RTMS_NEURONAV -11.5811027 PRM-RTMS_NEURONAV -8.0038434 SHAM -4.5152480 TACS_10-20EEG -5.5468206 TDCS_10-20EEG 0.0000000

$upper CTBS_10-20EEG CTBS_CM CTBS_NEURONAV DTMS_CM CTBS_10-20EEG 0.000000 12.716643 17.09158 8.947401 CTBS_CM 14.436643 0.000000 19.12508 11.327681 CTBS_NEURONAV 12.451579 12.765075 0.00000 9.425561 DTMS_CM 13.242358 13.902638 18.36052 0.000000 HD-TDCS_10-20EEG 10.115201 10.931857 15.49139 6.603357 HF-RTMS_10-20EEG 13.788603 14.702512 19.32193 10.165924 HF-RTMS_CM 12.041937 12.968373 17.59532 8.404434 HF-RTMS_NA 8.171518 8.898362 13.40032 4.756053 HF-RTMS_NEURONAV 6.175774 7.027494 11.60891 2.624801 ITBS_10-20EEG 12.253088 13.136304 17.73710 8.666184 ITBS_CM 12.829186 13.541008 18.03313 9.429342 ITBS_NA 11.025147 11.645435 16.07625 7.717714 ITBS_NEURONAV 21.662545 22.318596 26.77364 18.319553 LF-RTMS_10-10EEG 19.833002 20.389747 24.77668 16.587155 LF-RTMS_10-20EEG 16.559041 17.434480 22.03051 12.981080 LF-RTMS_CM 7.254894 7.979376 12.47980 3.841894 LF-RTMS_NEURONAV 13.874730 14.233001 18.47593 10.809909 PRM-RTMS_NEURONAV 18.350407 18.677384 22.89666 15.312776 SHAM 6.500440 7.526931 12.21249 2.739426 TACS_10-20EEG 11.066182 11.809661 16.32245 7.633259 TDCS_10-20EEG 8.705908 9.659014 14.30185 5.036393 HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM HF-RTMS_NA CTBS_10-20EEG 9.706828 4.7575099 6.3491659 12.957092 CTBS_CM 12.243483 7.3914195 8.9956020 15.403936 CTBS_NEURONAV 10.443018 5.6508366 7.2625466 13.545898 DTMS_CM 10.489941 5.4297888 7.0066210 13.836584 HD-TDCS_10-20EEG 0.000000 1.6835065 3.2320682 10.442570 HF-RTMS_10-20EEG 10.306225 0.0000000 6.3880983 13.930779 HF-RTMS_CM 8.516465 3.0497763 0.0000000 12.158951 HF-RTMS_NA 5.248623 0.1141129 1.6806067 0.000000 HF-RTMS_NEURONAV 2.895368 -2.4199691 -0.8802687 6.438326 ITBS_10-20EEG 8.872754 3.4990048 5.0294472 12.455589 ITBS_CM 9.945823 4.8291332 6.3981365 13.339071 ITBS_NA 8.369768 3.3492828 4.9314952 11.682672 ITBS_NEURONAV 18.920566 13.8647681 15.4421952 22.263548 LF-RTMS_10-10EEG 17.324627 12.3610775 13.9508651 20.587631 LF-RTMS_10-20EEG 13.203810 7.8451258 9.3779881 16.776538 LF-RTMS_CM 4.338258 -0.7934060 0.7734900 7.743554 LF-RTMS_NEURONAV 11.780341 6.9607497 8.5690300 14.909779 PRM-RTMS_NEURONAV 16.316253 11.5159725 13.1266719 19.427015 SHAM 2.593820 -3.1831795 -1.7286182 6.403641 TACS_10-20EEG 8.098733 2.9436850 4.5072602 11.522595 TDCS_10-20EEG 5.085616 -0.4479981 1.0552015 8.768237 HF-RTMS_NEURONAV ITBS_10-20EEG ITBS_CM ITBS_NA CTBS_10-20EEG 13.170792 6.6815074 8.531536 11.845147 CTBS_CM 15.742511 9.2847229 10.963359 14.185435 CTBS_NEURONAV 13.963931 7.5255164 9.095478 12.256255 DTMS_CM 13.914776 7.3895598 9.426650 12.832671 HD-TDCS_10-20EEG 10.298759 3.7095469 6.056547 9.598141 HF-RTMS_10-20EEG 13.606141 6.9585163 9.562576 13.200375 HF-RTMS_CM 11.807519 5.1506368 7.793257 11.444266 HF-RTMS_NA 8.647770 2.0984349 4.255848 7.717098 HF-RTMS_NEURONAV 0.000000 -0.3737503 2.058415 5.633479 ITBS_10-20EEG 12.192848 0.0000000 8.081459 11.687725 ITBS_CM 13.351082 6.8075277 0.000000 12.384981 ITBS_NA 11.808496 5.2961441 7.267331 0.000000 ITBS_NEURONAV 22.346920 15.8231160 17.853031 21.255654 LF-RTMS_10-10EEG 20.783514 14.2896183 16.164172 19.490349 LF-RTMS_10-20EEG 16.528704 9.9067063 12.400953 15.999410 LF-RTMS_CM 7.738380 1.1899673 3.342853 6.802085 LF-RTMS_NEURONAV 15.291211 8.8439302 10.463919 13.653221 PRM-RTMS_NEURONAV 19.834194 13.3931600 14.977952 18.147238 SHAM 5.795765 -0.9600508 2.060228 5.824819 TACS_10-20EEG 11.490872 4.9348739 7.124771 10.600366 TDCS_10-20EEG 8.356398 1.6779812 4.408076 8.087906 ITBS_NEURONAV LF-RTMS_10-10EEG LF-RTMS_10-20EEG LF-RTMS_CM CTBS_10-20EEG 0.59757176 4.1930024 2.4759935 13.909937 CTBS_CM 2.97362274 6.4697472 5.0714321 16.354419 CTBS_NEURONAV 1.06866224 4.4966804 3.3074667 14.494838 DTMS_CM 1.54953745 5.2421120 3.1929894 14.791894 HD-TDCS_10-20EEG -1.73603324 2.0930010 -0.4708639 11.401675 HF-RTMS_10-20EEG 1.83088777 5.7521701 2.7931710 14.892730 HF-RTMS_CM 0.06999284 4.0036357 0.9877113 13.121304 HF-RTMS_NA -3.58699863 0.1620580 -2.0920827 9.613024 HF-RTMS_NEURONAV -5.71307056 -1.8515029 -4.5493603 7.398405 ITBS_10-20EEG 0.32972414 4.2211994 1.3952400 13.416591 ITBS_CM 1.08570734 4.8218215 2.6155556 14.295546 ITBS_NA -0.62931912 3.0303487 1.0963624 12.637128 ITBS_NEURONAV 0.00000000 13.6628773 11.6261926 23.218766 LF-RTMS_10-10EEG 8.23790434 0.0000000 10.0852478 21.540807 LF-RTMS_10-20EEG 4.64426706 8.5282952 0.0000000 17.737308 LF-RTMS_CM -4.50124973 -0.7542358 -3.0007827 0.000000 LF-RTMS_NEURONAV 2.45433264 5.9141956 4.6280562 15.859434 PRM-RTMS_NEURONAV 6.95627164 10.3938172 9.1757527 20.376168 SHAM -5.58993276 -1.5530945 -5.0964712 7.369581 TACS_10-20EEG -0.70913795 3.0543899 0.7460359 12.479824 TDCS_10-20EEG -3.29675327 0.6636017 -2.4792785 9.731478 LF-RTMS_NEURONAV PRM-RTMS_NEURONAV SHAM TACS_10-20EEG CTBS_10-20EEG 14.494730 10.830407 10.720440 9.810145 CTBS_CM 16.573001 12.877384 13.466931 12.273623 CTBS_NEURONAV 14.455927 10.736663 11.792494 10.426413 DTMS_CM 15.724866 12.087733 11.254383 10.672178 HD-TDCS_10-20EEG 12.808715 9.204626 7.222193 7.251069 HF-RTMS_10-20EEG 16.611842 13.027065 10.067913 10.718740 HF-RTMS_CM 14.881801 11.299442 8.184152 8.943993 HF-RTMS_NA 10.744206 7.121442 5.838068 5.480984 HF-RTMS_NEURONAV 8.916193 5.319176 3.020747 3.239817 ITBS_10-20EEG 15.035511 11.444741 8.831530 9.250417 ITBS_CM 15.381569 11.755602 10.577878 10.166383 ITBS_NA 13.453221 9.807238 9.224819 8.524328 ITBS_NEURONAV 24.139306 20.501245 19.695040 19.099797 LF-RTMS_10-10EEG 22.174196 18.513817 18.306905 17.438352 LF-RTMS_10-20EEG 19.331104 15.738800 13.206576 13.573046 LF-RTMS_CM 9.824391 6.201125 4.934538 4.568743 LF-RTMS_NEURONAV 0.000000 12.233594 13.072395 11.785285 PRM-RTMS_NEURONAV 20.373594 0.000000 17.648807 16.306041 SHAM 9.472395 5.908807 0.000000 3.162453 TACS_10-20EEG 13.661323 10.042079 8.638491 0.000000 TDCS_10-20EEG 11.581103 8.003843 4.515248 5.546821 TDCS_10-20EEG CTBS_10-20EEG 9.3617219 CTBS_CM 12.0348279 CTBS_NEURONAV 10.3176590 DTMS_CM 9.9871635 HD-TDCS_10-20EEG 6.1498033 HF-RTMS_10-20EEG 9.2389080 HF-RTMS_CM 7.4037855 HF-RTMS_NA 4.6384768 HF-RTMS_NEURONAV 2.0171943 ITBS_10-20EEG 7.9053757 ITBS_CM 9.3615387 ITBS_NA 7.9237197 ITBS_NEURONAV 18.4240331 LF-RTMS_10-10EEG 16.9594151 LF-RTMS_10-20EEG 12.2595823 LF-RTMS_CM 3.7322480 LF-RTMS_NEURONAV 11.6169161 PRM-RTMS_NEURONAV 16.1796568 SHAM 0.9510614 TACS_10-20EEG 7.4586718 TDCS_10-20EEG 0.0000000

$statistic CTBS_10-20EEG CTBS_CM CTBS_NEURONAV DTMS_CM CTBS_10-20EEG NaN -0.12415212 0.30782873 -0.3793624358 CTBS_CM 0.12415212 NaN 0.39088466 -0.2000301060 CTBS_NEURONAV -0.30782873 -0.39088466 NaN -0.6302506471 DTMS_CM 0.37936244 0.20003011 0.63025065 NaN HD-TDCS_10-20EEG 0.04037919 -0.11092569 0.38152519 -0.4456462387 HF-RTMS_10-20EEG 0.95441114 0.64857077 1.07296282 0.5952055480 HF-RTMS_CM 0.60668605 0.35451176 0.81470630 0.1777726435 HF-RTMS_NA -0.44392658 -0.52467012 -0.01058845 -0.9572344756 HF-RTMS_NEURONAV -0.70865197 -0.75015881 -0.18049417 -1.3378784708 ITBS_10-20EEG 0.57672730 0.33669110 0.79225100 0.1558406140 ITBS_CM 0.39433304 0.20617144 0.64571958 0.0002798724 ITBS_NA -0.07027327 -0.19272709 0.26425694 -0.4878318151 ITBS_NEURONAV 1.85473371 1.49909548 1.80950661 1.6542592447 LF-RTMS_10-10EEG 1.27586076 1.01575623 1.35782392 1.0186267625 LF-RTMS_10-20EEG 1.45007701 1.07665613 1.44828030 1.1861148998 LF-RTMS_CM -0.61628861 -0.67456728 -0.14641206 -1.1517575074 LF-RTMS_NEURONAV -0.04283401 -0.14887734 0.23925331 -0.3630382860 PRM-RTMS_NEURONAV 0.50508973 0.36025589 0.70861746 0.2306879780 SHAM -0.48029182 -0.55455189 0.03429224 -1.1925994199 TACS_10-20EEG 0.11792250 -0.03775853 0.43201914 -0.3253772498 TDCS_10-20EEG -0.07114218 -0.21464656 0.31718194 -0.6458744969 HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM HF-RTMS_NA CTBS_10-20EEG -0.04037919 -0.9544111 -0.60668605 0.44392658 CTBS_CM 0.11092569 -0.6485708 -0.35451176 0.52467012 CTBS_NEURONAV -0.38152519 -1.0729628 -0.81470630 0.01058845 DTMS_CM 0.44564624 -0.5952055 -0.17777264 0.95723448 HD-TDCS_10-20EEG NaN -1.4095577 -0.88157624 0.64876832 HF-RTMS_10-20EEG 1.40955768 NaN 0.69326952 1.92811508 HF-RTMS_CM 0.88157624 -0.6932695 NaN 1.48394751 HF-RTMS_NA -0.64876832 -1.9281151 -1.48394751 NaN HF-RTMS_NEURONAV -1.09976046 -2.8079846 -2.27574241 -0.28704778 ITBS_10-20EEG 0.80428060 -0.6483867 -0.02333253 1.39477917 ITBS_CM 0.47635700 -0.6446335 -0.19267923 1.01181428 ITBS_NA -0.13399267 -1.1666577 -0.77949329 0.40064296 ITBS_NEURONAV 2.35596691 1.5027070 1.94227680 2.71282128 LF-RTMS_10-10EEG 1.53744003 0.7151241 1.08586763 1.92934879 LF-RTMS_10-20EEG 2.10492277 0.9307551 1.58644774 2.51843299 LF-RTMS_CM -0.87954900 -2.1805486 -1.74175095 -0.21110688 LF-RTMS_NEURONAV -0.08197042 -0.8024486 -0.52760617 0.31824973 PRM-RTMS_NEURONAV 0.54616190 -0.1206732 0.14661783 0.90847015 SHAM -0.92414765 -3.7723557 -3.00961516 0.09055138 TACS_10-20EEG 0.10823536 -1.1153824 -0.64647037 0.69640279 TDCS_10-20EEG -0.18564221 -2.1597294 -1.47097946 0.60374087 HF-RTMS_NEURONAV ITBS_10-20EEG ITBS_CM ITBS_NA CTBS_10-20EEG 0.70865197 -0.57672730 -0.3943330365 0.07027327 CTBS_CM 0.75015881 -0.33669110 -0.2061714372 0.19272709 CTBS_NEURONAV 0.18049417 -0.79225100 -0.6457195817 -0.26425694 DTMS_CM 1.33787847 -0.15584061 -0.0002798724 0.48783182 HD-TDCS_10-20EEG 1.09976046 -0.80428060 -0.4763569992 0.13399267 HF-RTMS_10-20EEG 2.80798460 0.64838675 0.6446334828 1.16665774 HF-RTMS_CM 2.27574241 0.02333253 0.1926792266 0.77949329 HF-RTMS_NA 0.28704778 -1.39477917 -1.0118142784 -0.40064296 HF-RTMS_NEURONAV NaN -2.08392220 -1.4363362752 -0.69388996 ITBS_10-20EEG 2.08392220 NaN 0.1676984258 0.73759804 ITBS_CM 1.43633628 -0.16769843 NaN 0.51039333 ITBS_NA 0.69388996 -0.73759804 -0.5103933345 NaN ITBS_NEURONAV 3.30630450 1.87994741 1.7352449678 2.07956282 LF-RTMS_10-10EEG 2.34332303 1.06606520 1.0593064471 1.43250481 LF-RTMS_10-20EEG 3.44862351 1.47604377 1.2771961280 1.70857658 LF-RTMS_CM 0.04402107 -1.64061524 -1.2170539745 -0.58831982 LF-RTMS_NEURONAV 0.51615631 -0.50818927 -0.3729245144 0.01446124 PRM-RTMS_NEURONAV 1.13101788 0.15375015 0.2362458315 0.58473996 SHAM 0.61690316 -2.43806089 -1.3209483891 -0.44279319 TACS_10-20EEG 1.09782860 -0.59627324 -0.3447687516 0.21275944 TDCS_10-20EEG 1.19771539 -1.27361102 -0.7050748864 0.02009788 ITBS_NEURONAV LF-RTMS_10-10EEG LF-RTMS_10-20EEG LF-RTMS_CM CTBS_10-20EEG -1.8547337 -1.2758608 -1.4500770 0.61628861 CTBS_CM -1.4990955 -1.0157562 -1.0766561 0.67456728 CTBS_NEURONAV -1.8095066 -1.3578239 -1.4482803 0.14641206 DTMS_CM -1.6542592 -1.0186268 -1.1861149 1.15175751 HD-TDCS_10-20EEG -2.3559669 -1.5374400 -2.1049228 0.87954900 HF-RTMS_10-20EEG -1.5027070 -0.7151241 -0.9307551 2.18054864 HF-RTMS_CM -1.9422768 -1.0858676 -1.5864477 1.74175095 HF-RTMS_NA -2.7128213 -1.9293488 -2.5184330 0.21110688 HF-RTMS_NEURONAV -3.3063045 -2.3433230 -3.4486235 -0.04402107 ITBS_10-20EEG -1.8799474 -1.0660652 -1.4760438 1.64061524 ITBS_CM -1.7352450 -1.0593064 -1.2771961 1.21705397 ITBS_NA -2.0795628 -1.4325048 -1.7085766 0.58831982 ITBS_NEURONAV NaN 0.4854964 0.8410532 2.90264111 LF-RTMS_10-10EEG -0.4854964 NaN 0.1639436 2.10219765 LF-RTMS_10-20EEG -0.8410532 -0.1639436 NaN 2.75817469 LF-RTMS_CM -2.9026411 -2.1021976 -2.7581747 NaN LF-RTMS_NEURONAV -1.5981930 -1.1345974 -1.2027735 0.46054147 PRM-RTMS_NEURONAV -0.9668631 -0.5505434 -0.5162981 1.04535002 SHAM -3.5134533 -2.3233451 -4.4232860 0.38788606 TACS_10-20EEG -2.1111152 -1.3757089 -1.7557325 0.90948598 TDCS_10-20EEG -2.8142508 -1.8123575 -2.9536543 0.87332989 LF-RTMS_NEURONAV PRM-RTMS_NEURONAV SHAM TACS_10-20EEG CTBS_10-20EEG 0.042834008 -0.5050897 0.48029182 -0.11792250 CTBS_CM 0.148877340 -0.3602559 0.55455189 0.03775853 CTBS_NEURONAV -0.239253314 -0.7086175 -0.03429224 -0.43201914 DTMS_CM 0.363038286 -0.2306880 1.19259942 0.32537725 HD-TDCS_10-20EEG 0.081970419 -0.5461619 0.92414765 -0.10823536 HF-RTMS_10-20EEG 0.802448620 0.1206732 3.77235571 1.11538235 HF-RTMS_CM 0.527606174 -0.1466178 3.00961516 0.64647037 HF-RTMS_NA -0.318249729 -0.9084701 -0.09055138 -0.69640279 HF-RTMS_NEURONAV -0.516156309 -1.1310179 -0.61690316 -1.09782860 ITBS_10-20EEG 0.508189268 -0.1537501 2.43806089 0.59627324 ITBS_CM 0.372924514 -0.2362458 1.32094839 0.34476875 ITBS_NA -0.014461242 -0.5847400 0.44279319 -0.21275944 ITBS_NEURONAV 1.598192982 0.9668631 3.51345331 2.11111516 LF-RTMS_10-10EEG 1.134597357 0.5505434 2.32334511 1.37570892 LF-RTMS_10-20EEG 1.202773534 0.5162981 4.42328601 1.75573251 LF-RTMS_CM -0.460541472 -1.0453500 -0.38788606 -0.90948598 LF-RTMS_NEURONAV NaN -0.4892819 0.31297122 -0.14449731 PRM-RTMS_NEURONAV 0.489281905 NaN 0.97675333 0.46595887 SHAM -0.312971222 -0.9767533 NaN -0.90948963 TACS_10-20EEG 0.144497314 -0.4659589 0.90948963 NaN TDCS_10-20EEG -0.003025818 -0.6626129 1.27795131 -0.28812130 TDCS_10-20EEG CTBS_10-20EEG 0.071142182 CTBS_CM 0.214646563 CTBS_NEURONAV -0.317181939 DTMS_CM 0.645874497 HD-TDCS_10-20EEG 0.185642214 HF-RTMS_10-20EEG 2.159729449 HF-RTMS_CM 1.470979460 HF-RTMS_NA -0.603740867 HF-RTMS_NEURONAV -1.197715388 ITBS_10-20EEG 1.273611023 ITBS_CM 0.705074886 ITBS_NA -0.020097884 ITBS_NEURONAV 2.814250778 LF-RTMS_10-10EEG 1.812357546 LF-RTMS_10-20EEG 2.953654318 LF-RTMS_CM -0.873329886 LF-RTMS_NEURONAV 0.003025818 PRM-RTMS_NEURONAV 0.662612926 SHAM -1.277951315 TACS_10-20EEG 0.288121302 TDCS_10-20EEG NaN

$p CTBS_10-20EEG CTBS_CM CTBS_NEURONAV DTMS_CM CTBS_10-20EEG NaN 0.9011948 0.75821266 0.70441874 CTBS_CM 0.90119483 NaN 0.69588249 0.84145704 CTBS_NEURONAV 0.75821266 0.6958825 NaN 0.52853061 DTMS_CM 0.70441874 0.8414570 0.52853061 NaN HD-TDCS_10-20EEG 0.96779082 0.9116753 0.70281358 0.65585280 HF-RTMS_10-20EEG 0.33987557 0.5166159 0.28328780 0.55170608 HF-RTMS_CM 0.54405928 0.7229554 0.41524045 0.85890153 HF-RTMS_NA 0.65709567 0.5998125 0.99155180 0.33844892 HF-RTMS_NEURONAV 0.47854048 0.4531591 0.85676463 0.18093606 ITBS_10-20EEG 0.56412369 0.7363498 0.42821434 0.87615866 ITBS_CM 0.69333518 0.8366570 0.51846098 0.99977669 ITBS_NA 0.94397615 0.8471727 0.79158193 0.62566897 ITBS_NEURONAV 0.06363426 0.1338489 0.07037233 0.09807485 LF-RTMS_10-10EEG 0.20200475 0.3097455 0.17451956 0.30838019 LF-RTMS_10-20EEG 0.14703704 0.2816339 0.14753867 0.23557693 LF-RTMS_CM 0.53770406 0.4999507 0.88359610 0.24942073 LF-RTMS_NEURONAV 0.96583385 0.8816504 0.81090916 0.71657628 PRM-RTMS_NEURONAV 0.61349581 0.7186558 0.47856190 0.81755721 SHAM 0.63101991 0.5792012 0.97264411 0.23302629 TACS_10-20EEG 0.90612906 0.9698802 0.66572750 0.74489557 TDCS_10-20EEG 0.94328460 0.8300429 0.75110555 0.51836064 HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM HF-RTMS_NA CTBS_10-20EEG 0.96779082 0.3398755703 0.544059279 0.657095667 CTBS_CM 0.91167527 0.5166158543 0.722955390 0.599812532 CTBS_NEURONAV 0.70281358 0.2832877975 0.415240445 0.991551798 DTMS_CM 0.65585280 0.5517060822 0.858901532 0.338448920 HD-TDCS_10-20EEG NaN 0.1586703298 0.378006007 0.516488137 HF-RTMS_10-20EEG 0.15867033 NaN 0.488140424 0.053840814 HF-RTMS_CM 0.37800601 0.4881404243 NaN 0.137822846 HF-RTMS_NA 0.51648814 0.0538408141 0.137822846 NaN HF-RTMS_NEURONAV 0.27143650 0.0049852610 0.022861432 0.774075738 ITBS_10-20EEG 0.42123494 0.5167348410 0.981385021 0.163082442 ITBS_CM 0.63382006 0.5191647314 0.847210193 0.311626862 ITBS_NA 0.89340837 0.2433486165 0.435689188 0.688683012 ITBS_NEURONAV 0.01847456 0.1329146154 0.052103600 0.006671308 LF-RTMS_10-10EEG 0.12418559 0.4745323443 0.277537559 0.053687576 LF-RTMS_10-20EEG 0.03529803 0.3519802418 0.112637778 0.011787831 LF-RTMS_CM 0.37910368 0.0292168172 0.081552032 0.832803872 LF-RTMS_NEURONAV 0.93467024 0.4222934981 0.597772707 0.750295514 PRM-RTMS_NEURONAV 0.58495465 0.9039498797 0.883433683 0.363629878 SHAM 0.35540945 0.0001617135 0.002615789 0.927849069 TACS_10-20EEG 0.91380900 0.2646866078 0.517974782 0.486176619 TDCS_10-20EEG 0.85272535 0.0307936200 0.141296672 0.546015939 HF-RTMS_NEURONAV ITBS_10-20EEG ITBS_CM ITBS_NA CTBS_10-20EEG 0.4785404751 0.56412369 0.69333518 0.94397615 CTBS_CM 0.4531590607 0.73634977 0.83665700 0.84717271 CTBS_NEURONAV 0.8567646318 0.42821434 0.51846098 0.79158193 DTMS_CM 0.1809360563 0.87615866 0.99977669 0.62566897 HD-TDCS_10-20EEG 0.2714365049 0.42123494 0.63382006 0.89340837 HF-RTMS_10-20EEG 0.0049852610 0.51673484 0.51916473 0.24334862 HF-RTMS_CM 0.0228614316 0.98138502 0.84721019 0.43568919 HF-RTMS_NA 0.7740757381 0.16308244 0.31162686 0.68868301 HF-RTMS_NEURONAV NaN 0.03716724 0.15090668 0.48775122 ITBS_10-20EEG 0.0371672443 NaN 0.86682053 0.46075875 ITBS_CM 0.1509066766 0.86682053 NaN 0.60977593 ITBS_NA 0.4877512232 0.46075875 0.60977593 NaN ITBS_NEURONAV 0.0009453529 0.06011525 0.08269742 0.03756565 LF-RTMS_10-10EEG 0.0191128271 0.28639417 0.28946024 0.15199940 LF-RTMS_10-20EEG 0.0005634517 0.13993214 0.20153301 0.08752941 LF-RTMS_CM 0.9648876053 0.10087731 0.22358368 0.55631765 LF-RTMS_NEURONAV 0.6057452425 0.61132062 0.70920463 0.98846200 PRM-RTMS_NEURONAV 0.2580475658 0.87780674 0.81324192 0.55872258 SHAM 0.5372986029 0.01476629 0.18651857 0.65791533 TACS_10-20EEG 0.2722793417 0.55099270 0.73026823 0.83151460 TDCS_10-20EEG 0.2310278365 0.20280130 0.48076363 0.98396529 ITBS_NEURONAV LF-RTMS_10-10EEG LF-RTMS_10-20EEG LF-RTMS_CM CTBS_10-20EEG 0.0636342629 0.20200475 1.470370e-01 0.537704057 CTBS_CM 0.1338488648 0.30974549 2.816339e-01 0.499950724 CTBS_NEURONAV 0.0703723344 0.17451956 1.475387e-01 0.883596105 DTMS_CM 0.0980748499 0.30838019 2.355769e-01 0.249420734 HD-TDCS_10-20EEG 0.0184745634 0.12418559 3.529803e-02 0.379103677 HF-RTMS_10-20EEG 0.1329146154 0.47453234 3.519802e-01 0.029216817 HF-RTMS_CM 0.0521035997 0.27753756 1.126378e-01 0.081552032 HF-RTMS_NA 0.0066713076 0.05368758 1.178783e-02 0.832803872 HF-RTMS_NEURONAV 0.0009453529 0.01911283 5.634517e-04 0.964887605 ITBS_10-20EEG 0.0601152450 0.28639417 1.399321e-01 0.100877309 ITBS_CM 0.0826974247 0.28946024 2.015330e-01 0.223583681 ITBS_NA 0.0375656502 0.15199940 8.752941e-02 0.556317647 ITBS_NEURONAV NaN 0.62732424 4.003181e-01 0.003700304 LF-RTMS_10-10EEG 0.6273242350 NaN 8.697756e-01 0.035535966 LF-RTMS_10-20EEG 0.4003181166 0.86977555 NaN 0.005812513 LF-RTMS_CM 0.0037003041 0.03553597 5.812513e-03 NaN LF-RTMS_NEURONAV 0.1100000351 0.25654406 2.290640e-01 0.645127611 PRM-RTMS_NEURONAV 0.3336124773 0.58194671 6.056462e-01 0.295861230 SHAM 0.0004423221 0.02016062 9.721091e-06 0.698100356 TACS_10-20EEG 0.0347624151 0.16891177 7.913409e-02 0.363093655 TDCS_10-20EEG 0.0048891071 0.06993097 3.140356e-03 0.382483295 LF-RTMS_NEURONAV PRM-RTMS_NEURONAV SHAM TACS_10-20EEG CTBS_10-20EEG 0.9658339 0.6134958 6.310199e-01 0.90612906 CTBS_CM 0.8816504 0.7186558 5.792012e-01 0.96988021 CTBS_NEURONAV 0.8109092 0.4785619 9.726441e-01 0.66572750 DTMS_CM 0.7165763 0.8175572 2.330263e-01 0.74489557 HD-TDCS_10-20EEG 0.9346702 0.5849547 3.554094e-01 0.91380900 HF-RTMS_10-20EEG 0.4222935 0.9039499 1.617135e-04 0.26468661 HF-RTMS_CM 0.5977727 0.8834337 2.615789e-03 0.51797478 HF-RTMS_NA 0.7502955 0.3636299 9.278491e-01 0.48617662 HF-RTMS_NEURONAV 0.6057452 0.2580476 5.372986e-01 0.27227934 ITBS_10-20EEG 0.6113206 0.8778067 1.476629e-02 0.55099270 ITBS_CM 0.7092046 0.8132419 1.865186e-01 0.73026823 ITBS_NA 0.9884620 0.5587226 6.579153e-01 0.83151460 ITBS_NEURONAV 0.1100000 0.3336125 4.423221e-04 0.03476242 LF-RTMS_10-10EEG 0.2565441 0.5819467 2.016062e-02 0.16891177 LF-RTMS_10-20EEG 0.2290640 0.6056462 9.721091e-06 0.07913409 LF-RTMS_CM 0.6451276 0.2958612 6.981004e-01 0.36309365 LF-RTMS_NEURONAV NaN 0.6246421 7.543025e-01 0.88510778 PRM-RTMS_NEURONAV 0.6246421 NaN 3.286913e-01 0.64124494 SHAM 0.7543025 0.3286913 NaN 0.36309173 TACS_10-20EEG 0.8851078 0.6412449 3.630917e-01 NaN TDCS_10-20EEG 0.9975858 0.5075785 2.012666e-01 0.77325389 TDCS_10-20EEG CTBS_10-20EEG 0.943284596 CTBS_CM 0.830042888 CTBS_NEURONAV 0.751105553 DTMS_CM 0.518360637 HD-TDCS_10-20EEG 0.852725347 HF-RTMS_10-20EEG 0.030793620 HF-RTMS_CM 0.141296672 HF-RTMS_NA 0.546015939 HF-RTMS_NEURONAV 0.231027837 ITBS_10-20EEG 0.202801304 ITBS_CM 0.480763634 ITBS_NA 0.983965288 ITBS_NEURONAV 0.004889107 LF-RTMS_10-10EEG 0.069930968 LF-RTMS_10-20EEG 0.003140356 LF-RTMS_CM 0.382483295 LF-RTMS_NEURONAV 0.997585750 PRM-RTMS_NEURONAV 0.507578489 SHAM 0.201266593 TACS_10-20EEG 0.773253887 TDCS_10-20EEG NaN

Quantifying heterogeneity / inconsistency: I^2 = 63.4% [51.1%; 72.5%]

Tests of heterogeneity (within designs) and inconsistency (between designs): [1] 147.4467

Details of network meta-analysis methods:

  • Calculation of I^2 based on Q

Generating Forest Plot for: total_psychopathology Generating Network Graph for: total_psychopathology Calculating SUCRA/P-score values for: total_psychopathology Mean rank column not found in netrank results. SUCRA/P-score Results: Treatment SUCRA 1 HF-RTMS_NEURONAV 83.5 2 LF-RTMS_CM 80.4 3 SHAM 77.0 4 HF-RTMS_NA 75.0 5 CTBS_NEURONAV 68.8 6 TDCS_10-20EEG 61.8 7 ITBS_NA 61.2 8 LF-RTMS_NEURONAV 59.0 9 CTBS_10-20EEG 58.2 10 HD-TDCS_10-20EEG 57.6 11 TACS_10-20EEG 54.4 12 CTBS_CM 52.7 13 DTMS_CM 44.0 14 ITBS_CM 43.7 15 ITBS_10-20EEG 37.9 16 PRM-RTMS_NEURONAV 37.4 17 HF-RTMS_CM 37.2 18 HF-RTMS_10-20EEG 25.9 19 LF-RTMS_10-10EEG 15.1 20 LF-RTMS_10-20EEG 13.5 21 ITBS_NEURONAV 5.7 Skipping Split Analysis (Direct vs Indirect) for: total_psychopathology - Requires at least 3 treatments or k.trts is missing/invalid.

— Generating League Table for: total_psychopathology — League Table (Model: random ):
League Table: total_psychopathology ( random effects)
CTBS_10-20EEG CTBS_CM CTBS_NEURONAV DTMS_CM HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM HF-RTMS_NA HF-RTMS_NEURONAV ITBS_10-20EEG ITBS_CM ITBS_NA ITBS_NEURONAV LF-RTMS_10-10EEG LF-RTMS_10-20EEG LF-RTMS_CM LF-RTMS_NEURONAV PRM-RTMS_NEURONAV SHAM TACS_10-20EEG TDCS_10-20EEG
CTBS_10-20EEG CTBS_10-20EEG . . . . . . . . . . . . . . . . . 2.11 [ -6.50, 10.72] . .
CTBS_CM -0.86 [-14.44, 12.72] CTBS_CM . . . . . . . . . . . . . . . . 2.97 [ -7.53, 13.47] . .
CTBS_NEURONAV 2.32 [-12.45, 17.09] 3.18 [-12.77, 19.13] CTBS_NEURONAV . . . . . . . . . . . . . . . -0.21 [-12.21, 11.79] . .
DTMS_CM -2.15 [-13.24, 8.95] -1.29 [-13.90, 11.33] -4.47 [-18.36, 9.43] DTMS_CM . . . . . . . . . . . . . . 4.26 [ -2.74, 11.25] . .
HD-TDCS_10-20EEG -0.20 [-10.12, 9.71] 0.66 [-10.93, 12.24] -2.52 [-15.49, 10.44] 1.94 [ -6.60, 10.49] HD-TDCS_10-20EEG . . . . . . . . . . . . . 2.31 [ -2.59, 7.22] . .
HF-RTMS_10-20EEG -4.52 [-13.79, 4.76] -3.66 [-14.70, 7.39] -6.84 [-19.32, 5.65] -2.37 [-10.17, 5.43] -4.31 [-10.31, 1.68] HF-RTMS_10-20EEG . . . . . . . . . . . . 6.63 [ 3.18, 10.07] . .
HF-RTMS_CM -2.85 [-12.04, 6.35] -1.99 [-12.97, 9.00] -5.17 [-17.60, 7.26] -0.70 [ -8.40, 7.01] -2.64 [ -8.52, 3.23] 1.67 [ -3.05, 6.39] HF-RTMS_CM . . . . . . . . . . . 4.96 [ 1.73, 8.18] . .
HF-RTMS_NA 2.39 [ -8.17, 12.96] 3.25 [ -8.90, 15.40] 0.07 [-13.40, 13.55] 4.54 [ -4.76, 13.84] 2.60 [ -5.25, 10.44] 6.91 [ -0.11, 13.93] 5.24 [ -1.68, 12.16] HF-RTMS_NA . . . . . . . . . . -0.28 [ -6.40, 5.84] . .
HF-RTMS_NEURONAV 3.50 [ -6.18, 13.17] 4.36 [ -7.03, 15.74] 1.18 [-11.61, 13.96] 5.64 [ -2.62, 13.91] 3.70 [ -2.90, 10.30] 8.01 [ 2.42, 13.61] 6.34 [ 0.88, 11.81] 1.10 [ -6.44, 8.65] HF-RTMS_NEURONAV . . . . . . . . . -1.39 [ -5.80, 3.02] . .
ITBS_10-20EEG -2.79 [-12.25, 6.68] -1.93 [-13.14, 9.28] -5.11 [-17.74, 7.53] -0.64 [ -8.67, 7.39] -2.58 [ -8.87, 3.71] 1.73 [ -3.50, 6.96] 0.06 [ -5.03, 5.15] -5.18 [-12.46, 2.10] -6.28 [-12.19, -0.37] ITBS_10-20EEG . . . . . . . . 4.90 [ 0.96, 8.83] . .
ITBS_CM -2.15 [-12.83, 8.53] -1.29 [-13.54, 10.96] -4.47 [-18.03, 9.10] -0.00 [ -9.43, 9.43] -1.94 [ -9.95, 6.06] 2.37 [ -4.83, 9.56] 0.70 [ -6.40, 7.79] -4.54 [-13.34, 4.26] -5.65 [-13.35, 2.06] 0.64 [ -6.81, 8.08] ITBS_CM . . . . . . . 4.26 [ -2.06, 10.58] . .
ITBS_NA 0.41 [-11.03, 11.85] 1.27 [-11.65, 14.19] -1.91 [-16.08, 12.26] 2.56 [ -7.72, 12.83] 0.61 [ -8.37, 9.60] 4.93 [ -3.35, 13.20] 3.26 [ -4.93, 11.44] -1.98 [-11.68, 7.72] -3.09 [-11.81, 5.63] 3.20 [ -5.30, 11.69] 2.56 [ -7.27, 12.38] ITBS_NA . . . . . . 1.70 [ -5.82, 9.22] . .
ITBS_NEURONAV -10.53 [-21.66, 0.60] -9.67 [-22.32, 2.97] -12.85 [-26.77, 1.07] -8.39 [-18.32, 1.55] -10.33 [-18.92, -1.74] -6.02 [-13.86, 1.83] -7.69 [-15.44, 0.07] -12.93 [-22.26, -3.59] -14.03 [-22.35, -5.71] -7.75 [-15.82, 0.33] -8.38 [-17.85, 1.09] -10.94 [-21.26, -0.63] ITBS_NEURONAV . . . . . 12.64 [ 5.59, 19.70] . .
LF-RTMS_10-10EEG -7.82 [-19.83, 4.19] -6.96 [-20.39, 6.47] -10.14 [-24.78, 4.50] -5.67 [-16.59, 5.24] -7.62 [-17.32, 2.09] -3.30 [-12.36, 5.75] -4.97 [-13.95, 4.00] -10.21 [-20.59, 0.16] -11.32 [-20.78, -1.85] -5.03 [-14.29, 4.22] -5.67 [-16.16, 4.82] -8.23 [-19.49, 3.03] 2.71 [ -8.24, 13.66] LF-RTMS_10-10EEG . . . . 9.93 [ 1.55, 18.31] . .
LF-RTMS_10-20EEG -7.04 [-16.56, 2.48] -6.18 [-17.43, 5.07] -9.36 [-22.03, 3.31] -4.89 [-12.98, 3.19] -6.84 [-13.20, -0.47] -2.53 [ -7.85, 2.79] -4.20 [ -9.38, 0.99] -9.43 [-16.78, -2.09] -10.54 [-16.53, -4.55] -4.26 [ -9.91, 1.40] -4.89 [-12.40, 2.62] -7.45 [-16.00, 1.10] 3.49 [ -4.64, 11.63] 0.78 [ -8.53, 10.09] LF-RTMS_10-20EEG . . . 9.15 [ 5.10, 13.21] . .
LF-RTMS_CM 3.33 [ -7.25, 13.91] 4.19 [ -7.98, 16.35] 1.01 [-12.48, 14.49] 5.48 [ -3.84, 14.79] 3.53 [ -4.34, 11.40] 7.84 [ 0.79, 14.89] 6.17 [ -0.77, 13.12] 0.93 [ -7.74, 9.61] -0.17 [ -7.74, 7.40] 6.11 [ -1.19, 13.42] 5.48 [ -3.34, 14.30] 2.92 [ -6.80, 12.64] 13.86 [ 4.50, 23.22] 11.15 [ 0.75, 21.54] 10.37 [ 3.00, 17.74] LF-RTMS_CM . . -1.22 [ -7.37, 4.93] . .
LF-RTMS_NEURONAV 0.31 [-13.87, 14.49] 1.17 [-14.23, 16.57] -2.01 [-18.48, 14.46] 2.46 [-10.81, 15.72] 0.51 [-11.78, 12.81] 4.83 [ -6.96, 16.61] 3.16 [ -8.57, 14.88] -2.08 [-14.91, 10.74] -3.19 [-15.29, 8.92] 3.10 [ -8.84, 15.04] 2.46 [-10.46, 15.38] -0.10 [-13.65, 13.45] 10.84 [ -2.45, 24.14] 8.13 [ -5.91, 22.17] 7.35 [ -4.63, 19.33] -3.02 [-15.86, 9.82] LF-RTMS_NEURONAV . 1.80 [ -9.47, 13.07] . .
PRM-RTMS_NEURONAV -3.76 [-18.35, 10.83] -2.90 [-18.68, 12.88] -6.08 [-22.90, 10.74] -1.61 [-15.31, 12.09] -3.56 [-16.32, 9.20] 0.76 [-11.52, 13.03] -0.91 [-13.13, 11.30] -6.15 [-19.43, 7.12] -7.26 [-19.83, 5.32] -0.97 [-13.39, 11.44] -1.61 [-14.98, 11.76] -4.17 [-18.15, 9.81] 6.77 [ -6.96, 20.50] 4.06 [-10.39, 18.51] 3.28 [ -9.18, 15.74] -7.09 [-20.38, 6.20] -4.07 [-20.37, 12.23] PRM-RTMS_NEURONAV 5.87 [ -5.91, 17.65] . .
SHAM 2.11 [ -6.50, 10.72] 2.97 [ -7.53, 13.47] -0.21 [-12.21, 11.79] 4.26 [ -2.74, 11.25] 2.31 [ -2.59, 7.22] 6.63 [ 3.18, 10.07] 4.96 [ 1.73, 8.18] -0.28 [ -6.40, 5.84] -1.39 [ -5.80, 3.02] 4.90 [ 0.96, 8.83] 4.26 [ -2.06, 10.58] 1.70 [ -5.82, 9.22] 12.64 [ 5.59, 19.70] 9.93 [ 1.55, 18.31] 9.15 [ 5.10, 13.21] -1.22 [ -7.37, 4.93] 1.80 [ -9.47, 13.07] 5.87 [ -5.91, 17.65] SHAM -2.74 [ -8.64, 3.16] -1.78 [ -4.52, 0.95]
TACS_10-20EEG -0.63 [-11.07, 9.81] 0.23 [-11.81, 12.27] -2.95 [-16.32, 10.43] 1.52 [ -7.63, 10.67] -0.42 [ -8.10, 7.25] 3.89 [ -2.94, 10.72] 2.22 [ -4.51, 8.94] -3.02 [-11.52, 5.48] -4.13 [-11.49, 3.24] 2.16 [ -4.93, 9.25] 1.52 [ -7.12, 10.17] -1.04 [-10.60, 8.52] 9.90 [ 0.71, 19.10] 7.19 [ -3.05, 17.44] 6.41 [ -0.75, 13.57] -3.96 [-12.48, 4.57] -0.94 [-13.66, 11.79] 3.13 [-10.04, 16.31] -2.74 [ -8.64, 3.16] TACS_10-20EEG .
TDCS_10-20EEG 0.33 [ -8.71, 9.36] 1.19 [ -9.66, 12.03] -1.99 [-14.30, 10.32] 2.48 [ -5.04, 9.99] 0.53 [ -5.09, 6.15] 4.84 [ 0.45, 9.24] 3.17 [ -1.06, 7.40] -2.06 [ -8.77, 4.64] -3.17 [ -8.36, 2.02] 3.11 [ -1.68, 7.91] 2.48 [ -4.41, 9.36] -0.08 [ -8.09, 7.92] 10.86 [ 3.30, 18.42] 8.15 [ -0.66, 16.96] 7.37 [ 2.48, 12.26] -3.00 [ -9.73, 3.73] 0.02 [-11.58, 11.62] 4.09 [ -8.00, 16.18] -1.78 [ -4.52, 0.95] 0.96 [ -5.55, 7.46] TDCS_10-20EEG

Interpretation Guide: - Comparisons are ‘Column Treatment’ vs ‘Row Treatment’. - Cells contain: MD [95% CI]. - Positive MD favors the column treatment (assuming positive TE = benefit after direction adjustment).

Generating Comparison-Adjusted Funnel Plot for: total_psychopathology Visual assessment of funnel plot asymmetry recommended. Asymmetry may suggest publication bias or other systematic differences between small and large studies.

Generating Rankogram for: total_psychopathology

Skipping meta-regression for RoB - ‘Overall_RoB_Level’ column not found after merge.

Skipping meta-regression for Diagnosis - ‘Diagnosis’ column not found or contains only NA values.

========================================================== Finished NMA Workflow for Domain: total_psychopathology ==========================================================

========================================================== Starting NMA Workflow for Domain: global_cognition ==========================================================

— Running Network Meta-Analysis for: global_cognition — Number of comparisons: 32 Number of unique studies (studlab): 32 Treatments included: TDCS_10-20EEG, HF-RTMS_CM, HF-RTMS_NEURONAV, HD-TDCS_10-20EEG, LF-RTMS_10-10EEG, ITBS_10-20EEG, ITBS_NEURONAV, TDCS_10-20 EEG, TACS_10-20EEG, HF-RTMS_10-20EEG, SHAM Reference treatment: SHAM Model type: Random Effects (tau method: REML ) — NMA completed successfully for: global_cognition — Estimated heterogeneity (tau^2): 1.8981 I^2 statistic (overall inconsistency): 12.4% Cochran’s Q: 25.11 , df = 22 , p-value = 0.292

— NMA Summary —

Results ( effects model): Number of studies: k = 32 Number of pairwise comparisons: m = 32 Number of treatments: n = 11 Number of designs: d = 10

Treatment estimates (sm = ‘MD’, comparison: other treatments vs ‘SHAM’): $TE HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM HF-RTMS_NEURONAV HD-TDCS_10-20EEG 0.000000000 -0.9868948 -5.137906 -1.2636160 HF-RTMS_10-20EEG 0.986894781 0.0000000 -4.151012 -0.2767212 HF-RTMS_CM 5.137906324 4.1510115 0.000000 3.8742904 HF-RTMS_NEURONAV 1.263615959 0.2767212 -3.874290 0.0000000 ITBS_10-20EEG 1.368334230 0.3814394 -3.769572 0.1047183 ITBS_NEURONAV -1.045444218 -2.0323390 -6.183351 -2.3090602 LF-RTMS_10-10EEG 3.326173837 2.3392791 -1.811732 2.0625579 SHAM -0.793826163 -1.7807209 -5.931732 -2.0574421 TACS_10-20EEG -2.993826163 -3.9807209 -8.131732 -4.2574421 TDCS_10-20 EEG -0.783826163 -1.7707209 -5.921732 -2.0474421 TDCS_10-20EEG -0.003148491 -0.9900433 -5.141055 -1.2667645 ITBS_10-20EEG ITBS_NEURONAV LF-RTMS_10-10EEG SHAM HD-TDCS_10-20EEG -1.3683342 1.0454442 -3.326174 0.7938262 HF-RTMS_10-20EEG -0.3814394 2.0323390 -2.339279 1.7807209 HF-RTMS_CM 3.7695721 6.1833505 1.811732 5.9317325 HF-RTMS_NEURONAV -0.1047183 2.3090602 -2.062558 2.0574421 ITBS_10-20EEG 0.0000000 2.4137784 -1.957840 2.1621604 ITBS_NEURONAV -2.4137784 0.0000000 -4.371618 -0.2516181 LF-RTMS_10-10EEG 1.9578396 4.3716181 0.000000 4.1200000 SHAM -2.1621604 0.2516181 -4.120000 0.0000000 TACS_10-20EEG -4.3621604 -1.9483819 -6.320000 -2.2000000 TDCS_10-20 EEG -2.1521604 0.2616181 -4.110000 0.0100000 TDCS_10-20EEG -1.3714827 1.0422957 -3.329322 0.7906777 TACS_10-20EEG TDCS_10-20 EEG TDCS_10-20EEG HD-TDCS_10-20EEG 2.993826 0.7838262 0.003148491 HF-RTMS_10-20EEG 3.980721 1.7707209 0.990043272 HF-RTMS_CM 8.131732 5.9217325 5.141054815 HF-RTMS_NEURONAV 4.257442 2.0474421 1.266764451 ITBS_10-20EEG 4.362160 2.1521604 1.371482721 ITBS_NEURONAV 1.948382 -0.2616181 -1.042295726 LF-RTMS_10-10EEG 6.320000 4.1100000 3.329322328 SHAM 2.200000 -0.0100000 -0.790677672 TACS_10-20EEG 0.000000 -2.2100000 -2.990677672 TDCS_10-20 EEG 2.210000 0.0000000 -0.780677672 TDCS_10-20EEG 2.990678 0.7806777 0.000000000

$seTE HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM HF-RTMS_NEURONAV HD-TDCS_10-20EEG 0.000000 1.990959 2.053813 1.880631 HF-RTMS_10-20EEG 1.990959 0.000000 2.306829 2.154085 HF-RTMS_CM 2.053813 2.306829 0.000000 2.212310 HF-RTMS_NEURONAV 1.880631 2.154085 2.212310 0.000000 ITBS_10-20EEG 4.300327 4.426750 4.455373 4.378239 ITBS_NEURONAV 1.518211 1.846151 1.913767 1.726595 LF-RTMS_10-10EEG 2.274690 2.505498 2.555730 2.418755 SHAM 1.195953 1.591733 1.669684 1.451368 TACS_10-20EEG 3.769252 3.912873 3.945226 3.857905 TDCS_10-20 EEG 1.835087 2.114439 2.173726 2.010897 TDCS_10-20EEG 1.619914 1.930655 1.995410 1.816669 ITBS_10-20EEG ITBS_NEURONAV LF-RTMS_10-10EEG SHAM HD-TDCS_10-20EEG 4.300327 1.5182107 2.274690 1.1959528 HF-RTMS_10-20EEG 4.426750 1.8461509 2.505498 1.5917326 HF-RTMS_CM 4.455373 1.9137675 2.555730 1.6696842 HF-RTMS_NEURONAV 4.378239 1.7265945 2.418755 1.4513677 ITBS_10-20EEG 0.000000 4.2352291 4.561405 4.1306785 ITBS_NEURONAV 4.235229 0.0000000 2.149086 0.9352329 LF-RTMS_10-10EEG 4.561405 2.1490859 0.000000 1.9349185 SHAM 4.130678 0.9352329 1.934918 0.0000000 TACS_10-20EEG 5.462551 3.6948100 4.064587 3.5744875 TDCS_10-20 EEG 4.358870 1.6768721 2.383516 1.3918475 TDCS_10-20EEG 4.272742 1.4382204 2.222100 1.0926195 TACS_10-20EEG TDCS_10-20 EEG TDCS_10-20EEG HD-TDCS_10-20EEG 3.769252 1.835087 1.619914 HF-RTMS_10-20EEG 3.912873 2.114439 1.930655 HF-RTMS_CM 3.945226 2.173726 1.995410 HF-RTMS_NEURONAV 3.857905 2.010897 1.816669 ITBS_10-20EEG 5.462551 4.358870 4.272742 ITBS_NEURONAV 3.694810 1.676872 1.438220 LF-RTMS_10-10EEG 4.064587 2.383516 2.222100 SHAM 3.574487 1.391847 1.092620 TACS_10-20EEG 0.000000 3.835909 3.737750 TDCS_10-20 EEG 3.835909 0.000000 1.769479 TDCS_10-20EEG 3.737750 1.769479 0.000000

$lower HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM HF-RTMS_NEURONAV HD-TDCS_10-20EEG 0.000000 -4.8891018 -9.163306 -4.9495841 HF-RTMS_10-20EEG -2.915312 0.0000000 -8.672312 -4.4986496 HF-RTMS_CM 1.112506 -0.3702894 0.000000 -0.4617567 HF-RTMS_NEURONAV -2.422352 -3.9452072 -8.210337 0.0000000 ITBS_10-20EEG -7.060151 -8.2948316 -12.501943 -8.4764716 ITBS_NEURONAV -4.021082 -5.6507283 -9.934266 -5.6931233 LF-RTMS_10-10EEG -1.132136 -2.5714076 -6.820871 -2.6781156 SHAM -3.137851 -4.9004595 -9.204253 -4.9020705 TACS_10-20EEG -10.381425 -11.6498107 -15.864233 -11.8187964 TDCS_10-20 EEG -4.380530 -5.9149451 -10.182157 -5.9887282 TDCS_10-20EEG -3.178121 -4.7740582 -9.051987 -4.8273698 ITBS_10-20EEG ITBS_NEURONAV LF-RTMS_10-10EEG SHAM HD-TDCS_10-20EEG -9.796819 -1.9301941 -7.784483 -1.5501983 HF-RTMS_10-20EEG -9.057710 -1.5860503 -7.249966 -1.3390177 HF-RTMS_CM -4.962799 2.4324352 -3.197406 2.6592115 HF-RTMS_NEURONAV -8.685908 -1.0750029 -6.803231 -0.7871862 ITBS_10-20EEG 0.000000 -5.8871180 -10.898029 -5.9338207 ITBS_NEURONAV -10.714675 0.0000000 -8.583749 -2.0846408 LF-RTMS_10-10EEG -6.982350 0.1594871 0.000000 0.3276295 SHAM -10.258141 -1.5814047 -7.912371 0.0000000 TACS_10-20EEG -15.068564 -9.1900766 -14.286445 -9.2058667 TDCS_10-20 EEG -10.695388 -3.0249908 -8.781606 -2.7179709 TDCS_10-20EEG -9.745903 -1.7765645 -7.684558 -1.3508172 TACS_10-20EEG TDCS_10-20 EEG TDCS_10-20EEG HD-TDCS_10-20EEG -4.3937729 -2.8128773 -3.171824 HF-RTMS_10-20EEG -3.6883688 -2.3735033 -2.793972 HF-RTMS_CM 0.3992321 1.6613078 1.230122 HF-RTMS_NEURONAV -3.3039122 -1.8938439 -2.293841 ITBS_10-20EEG -6.3442432 -6.3910670 -7.002937 ITBS_NEURONAV -5.2933127 -3.5482269 -3.861156 LF-RTMS_10-10EEG -1.6464448 -0.5616057 -1.025913 SHAM -4.8058667 -2.7379709 -2.932173 TACS_10-20EEG 0.0000000 -9.7282441 -10.316534 TDCS_10-20 EEG -5.3082441 0.0000000 -4.248793 TDCS_10-20EEG -4.3351785 -2.6874379 0.000000

$upper HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM HF-RTMS_NEURONAV HD-TDCS_10-20EEG 0.000000 2.915312 -1.1125065 2.4223522 HF-RTMS_10-20EEG 4.889102 0.000000 0.3702894 3.9452072 HF-RTMS_CM 9.163306 8.672312 0.0000000 8.2103374 HF-RTMS_NEURONAV 4.949584 4.498650 0.4617567 0.0000000 ITBS_10-20EEG 9.796819 9.057710 4.9627989 8.6859082 ITBS_NEURONAV 1.930194 1.586050 -2.4324352 1.0750029 LF-RTMS_10-10EEG 7.784483 7.249966 3.1974059 6.8032313 SHAM 1.550198 1.339018 -2.6592115 0.7871862 TACS_10-20EEG 4.393773 3.688369 -0.3992321 3.3039122 TDCS_10-20 EEG 2.812877 2.373503 -1.6613078 1.8938439 TDCS_10-20EEG 3.171824 2.793972 -1.2301222 2.2938409 ITBS_10-20EEG ITBS_NEURONAV LF-RTMS_10-10EEG SHAM HD-TDCS_10-20EEG 7.060151 4.021082 1.1321358 3.137851 HF-RTMS_10-20EEG 8.294832 5.650728 2.5714076 4.900460 HF-RTMS_CM 12.501943 9.934266 6.8208709 9.204253 HF-RTMS_NEURONAV 8.476472 5.693123 2.6781156 4.902070 ITBS_10-20EEG 0.000000 10.714675 6.9823497 10.258141 ITBS_NEURONAV 5.887118 0.000000 -0.1594871 1.581405 LF-RTMS_10-10EEG 10.898029 8.583749 0.0000000 7.912371 SHAM 5.933821 2.084641 -0.3276295 0.000000 TACS_10-20EEG 6.344243 5.293313 1.6464448 4.805867 TDCS_10-20 EEG 6.391067 3.548227 0.5616057 2.737971 TDCS_10-20EEG 7.002937 3.861156 1.0259130 2.932173 TACS_10-20EEG TDCS_10-20 EEG TDCS_10-20EEG HD-TDCS_10-20EEG 10.381425 4.380530 3.178121 HF-RTMS_10-20EEG 11.649811 5.914945 4.774058 HF-RTMS_CM 15.864233 10.182157 9.051987 HF-RTMS_NEURONAV 11.818796 5.988728 4.827370 ITBS_10-20EEG 15.068564 10.695388 9.745903 ITBS_NEURONAV 9.190077 3.024991 1.776564 LF-RTMS_10-10EEG 14.286445 8.781606 7.684558 SHAM 9.205867 2.717971 1.350817 TACS_10-20EEG 0.000000 5.308244 4.335179 TDCS_10-20 EEG 9.728244 0.000000 2.687438 TDCS_10-20EEG 10.316534 4.248793 0.000000

$statistic HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM HF-RTMS_NEURONAV HD-TDCS_10-20EEG NaN -0.49568826 -2.5016425 -0.6719108 HF-RTMS_10-20EEG 0.495688265 NaN -1.7994452 -0.1284635 HF-RTMS_CM 2.501642493 1.79944516 NaN 1.7512424 HF-RTMS_NEURONAV 0.671910790 0.12846346 -1.7512424 NaN ITBS_10-20EEG 0.318193102 0.08616692 -0.8460733 0.0239179 ITBS_NEURONAV -0.688602855 -1.10085203 -3.2309832 -1.3373494 LF-RTMS_10-10EEG 1.462253953 0.93365817 -0.7088905 0.8527352 SHAM -0.663760429 -1.11873120 -3.5526074 -1.4175885 TACS_10-20EEG -0.794275845 -1.01733973 -2.0611577 -1.1035633 TDCS_10-20 EEG -0.427133083 -0.83744245 -2.7242313 -1.0181735 TDCS_10-20EEG -0.001943617 -0.51280166 -2.5764398 -0.6973007 ITBS_10-20EEG ITBS_NEURONAV LF-RTMS_10-10EEG SHAM HD-TDCS_10-20EEG -0.31819310 0.6886029 -1.4622540 0.663760429 HF-RTMS_10-20EEG -0.08616692 1.1008520 -0.9336582 1.118731204 HF-RTMS_CM 0.84607325 3.2309832 0.7088905 3.552607373 HF-RTMS_NEURONAV -0.02391790 1.3373494 -0.8527352 1.417588505 ITBS_10-20EEG NaN 0.5699287 -0.4292186 0.523439526 ITBS_NEURONAV -0.56992866 NaN -2.0341756 -0.269043208 LF-RTMS_10-10EEG 0.42921856 2.0341756 NaN 2.129288667 SHAM -0.52343953 0.2690432 -2.1292887 NaN TACS_10-20EEG -0.79855735 -0.5273294 -1.5548934 -0.615472851 TDCS_10-20 EEG -0.49374278 0.1560155 -1.7243433 0.007184695 TDCS_10-20EEG -0.32098423 0.7247121 -1.4982777 0.723653267 TACS_10-20EEG TDCS_10-20 EEG TDCS_10-20EEG HD-TDCS_10-20EEG 0.7942758 0.427133083 0.001943617 HF-RTMS_10-20EEG 1.0173397 0.837442453 0.512801661 HF-RTMS_CM 2.0611577 2.724231320 2.576439783 HF-RTMS_NEURONAV 1.1035633 1.018173450 0.697300719 ITBS_10-20EEG 0.7985573 0.493742779 0.320984229 ITBS_NEURONAV 0.5273294 -0.156015513 -0.724712101 LF-RTMS_10-10EEG 1.5548934 1.724343306 1.498277680 SHAM 0.6154729 -0.007184695 -0.723653267 TACS_10-20EEG NaN -0.576134582 -0.800127709 TDCS_10-20 EEG 0.5761346 NaN -0.441190639 TDCS_10-20EEG 0.8001277 0.441190639 NaN

$p HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM HD-TDCS_10-20EEG NaN 0.62011437 0.0123618685 HF-RTMS_10-20EEG 0.62011437 NaN 0.0719482907 HF-RTMS_CM 0.01236187 0.07194829 NaN HF-RTMS_NEURONAV 0.50164049 0.89778221 0.0799041578 ITBS_10-20EEG 0.75033846 0.93133372 0.3975118798 ITBS_NEURONAV 0.49107322 0.27096106 0.0012336519 LF-RTMS_10-10EEG 0.14367163 0.35048025 0.4783924572 SHAM 0.50684366 0.26325483 0.0003814333 TACS_10-20EEG 0.42703486 0.30899184 0.0392879959 TDCS_10-20 EEG 0.66928240 0.40234391 0.0064451347 TDCS_10-20EEG 0.99844922 0.60809007 0.0099823591 HF-RTMS_NEURONAV ITBS_10-20EEG ITBS_NEURONAV LF-RTMS_10-10EEG HD-TDCS_10-20EEG 0.50164049 0.7503385 0.491073224 0.14367163 HF-RTMS_10-20EEG 0.89778221 0.9313337 0.270961063 0.35048025 HF-RTMS_CM 0.07990416 0.3975119 0.001233652 0.47839246 HF-RTMS_NEURONAV NaN 0.9809181 0.181108608 0.39380616 ITBS_10-20EEG 0.98091810 NaN 0.568726083 0.66776418 ITBS_NEURONAV 0.18110861 0.5687261 NaN 0.04193389 LF-RTMS_10-10EEG 0.39380616 0.6677642 0.041933893 NaN SHAM 0.15631094 0.6006684 0.787896433 0.03323038 TACS_10-20EEG 0.26978261 0.4245471 0.597964865 0.11997146 TDCS_10-20 EEG 0.30859553 0.6214878 0.876020794 0.08464589 TDCS_10-20EEG 0.48561462 0.7482223 0.468628670 0.13406112 SHAM TACS_10-20EEG TDCS_10-20 EEG TDCS_10-20EEG HD-TDCS_10-20EEG 0.5068436559 0.4270349 0.669282398 0.998449219 HF-RTMS_10-20EEG 0.2632548288 0.3089918 0.402343911 0.608090067 HF-RTMS_CM 0.0003814333 0.0392880 0.006445135 0.009982359 HF-RTMS_NEURONAV 0.1563109380 0.2697826 0.308595534 0.485614618 ITBS_10-20EEG 0.6006684245 0.4245471 0.621487849 0.748222343 ITBS_NEURONAV 0.7878964325 0.5979649 0.876020794 0.468628670 LF-RTMS_10-10EEG 0.0332303848 0.1199715 0.084645886 0.134061121 SHAM NaN 0.5382425 0.994267492 0.469278630 TACS_10-20EEG 0.5382424933 NaN 0.564524218 0.423636808 TDCS_10-20 EEG 0.9942674918 0.5645242 NaN 0.659074990 TDCS_10-20EEG 0.4692786303 0.4236368 0.659074990 NaN

Quantifying heterogeneity / inconsistency: I^2 = 12.4% [0.0%; 46.3%]

Tests of heterogeneity (within designs) and inconsistency (between designs): [1] 25.11097

Details of network meta-analysis methods:

  • Calculation of I^2 based on Q

Generating Forest Plot for: global_cognition Generating Network Graph for: global_cognition Calculating SUCRA/P-score values for: global_cognition Mean rank column not found in netrank results. SUCRA/P-score Results: Treatment SUCRA 1 TACS_10-20EEG 81.4 2 ITBS_NEURONAV 74.6 3 SHAM 71.5 4 TDCS_10-20 EEG 68.4 5 HD-TDCS_10-20EEG 55.3 6 TDCS_10-20EEG 55.2 7 ITBS_10-20EEG 42.8 8 HF-RTMS_10-20EEG 41.1 9 HF-RTMS_NEURONAV 36.7 10 LF-RTMS_10-10EEG 17.5 11 HF-RTMS_CM 5.5 — Performing Split Analysis (Direct vs Indirect) for: global_cognition — Summary of Direct vs Indirect Evidence: Length Class Mode
comparison 55 -none- character k 55 -none- numeric
show 1 -none- character overall 1 -none- logical
direct 1 -none- logical
indirect 1 -none- logical
ci 1 -none- logical
test 1 -none- logical
only.reference 1 -none- logical
prop.common 55 -none- numeric
common 7 data.frame list
direct.common 12 data.frame list
indirect.common 7 data.frame list
compare.common 8 data.frame list
prop.random 55 -none- numeric
random 7 data.frame list
direct.random 12 data.frame list
indirect.random 7 data.frame list
compare.random 8 data.frame list
predict 3 data.frame list
method 1 -none- character sm 1 -none- character level.ma 1 -none- numeric
prediction 1 -none- logical
level.predict 1 -none- numeric
tau 1 -none- numeric
reference.group 1 -none- character baseline.reference 1 -none- logical
order 0 -none- NULL
sep.trts 1 -none- character quote.trts 1 -none- character nchar.trts 1 -none- numeric
tol.direct 1 -none- numeric
backtransf 1 -none- logical
x 198 netmeta list
version 1 -none- character prop.fixed 55 -none- numeric
fixed 7 data.frame list
direct.fixed 12 data.frame list
indirect.fixed 7 data.frame list
compare.fixed 8 data.frame list

‘p’ value column (’ p.random ’) not found in netsplit results. Cannot check for inconsistency. This might happen if there are no closed loops for indirect evidence calculation.

— Generating League Table for: global_cognition — League Table (Model: random ):
League Table: global_cognition ( random effects)
HD-TDCS_10-20EEG HF-RTMS_10-20EEG HF-RTMS_CM HF-RTMS_NEURONAV ITBS_10-20EEG ITBS_NEURONAV LF-RTMS_10-10EEG SHAM TACS_10-20EEG TDCS_10-20 EEG TDCS_10-20EEG
HD-TDCS_10-20EEG HD-TDCS_10-20EEG . . . . . . 0.79 [ -1.55, 3.14] . . .
HF-RTMS_10-20EEG -0.99 [ -4.89, 2.92] HF-RTMS_10-20EEG . . . . . 1.78 [ -1.34, 4.90] . . .
HF-RTMS_CM -5.14 [ -9.16, -1.11] -4.15 [ -8.67, 0.37] HF-RTMS_CM . . . . 5.93 [ 2.66, 9.20] . . .
HF-RTMS_NEURONAV -1.26 [ -4.95, 2.42] -0.28 [ -4.50, 3.95] 3.87 [ -0.46, 8.21] HF-RTMS_NEURONAV . . . 2.06 [ -0.79, 4.90] . . .
ITBS_10-20EEG -1.37 [ -9.80, 7.06] -0.38 [ -9.06, 8.29] 3.77 [ -4.96, 12.50] -0.10 [ -8.69, 8.48] ITBS_10-20EEG . . 2.16 [ -5.93, 10.26] . . .
ITBS_NEURONAV 1.05 [ -1.93, 4.02] 2.03 [ -1.59, 5.65] 6.18 [ 2.43, 9.93] 2.31 [ -1.08, 5.69] 2.41 [ -5.89, 10.71] ITBS_NEURONAV . -0.25 [ -2.08, 1.58] . . .
LF-RTMS_10-10EEG -3.33 [ -7.78, 1.13] -2.34 [ -7.25, 2.57] 1.81 [ -3.20, 6.82] -2.06 [ -6.80, 2.68] -1.96 [-10.90, 6.98] -4.37 [ -8.58, -0.16] LF-RTMS_10-10EEG 4.12 [ 0.33, 7.91] . . .
SHAM 0.79 [ -1.55, 3.14] 1.78 [ -1.34, 4.90] 5.93 [ 2.66, 9.20] 2.06 [ -0.79, 4.90] 2.16 [ -5.93, 10.26] -0.25 [ -2.08, 1.58] 4.12 [ 0.33, 7.91] SHAM 2.20 [ -4.81, 9.21] -0.01 [ -2.74, 2.72] -0.79 [ -2.93, 1.35]
TACS_10-20EEG 2.99 [ -4.39, 10.38] 3.98 [ -3.69, 11.65] 8.13 [ 0.40, 15.86] 4.26 [ -3.30, 11.82] 4.36 [ -6.34, 15.07] 1.95 [ -5.29, 9.19] 6.32 [ -1.65, 14.29] 2.20 [ -4.81, 9.21] TACS_10-20EEG . .
TDCS_10-20 EEG 0.78 [ -2.81, 4.38] 1.77 [ -2.37, 5.91] 5.92 [ 1.66, 10.18] 2.05 [ -1.89, 5.99] 2.15 [ -6.39, 10.70] -0.26 [ -3.55, 3.02] 4.11 [ -0.56, 8.78] -0.01 [ -2.74, 2.72] -2.21 [ -9.73, 5.31] TDCS_10-20 EEG .
TDCS_10-20EEG 0.00 [ -3.17, 3.18] 0.99 [ -2.79, 4.77] 5.14 [ 1.23, 9.05] 1.27 [ -2.29, 4.83] 1.37 [ -7.00, 9.75] -1.04 [ -3.86, 1.78] 3.33 [ -1.03, 7.68] -0.79 [ -2.93, 1.35] -2.99 [-10.32, 4.34] -0.78 [ -4.25, 2.69] TDCS_10-20EEG

Interpretation Guide: - Comparisons are ‘Column Treatment’ vs ‘Row Treatment’. - Cells contain: MD [95% CI]. - Positive MD favors the column treatment (assuming positive TE = benefit after direction adjustment).

Generating Comparison-Adjusted Funnel Plot for: global_cognition Visual assessment of funnel plot asymmetry recommended. Asymmetry may suggest publication bias or other systematic differences between small and large studies.

Generating Rankogram for: global_cognition

— Performing Network Meta-Regression for: global_cognition using covariate: Overall_RoB_Level — !!! Error during netmetareg execution for global_cognition with covariate Overall_RoB_Level : object ‘netmetareg’ not found -> Double-check if the covariate ’ Overall_RoB_Level ’ exists in the data frame used by the nma_result object. — Meta-regression failed for: global_cognition using covariate: Overall_RoB_Level —

Skipping meta-regression for Diagnosis - ‘Diagnosis’ column not found or contains only NA values.

========================================================== Finished NMA Workflow for Domain: global_cognition ==========================================================

========================================================== Cross-Domain Comparison (Based on SUCRA/P-score) ========================================================== — Summary Table: Treatment Performance Across Domains —
Cross-Domain Treatment Performance Summary (SUCRA % / Mean Rank)
Treatment positive_symptoms negative_symptoms total_psychopathology global_cognition
CTBS_10-20EEG 91.0 63.0 58.2 NA
CTBS_CM 37.4 64.6 52.7 NA
CTBS_NEURONAV 48.2 57.1 68.8 NA
DTMS_CM 42.4 45.8 44.0 NA
HD-TDCS_10-10EEG 50.8 35.9 NA NA
HD-TDCS_10-20EEG 48.8 60.6 57.6 55.3
HF-RTMS_10-20EEG 54.6 23.0 25.9 41.1
HF-RTMS_CM 43.2 19.9 37.2 5.5
HF-RTMS_NA 58.0 53.6 75.0 NA
HF-RTMS_NEURONAV 52.9 69.6 83.5 36.7
ITBS_10-20EEG 69.8 5.3 37.9 42.8
ITBS_CM 39.7 62.2 43.7 NA
ITBS_NA 53.1 52.9 61.2 NA
ITBS_NEURONAV 19.5 21.0 5.7 74.6
LF-RTMS_10-10EEG 36.7 47.1 15.1 17.5
LF-RTMS_10-20EEG 19.0 58.3 13.5 NA
LF-RTMS_CM 76.7 59.5 80.4 NA
LF-RTMS_NEURONAV 58.0 69.0 59.0 NA
PRM-RTMS_NEURONAV 48.1 NA 37.4 NA
TACS_10-20EEG 57.7 50.9 54.4 81.4
TDCS_10-20EEG 50.6 65.4 61.8 55.2
TDCS_10-20EG 32.5 41.9 NA NA

========================================================== Summary Recommendations (Based on SUCRA/P-score) ==========================================================

— Domain: positive_symptoms — Top Treatments (ranked by SUCRA/P-score): 1. CTBS_10-20EEG (SUCRA: 91.0%) 2. LF-RTMS_CM (SUCRA: 76.7%) 3. ITBS_10-20EEG (SUCRA: 69.8%) 4. HF-RTMS_NA (SUCRA: 58.0%) 5. LF-RTMS_NEURONAV (SUCRA: 58.0%)

— Domain: negative_symptoms — Top Treatments (ranked by SUCRA/P-score): 1. HF-RTMS_NEURONAV (SUCRA: 69.6%) 2. LF-RTMS_NEURONAV (SUCRA: 69.0%) 3. TDCS_10-20EEG (SUCRA: 65.4%) 4. CTBS_CM (SUCRA: 64.6%) 5. CTBS_10-20EEG (SUCRA: 63.0%)

— Domain: total_psychopathology — Top Treatments (ranked by SUCRA/P-score): 1. HF-RTMS_NEURONAV (SUCRA: 83.5%) 2. LF-RTMS_CM (SUCRA: 80.4%) 3. HF-RTMS_NA (SUCRA: 75.0%) 4. CTBS_NEURONAV (SUCRA: 68.8%) 5. TDCS_10-20EEG (SUCRA: 61.8%)

— Domain: global_cognition — Top Treatments (ranked by SUCRA/P-score): 1. TACS_10-20EEG (SUCRA: 81.4%) 2. ITBS_NEURONAV (SUCRA: 74.6%) 3. TDCS_10-20 EEG (SUCRA: 68.4%) 4. HD-TDCS_10-20EEG (SUCRA: 55.3%) 5. TDCS_10-20EEG (SUCRA: 55.2%)

========================================================== Targeting Method Analysis (Exploratory) ========================================================== Average SUCRA/P-score by Targeting Method within each Domain:

Domain: global_cognition
Targeting_Method Avg_SUCRA Num_Treatments
10-20 EEG 68.4 1
NEURONAV 55.6 2
10-20EEG 55.2 5
10-10EEG 17.5 1
CM 5.5 1
Domain: negative_symptoms
Targeting_Method Avg_SUCRA Num_Treatments
NEURONAV 54.2 4
NA 53.2 2
CM 50.4 5
10-20EEG 46.6 7
10-20EG 41.9 1
10-10EEG 41.5 2
Domain: positive_symptoms
Targeting_Method Avg_SUCRA Num_Treatments
10-20EEG 55.9 7
NA 55.5 2
CM 47.9 5
NEURONAV 45.3 5
10-10EEG 43.8 2
10-20EG 32.5 1
Domain: total_psychopathology
Targeting_Method Avg_SUCRA Num_Treatments
NA 68.1 2
CM 51.6 5
NEURONAV 50.9 5
10-20EEG 44.2 7
10-10EEG 15.1 1

— End of Workflow —

— Full NMA Workflow Execution Finished —

# Optional: Save the results object
# Check if the results object exists and is not empty before saving
# if (!is.null(nma_results_output) && length(nma_results_output) > 0) {
#    saveRDS(nma_results_output, file = "nma_results_output_v9.rds")
#    cat("\nNMA results saved to nma_results_output_v9.rds\n")
# } else {
#    cat("\nNMA results object is empty or NULL, not saving.\n")
# }