Closed
Description
I have all the warnPartialMatch*
options set to TRUE
in my .Rprofile
. Every time I use ggsave()
I get this warning. I took at look at plot_dev() and couldn't quickly determine if file
(vs filename
) is necessary for some devices? But for png()
at least, it would be nice if this line was dev(filename = filename, width = dim[1], height = dim[2], ...)
.
library(ggplot2)
options(warnPartialMatchArgs = TRUE)
p <- ggplot(iris, aes(x = Petal.Length, y = Sepal.Width)) + geom_point()
ggsave("iris.png", p)
#> Saving 7 x 5 in image
#> Warning in grDevices::png(..., res = dpi, units = "in"): partial argument
#> match of 'file' to 'filename'
Created on 2017-12-01 by the reprex package (v0.1.1.9000).