Browse code

allow for equal but not identical dim

git-svn-id: file:///home/git/hedgehog.fhcrc.org/bioconductor/trunk/madman/Rpacks/Biobase@121765 bc3139a8-67e5-0310-9ffc-ced21a209358

Martin Morgan authored on 05/10/2016 00:40:57
Showing 3 changed files

... ...
@@ -1,6 +1,6 @@
1 1
 Package: Biobase
2 2
 Title: Biobase: Base functions for Bioconductor
3
-Version: 2.33.3
3
+Version: 2.33.4
4 4
 Author: R. Gentleman, V. Carey, M. Morgan, S. Falcon
5 5
 Description: Functions that are needed by many other packages or which
6 6
         replace R functions.
... ...
@@ -37,7 +37,7 @@ setMethod("initialize", "ExpressionSet",
37 37
     dimConflict <- function(dimNames, okNames, dim) {
38 38
         nm <- lapply(dimNames, "[[", dim)
39 39
         isConflict <- !sapply(nm, function(x, y) {
40
-            is.null(x) || all.equal(x, y, check.attr=FALSE)
40
+            is.null(x) || isTRUE(all.equal(x, y, check.attr=FALSE))
41 41
         }, okNames[[dim]])
42 42
         isNamed <- sapply(lapply(nm, names), length) > 0
43 43
         isNull <- sapply(nm, is.null)
... ...
@@ -446,7 +446,7 @@ assayDataElement <- function(object, elt) assayData(object)[[elt]]
446 446
     if (!is.null(value)) {
447 447
         dimvalue <- dim(value)
448 448
         dimobj <- dim(obj)[seq_along(dimvalue)]
449
-        if (!identical(unname(dimvalue), unname(dimobj)))
449
+        if (!isTRUE(all.equal(unname(dimvalue), unname(dimobj))))
450 450
             stop("object and replacement value have different dimensions")
451 451
     }
452 452