Skip to content

Commit bd06392

Browse files
committed
Remove print debugging 🤦‍♂️
1 parent 4a81a56 commit bd06392

File tree

1 file changed

+0
-1
lines changed

1 file changed

+0
-1
lines changed

R/aaa.R

Lines changed: 0 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -25,7 +25,6 @@ as_bigpts <- function(x, width = TRUE) {
2525
type <- grid::unitType(x)
2626
val <- as.numeric(x) * bigpts_mod[match(type, bigpts_mod_unit)]
2727
if (anyNA(val)) {
28-
cat("MUST CALL GRID\n")
2928
nas <- which(is.na(val))
3029
val[nas] <- if (width) convertWidth(x[nas], "bigpts", TRUE) else convertHeight(x[nas], "bigpts", TRUE)
3130
}

0 commit comments

Comments
 (0)