We read every piece of feedback, and take your input very seriously.
To see all available qualifiers, see our documentation.
There was an error while loading. Please reload this page.
1 parent 4a81a56 commit bd06392Copy full SHA for bd06392
R/aaa.R
@@ -25,7 +25,6 @@ as_bigpts <- function(x, width = TRUE) {
25
type <- grid::unitType(x)
26
val <- as.numeric(x) * bigpts_mod[match(type, bigpts_mod_unit)]
27
if (anyNA(val)) {
28
- cat("MUST CALL GRID\n")
29
nas <- which(is.na(val))
30
val[nas] <- if (width) convertWidth(x[nas], "bigpts", TRUE) else convertHeight(x[nas], "bigpts", TRUE)
31
}
0 commit comments