Browse code

specifying bs4Dash functions to import to avoid namespace collisions

Federico Marini authored on 29/10/2019 16:59:48
Showing 3 changed files

... ...
@@ -28,7 +28,6 @@ export(overlap_jaccard_index)
28 28
 import(DESeq2)
29 29
 import(GO.db)
30 30
 import(SummarizedExperiment)
31
-import(bs4Dash)
32 31
 import(ggalluvial)
33 32
 import(ggplot2)
34 33
 import(igraph)
... ...
@@ -49,6 +48,23 @@ importFrom(DT,datatable)
49 48
 importFrom(DT,renderDataTable)
50 49
 importFrom(RColorBrewer,brewer.pal)
51 50
 importFrom(S4Vectors,mcols)
51
+importFrom(bs4Dash,bs4Card)
52
+importFrom(bs4Dash,bs4DashBody)
53
+importFrom(bs4Dash,bs4DashControlbar)
54
+importFrom(bs4Dash,bs4DashFooter)
55
+importFrom(bs4Dash,bs4DashNavbar)
56
+importFrom(bs4Dash,bs4DashPage)
57
+importFrom(bs4Dash,bs4DashSidebar)
58
+importFrom(bs4Dash,bs4InfoBox)
59
+importFrom(bs4Dash,bs4InfoBoxOutput)
60
+importFrom(bs4Dash,bs4SidebarMenu)
61
+importFrom(bs4Dash,bs4SidebarMenuItem)
62
+importFrom(bs4Dash,bs4TabItem)
63
+importFrom(bs4Dash,bs4TabItems)
64
+importFrom(bs4Dash,bs4ValueBox)
65
+importFrom(bs4Dash,bs4ValueBoxOutput)
66
+importFrom(bs4Dash,renderbs4InfoBox)
67
+importFrom(bs4Dash,renderbs4ValueBox)
52 68
 importFrom(dplyr,arrange)
53 69
 importFrom(dplyr,desc)
54 70
 importFrom(dplyr,group_by)
... ...
@@ -29,7 +29,11 @@
29 29
 #' @importFrom methods is
30 30
 #' @import pcaExplorer
31 31
 #' @import shinycssloaders
32
-#' @import bs4Dash
32
+#' @importFrom bs4Dash bs4Card bs4DashBody bs4DashControlbar
33
+#' bs4DashFooter bs4DashNavbar bs4DashPage bs4DashSidebar
34
+#' bs4InfoBox bs4InfoBoxOutput bs4SidebarMenu
35
+#' bs4SidebarMenuItem bs4TabItem bs4TabItems bs4ValueBox
36
+#' bs4ValueBoxOutput renderbs4InfoBox renderbs4ValueBox
33 37
 #' @import shinyWidgets
34 38
 #' @import ggalluvial
35 39
 #' @import viridis
... ...
@@ -121,7 +121,7 @@ GeneTonic <- function(dds,
121 121
     ),
122 122
 
123 123
     # sidebar definition ------------------------------------------------------
124
-    sidebar = bs4Dash::dashboardSidebar(
124
+    sidebar = bs4Dash::bs4DashSidebar(
125 125
       title = HTML("<small>GeneTonic</small>"),
126 126
       skin = "dark",
127 127
       status = "primary",