You signed in with another tab or window. Reload to refresh your session.You signed out in another tab or window. Reload to refresh your session.You switched accounts on another tab or window. Reload to refresh your session.Dismiss alert
I'm running Windows 11 and R 4.3.3 and RStudio 2023.12.1 with AGG as the default graphic engine. I can save a diagram produced with ggplot2 in svg-format if I use save_plot() from the sjPlot-package. But if I use ggsave() R crash with the message "R session arborted. R encountered a fatal error. The session was terminated". All packages are updated today (2025-01-22) so I'm using marquee v. 1.0.0 and ggplot2 v 3.5.1.
library(marquee)
library(grid)
library(ggplot2)
library(sjPlot)
md_text <-
"# Lorem Ipsum
Lorem ipsum dolor sit amet, *consectetur* adipiscing elit, sed do eiusmod tempor incididunt ut
labore et dolore magna **aliqua**."
cars <- sub("(\\w+)", "{.red ***\\1***}", rownames(mtcars))
dia <- ggplot(mtcars) + aes(disp, mpg, label = cars) +
geom_marquee(size = 4) +
ggtitle(md_text) +
theme(plot.title = element_marquee(size = 12, width = 1))
save_plot("test.svg", fig = dia, width=20, height=20) # Works
ggsave(dia, filename = "test.svg", width = 20, height = 20) # R crash.
ggsave produce a file that contains the message: " This page contains the following errors:
error on line 397 at column 802: AttValue: ' expected
Below is a rendering of the page up to the first error."
ggsave(dia, filename = "test.png") works without any problems.
The text was updated successfully, but these errors were encountered:
I observe a segfault when saving an svg image with svglite::svglite() but not when saving with grDevices::svg() e.g. ggsave(dia, filename = "test.svg", device = grDevices::svg) does not seem to segfault for me
I'm running Windows 11 and R 4.3.3 and RStudio 2023.12.1 with AGG as the default graphic engine. I can save a diagram produced with ggplot2 in svg-format if I use save_plot() from the sjPlot-package. But if I use ggsave() R crash with the message "R session arborted. R encountered a fatal error. The session was terminated". All packages are updated today (2025-01-22) so I'm using marquee v. 1.0.0 and ggplot2 v 3.5.1.
ggsave produce a file that contains the message: " This page contains the following errors:
error on line 397 at column 802: AttValue: ' expected
Below is a rendering of the page up to the first error."
ggsave(dia, filename = "test.png") works without any problems.
The text was updated successfully, but these errors were encountered: