Skip to content

Commit a85950c

Browse files
committed
More namespace issues
1 parent fd0eaec commit a85950c

File tree

4 files changed

+6
-6
lines changed

4 files changed

+6
-6
lines changed

R/geom-violin.r

Lines changed: 3 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -155,12 +155,12 @@ GeomViolin <- ggproto("GeomViolin", Geom,
155155
# Returns a data.frame with info needed to draw quantile segments.
156156
create_quantile_segment_frame <- function(data, draw_quantiles) {
157157
dens <- cumsum(data$density) / sum(data$density)
158-
ecdf <- approxfun(dens, data$y)
158+
ecdf <- stats::approxfun(dens, data$y)
159159
ys <- ecdf(draw_quantiles) # these are all the y-values for quantiles
160160

161161
# Get the violin bounds for the requested quantiles
162-
violin.xminvs <- (approxfun(data$y, data$xminv))(ys)
163-
violin.xmaxvs <- (approxfun(data$y, data$xmaxv))(ys)
162+
violin.xminvs <- (stats::approxfun(data$y, data$xminv))(ys)
163+
violin.xmaxvs <- (stats::approxfun(data$y, data$xmaxv))(ys)
164164

165165
# We have two rows per segment drawn. Each segments gets its own group.
166166
data.frame(

R/guide-legend.r

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -264,7 +264,7 @@ guide_geom.legend <- function(guide, layers, default_mapping) {
264264
}
265265

266266
# override.aes in guide_legend manually changes the geom
267-
data <- modifyList(data, guide$override.aes)
267+
data <- utils::modifyList(data, guide$override.aes)
268268

269269
list(
270270
draw_key = layer$geom$draw_key,

R/plot.r

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -141,7 +141,7 @@ print.ggplot <- function(x, newpage = is.null(vp), vp = NULL, ...) {
141141

142142
# Record dependency on 'ggplot2' on the display list
143143
# (AFTER grid.newpage())
144-
recordGraphics(
144+
grDevices::recordGraphics(
145145
requireNamespace("ggplot2", quietly = TRUE),
146146
list(),
147147
getNamespace("ggplot2")

R/save.r

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -74,7 +74,7 @@ plot_dim <- function(dim = c(NA, NA), scale = 1, units = c("in", "cm", "mm"),
7474
if (length(grDevices::dev.list()) == 0) {
7575
default_dim <- c(7, 7)
7676
} else {
77-
default_dim <- dev.size() * scale
77+
default_dim <- grDevices::dev.size() * scale
7878
}
7979
dim[is.na(dim)] <- default_dim[is.na(dim)]
8080
dim_f <- prettyNum(from_inches(dim), digits = 3)

0 commit comments

Comments
 (0)