... | ... |
@@ -166,7 +166,8 @@ evaluateDimRed <- function(x, clusters=NULL, n=c(10,20,50), covars){ |
166 | 166 |
x <- Embeddings(x[["pca"]]) |
167 | 167 |
}else if(is(x, "SingleCellExperiment")){ |
168 | 168 |
if(is.character(covars)) |
169 |
- covars <- as.data.frame(colData(x)[,intersect(covars,colnames(colData(x))]) |
|
169 |
+ covars <- as.data.frame(colData(x)[, |
|
170 |
+ intersect(covars,colnames(colData(x)))]) |
|
170 | 171 |
if(is.null(clusters)) clusters <- x$phenoid |
171 | 172 |
x <- reducedDim(x, "PCA") |
172 | 173 |
}else{ |