correlations_to_densities {scFeatureFilter} | R Documentation |
Takes the output of correlate_windows
and computes density
curves of correlation coefficient for each window comparison.
correlations_to_densities(df, n = 64, absolute_cc = TRUE)
df |
A data frame, usually the output of |
n |
Resolution of the correlation density curve. Default to 64. |
absolute_cc |
Should the function use the absolute value of correlation coefficients?
Default to |
A tibble
with columns bin
, window
, cor_coef
and density
.
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 %>% correlations_to_densities