... | ... |
@@ -21,6 +21,7 @@ export(ggs_graph) |
21 | 21 |
export(go_2_html) |
22 | 22 |
export(gs_alluvial) |
23 | 23 |
export(gs_dendro) |
24 |
+export(gs_fuzzyclustering) |
|
24 | 25 |
export(gs_heatmap) |
25 | 26 |
export(gs_horizon) |
26 | 27 |
export(gs_mds) |
... | ... |
@@ -99,6 +100,8 @@ importFrom(dplyr,desc) |
99 | 100 |
importFrom(dplyr,group_by) |
100 | 101 |
importFrom(dplyr,mutate) |
101 | 102 |
importFrom(dplyr,pull) |
103 |
+importFrom(dplyr,select) |
|
104 |
+importFrom(dplyr,slice) |
|
102 | 105 |
importFrom(dynamicTreeCut,cutreeDynamic) |
103 | 106 |
importFrom(expm,"%^%") |
104 | 107 |
importFrom(ggforce,geom_sina) |
... | ... |
@@ -16,7 +16,7 @@ |
16 | 16 |
#' @importFrom ComplexHeatmap Heatmap HeatmapAnnotation draw |
17 | 17 |
#' @importFrom dendextend branches_attr_by_clusters set |
18 | 18 |
#' @importFrom DESeq2 vst counts estimateSizeFactors normalizationFactors sizeFactors |
19 |
-#' @importFrom dplyr arrange desc group_by mutate pull "%>%" |
|
19 |
+#' @importFrom dplyr arrange desc group_by mutate pull slice select "%>%" |
|
20 | 20 |
#' @importFrom DT datatable dataTableOutput renderDataTable formatRound |
21 | 21 |
#' formatStyle JS |
22 | 22 |
#' @importFrom dynamicTreeCut cutreeDynamic |