... | ... |
@@ -203,9 +203,9 @@ runPipeline <- function( datasets, alternatives, pipelineDef, comb=NULL, |
203 | 203 |
res <- lapply(resfiles, readRDS) |
204 | 204 |
errs <- lapply(res, FUN=function(x) x$errors) |
205 | 205 |
if(length(unlist(errs))>0){ |
206 |
- errs <- errs[!sapply(errs,is.null)] |
|
206 |
+ errs <- errs[!vapply(errs, FUN.VALUE=logical(1L), FUN=is.null)] |
|
207 | 207 |
errs <- lapply(errs, .removeRedundantErrors) |
208 |
- errs <- data.frame(dataset=rep(names(errs), sapply(errs,length)), |
|
208 |
+ errs <- data.frame(dataset=rep(names(errs), lengths(errs)), |
|
209 | 209 |
step=unlist(errs)) |
210 | 210 |
row.names(errs) <- NULL |
211 | 211 |
message(" |
... | ... |
@@ -9,4 +9,7 @@ Changes in version 0.99.23 (2020-04-21) |
9 | 9 |
+ Standardized results heatmaps for any PipelineDefinition |
10 | 10 |
|
11 | 11 |
Changes in version 0.99.27 (2020-04-29) |
12 |
-* the plotting functions for the scRNAseq clustering pipeline (`scrna_evalPlot_DR` and `scrna_evalPlot_clust`) have been replaced by more flexible, pipeline-generic functions (`evalHeatmap`) and a silhouette-specific plotting function (`scrna_evalPlot_silh`). The general heatmap coloring scheme has also been changed to make meaningful changes clearer. |
|
12 |
++ the plotting functions for the scRNAseq clustering pipeline (`scrna_evalPlot_DR` and `scrna_evalPlot_clust`) have been replaced by more flexible, pipeline-generic functions (`evalHeatmap`) and a silhouette-specific plotting function (`scrna_evalPlot_silh`). The general heatmap coloring scheme has also been changed to make meaningful changes clearer. |
|
13 |
+ |
|
14 |
+Changes in version 0.99.43 (2020-07-20) |
|
15 |
++ there is no the possibility to continue runs despite errors, and enlarged merging capacities |