ggplot(graphite_df, aes(date, value*19, colour=metric, alpha=0.4)) +
  geom_line() +
  theme(legend.position="bottom")
## Warning: Removed 4 rows containing missing values (geom_path).

plot of chunk unnamed-chunk-2

df %>%
  filter(metric %in% c("X.CPU", "X.usr", "X.system")) %>% 
  ggplot(aes(Time, value, colour=metric, alpha=0.4)) +
  geom_line() +
  ylab("% CPU") +
  ggtitle("CPU usage") +
  theme(legend.position="bottom") +
  facet_wrap(~metric, ncol=1)

plot of chunk unnamed-chunk-4

df %>%
  filter(metric == "RSS") %>% 
  ggplot(aes(Time, value/1024)) +
  geom_line() +
  ylab("RSS in mb") +
  ggtitle("Memory usage")

plot of chunk unnamed-chunk-4