XHProf file compression

library(ggplot2)

df <- read.csv("~/Dropbox/xhprof_gzip.csv")
df$filesize.kb <- df$filesize/1000

ggplot(df, aes(filesize.kb, time, color = compression, fill = compression)) + 
    geom_point(aes(alpha = 0.6, size = 5)) + scale_x_continuous(breaks = seq(0, 
    max(df$filesize.kb), by = 100)) + facet_wrap(~serialization, ncol = 1) + 
    xlab("filesize in kb") + ylab("time in ms")

plot of chunk unnamed-chunk-1


ggplot(df, aes(compression, filesize.kb, fill = serialization, alpha = 0.6)) + 
    geom_bar(position = "dodge")

plot of chunk unnamed-chunk-1


ggplot(df, aes(compression, time, fill = serialization, alpha = 0.6)) + geom_boxplot() + 
    coord_flip()

plot of chunk unnamed-chunk-1