library(ggplot2)
df.noxhprof <- read.delim("http://dl.dropbox.com/u/361076/ab-no-xhprof-cpumemflag.log",
sep = "\t")
df.noxhprof$test <- "no-xhprof"
df.xhprofnoflags <- read.delim("http://dl.dropbox.com/u/361076/ab-xhprof-noflags.log",
sep = "\t")
df.xhprofnoflags$test <- "no-flags"
df.xhprofmemflag <- read.delim("http://dl.dropbox.com/u/361076/ab-xhprof-memflag.log",
sep = "\t")
df.xhprofmemflag$test <- "mem-flag"
df.xhprofcpumemflag <- read.delim("http://dl.dropbox.com/u/361076/ab-xhprof-cpumemflag.log",
sep = "\t")
df.xhprofcpumemflag$test <- "cpumem-flag"
df <- rbind(df.noxhprof, df.xhprofnoflags, df.xhprofmemflag, df.xhprofcpumemflag)
summary(df.noxhprof$ttime)
## Min. 1st Qu. Median Mean 3rd Qu. Max.
## 90 100 100 104 110 120
summary(df.xhprofnoflags$ttime)
## Min. 1st Qu. Median Mean 3rd Qu. Max.
## 120 130 130 131 130 150
summary(df.xhprofmemflag$ttime)
## Min. 1st Qu. Median Mean 3rd Qu. Max.
## 120 130 140 136 140 170
summary(df.xhprofcpumemflag$ttime)
## Min. 1st Qu. Median Mean 3rd Qu. Max.
## 160 170 180 176 180 210
ggplot(df, aes(factor(test), ttime, colour = test)) + geom_boxplot() + geom_jitter(alpha = 0.5)
ggplot(df, aes(ttime, fill = test)) + geom_density(alpha = 0.5) + facet_wrap(~test,
ncol = 1)