git-svn-id: file:///home/git/hedgehog.fhcrc.org/bioconductor/trunk/madman/Rpacks/Biobase@121765 bc3139a8-67e5-0310-9ffc-ced21a209358
... | ... |
@@ -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 |
|