Browse code

colGrid() and rowGrid() moved to DelayedMatrixStats as of v1.3.4

Peter Hickey authored on 29/06/2018 14:30:47
Showing 2 changed files

... ...
@@ -25,7 +25,7 @@ Imports:
25 25
     data.table,
26 26
     S4Vectors,
27 27
     R.utils (>= 2.0.0),
28
-    DelayedMatrixStats (>= 1.3.1),
28
+    DelayedMatrixStats (>= 1.3.4),
29 29
     permute,
30 30
     limma,
31 31
     DelayedArray (>= 0.7.15),
... ...
@@ -79,30 +79,6 @@ setMethod("dimnames", "arrayRealizationSink", function(x) {
79 79
     dimnames(x@result_envir$result)
80 80
 })
81 81
 
82
-# Helper functions for setting up ArrayGrid instances --------------------------
83
-
84
-# NOTE: Copy of minfi:::colGrid()
85
-# TODO: Perhaps move this to DelayedMatrixStats?
86
-colGrid <- function(x) {
87
-    block_maxlen <- max(nrow(x),
88
-                        DelayedArray:::get_default_block_maxlength(type(x)))
89
-    spacings <- DelayedArray:::get_spacings_for_linear_capped_length_blocks(
90
-        refdim = dim(x),
91
-        block_maxlen = block_maxlen)
92
-    RegularArrayGrid(dim(x), spacings)
93
-}
94
-
95
-# NOTE: Copy of minfi:::rowGrid()
96
-# TODO: Perhaps move this to DelayedMatrixStats?
97
-rowGrid <- function(x) {
98
-    block_maxlen <- max(ncol(x),
99
-                        DelayedArray:::get_default_block_maxlength(type(x)))
100
-    spacings <- DelayedArray:::get_spacings_for_hypercube_capped_length_blocks(
101
-        refdim = dim(x),
102
-        block_maxlen = block_maxlen)
103
-    RegularArrayGrid(dim(x), spacings)
104
-}
105
-
106 82
 # Advanced block processing routines -------------------------------------------
107 83
 
108 84
 # NOTE: Copy of minfi:::blockApplyWithRealization()