Hi guys!
My issue is connecting to gganimate, the goal is to create a gif file. I use R studio and Windows 10.
used the following code:
library(ggplot2)
library(gganimate)
theme_set(theme_bw())
library(gapminder)
head(gapminder)
p <- ggplot(
gapminder,
aes(x = gdpPercap, y=lifeExp, size = pop, colour = country)
) +
geom_point(show.legend = FALSE, alpha = 0.7) +
scale_color_viridis_d() +
scale_size(range = c(2, 12)) +
scale_x_log10() +
labs(x = "GDP per capita", y = "Life expectancy")
p
Myplot <- p + transition_time(year) +
labs(title = "Year: {frame_time}")
The error message is the following:
Warning message:
file_renderer failed to copy frames to the destination directory
Interesting is that, it creates jpg files, but it is really far from the goal.
Thank you for help in advance