get_mean_median {scFeatureFilter} | R Documentation |
Takes the output of correlate_windows
and extract the mean and the median correlation value
for each window comparison.
get_mean_median(df, absolute_cc = TRUE)
df |
A data frame, usually the output of |
absolute_cc |
Should the function work of absolute value of correlation coefficients?
Default to |
A data_frame
with columns bin
, window
, mean
and median
.
library(magrittr) expMat <- matrix( c(1, 1, 5, 1, 2, 3, 0, 1, 4, 0, 0, 2), ncol = 3, byrow = TRUE, dimnames = list(paste("gene", 1:4), paste("cell", 1:3)) ) calculate_cvs(expMat) %>% define_top_genes(window_size = 2) %>% bin_scdata(window_number = 1) %>% correlate_windows(n_random = 2) %>% get_mean_median