Browse code

small bugfix

ataudt authored on 30/04/2020 06:59:54
Showing 1 changed files

... ...
@@ -81,7 +81,7 @@ removeCondition <- function(model, conditions) {
81 81
         removeconds <- paste0(paste0('-', conditions, '-'), collapse='|')
82 82
         keepconds <- grep(removeconds, colnames(maxPostInPeak), invert=TRUE, value=TRUE)
83 83
         maxPostInPeak <- maxPostInPeak[,keepconds]
84
-        if (is(maxPostInPeak,'matrix')) {
84
+        if (!is(maxPostInPeak,'matrix')) {
85 85
             maxPostInPeak <- matrix(maxPostInPeak, ncol=1, dimnames=list(NULL, keepconds))
86 86
         }
87 87
         model$bins$maxPostInPeak <- maxPostInPeak