... | ... |
@@ -160,6 +160,8 @@ plotDecontXMarkerPercentage <- function(x, markers, groupClusters = NULL, |
160 | 160 |
exactMatch = TRUE, by = "rownames", |
161 | 161 |
ncol = round(sqrt(length(markers))), |
162 | 162 |
labelBars = TRUE, labelSize = 3) { |
163 |
+ cellTypeLabels <- percent <- NULL # fix check note |
|
164 |
+ |
|
163 | 165 |
legend <- "none" |
164 | 166 |
# Check that list arguments are named |
165 | 167 |
if (!is(markers, "list") || is.null(names(markers))) { |