Browse code

backbone functions update - hyperg replaced by fixedrow

Federico Marini authored on 19/01/2022 16:22:34
Showing 3 changed files

... ...
@@ -15,7 +15,7 @@
15 15
 #' @author Federico Marini \email{marinif@@uni-mainz.de}
16 16
 #'
17 17
 #' @importFrom AnnotationDbi Definition GOID Ontology Secondary Synonym Term
18
-#' @importFrom backbone backbone.extract fdsm hyperg sdsm universal
18
+#' @importFrom backbone backbone.extract fdsm fixedrow sdsm universal
19 19
 #' @importFrom bs4Dash bs4Card bs4DashBody bs4DashControlbar
20 20
 #' bs4DashFooter bs4DashNavbar bs4DashPage bs4DashSidebar
21 21
 #' bs4InfoBox bs4InfoBoxOutput bs4SidebarMenu
... ...
@@ -329,7 +329,7 @@ ggs_backbone <- function(res_enrich,
329 329
                          n_gs = 15,
330 330
                          gs_ids = NULL,
331 331
                          bb_on = c("genesets", "features"),
332
-                         bb_method = c("sdsm", "fdsm", "hyperg"),
332
+                         bb_method = c("sdsm", "fdsm", "fixedrow"),
333 333
                          bb_extract_alpha = 0.05,
334 334
                          bb_extract_fwer = c("none", "bonferroni", "holm"),
335 335
                          bb_fullinfo = FALSE,
... ...
@@ -350,7 +350,7 @@ ggs_backbone <- function(res_enrich,
350 350
   stopifnot(is.logical(bb_remove_singletons))
351 351
   stopifnot(is.logical(color_graph))
352 352
 
353
-  bb_method <- match.arg(bb_method, c("sdsm", "fdsm", "hyperg"))
353
+  bb_method <- match.arg(bb_method, c("sdsm", "fdsm", "fixedrow"))
354 354
   bb_extract_fwer <- match.arg(bb_extract_fwer, c("none", "bonferroni", "holm"))
355 355
   bb_on <- match.arg(bb_on, c("genesets", "features"))
356 356
 
... ...
@@ -405,7 +405,7 @@ ggs_backbone <- function(res_enrich,
405 405
   } else if (bb_method == "fixedrow") {
406 406
     bbobj <- backbone::fixedrow(bpm_for_backbone, alpha = NULL)
407 407
   }
408
-
408
+  
409 409
   bbextracted <- backbone::backbone.extract(bbobj,
410 410
     alpha = bb_extract_alpha,
411 411
     mtc = bb_extract_fwer
... ...
@@ -89,7 +89,7 @@ test_that("Backbone functionality up and running", {
89 89
     annotation_obj = anno_df,
90 90
     n_gs = 20,
91 91
     bb_on = "features",
92
-    bb_method = "hyperg",
92
+    bb_method = "fixedrow",
93 93
     bb_remove_singletons = FALSE,
94 94
     bb_fullinfo = TRUE
95 95
   )