Skip to content

Commit 4859dab

Browse files
committed
fix small note
1 parent ebf6fa7 commit 4859dab

File tree

1 file changed

+1
-1
lines changed

1 file changed

+1
-1
lines changed

R/utilities.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -940,7 +940,7 @@ compute_data_size <- function(data, size, default = 0.9,
940940
res <- vapply(res, resolution, FUN.VALUE = numeric(1), ...)
941941
res <- min(res, na.rm = TRUE)
942942
} else if (panels == "by") {
943-
res <- ave(data[[var]], data$PANEL, FUN = function(x) resolution(x, ...))
943+
res <- stats::ave(data[[var]], data$PANEL, FUN = function(x) resolution(x, ...))
944944
} else {
945945
res <- resolution(data[[var]], ...)
946946
}

0 commit comments

Comments
 (0)