gganimate: file_renderer failed to copy frames to the destination directory

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

Do you have gifski package installed on your computer? I think, you are coming across the same issue I've came across - https://github.com/thomasp85/gganimate/issues/363

2 Likes

Hello Marcell, mr mishabalyasin is correct: the source code for gganimate is on github
https://github.com/thomasp85/gganimate/blob/master/R/renderers.R

and in the comments of the source code it says:

" ' @details The gifski_renderer() is used unless otherwise specified in
#' [animate()] or in options('gganimate.renderer'). This renderer requires
#' both the gifski and png packages to be installed."

PROBLEM IS: it's not in the Xubuntu repository (synaptic) anymore? where is a good safe download for gifski?

1 Like

From looking at the help for gifski_renderer(), it seems to be part of gganimate...I also installed & loaded the PNG and gifski libraries, but still get the OP's error.

Do you get any errors/warnings when you load gifski (library(gifski))?

No, no errors thrown.

"no errors thrown", meaning you HAVE gifski installed via Rstudio environment? (i.e. Rstudio downloaded Rust compiler framework and compiled and "make" gifski)?

This topic was automatically closed 21 days after the last reply. New replies are no longer allowed.