@@ -54,7 +54,7 @@ ggsave <- function(filename, plot = last_plot(),
5454 filename <- file.path(path , filename )
5555 }
5656 old_dev <- dev.cur()
57- dev(file = filename , width = dim [1 ], height = dim [2 ], ... )
57+ dev(filename = filename , width = dim [1 ], height = dim [2 ], ... )
5858 on.exit(utils :: capture.output({
5959 grDevices :: dev.off()
6060 dev.set(old_dev )
@@ -120,16 +120,16 @@ plot_dev <- function(device, filename, dpi = 300) {
120120 if (is.function(device ))
121121 return (device )
122122
123- eps <- function (... ) {
124- grDevices :: postscript(... , onefile = FALSE , horizontal = FALSE ,
123+ eps <- function (filename , ... ) {
124+ grDevices :: postscript(file = filename , ... , onefile = FALSE , horizontal = FALSE ,
125125 paper = " special" )
126126 }
127127 devices <- list (
128128 eps = eps ,
129129 ps = eps ,
130- tex = function (... ) grDevices :: pictex(... ),
131- pdf = function (... , version = " 1.4" ) grDevices :: pdf(... , version = version ),
132- svg = function (... ) svglite :: svglite(... ),
130+ tex = function (filename , ... ) grDevices :: pictex(file = filename , ... ),
131+ pdf = function (filename , ... , version = " 1.4" ) grDevices :: pdf(file = filename , ... , version = version ),
132+ svg = function (filename , ... ) svglite :: svglite(file = filename , ... ),
133133 emf = function (... ) grDevices :: win.metafile(... ),
134134 wmf = function (... ) grDevices :: win.metafile(... ),
135135 png = function (... ) grDevices :: png(... , res = dpi , units = " in" ),
0 commit comments