Browse code

[U] Added bonferroni correction in gene_frequency_fisher

Giulia Pais authored on 01/12/2022 09:17:25
Showing 1 changed files

... ...
@@ -801,6 +801,9 @@ gene_frequency_fisher <- function(cis_x,
801 801
                 method = "BY",
802 802
                 n = length(.data$Fisher_p_value)
803 803
             ),
804
+            Fisher_p_value_bonferroni = stats::p.adjust(.data$Fisher_p_value,
805
+                method = "bonferroni",
806
+                n = length(.data$Fisher_p_value)),
804 807
             minus_log10_pvalue = -log(.data$Fisher_p_value, base = 10)
805 808
         ) %>%
806 809
         dplyr::mutate(