library(ggplot2)
df.noxhprof <- read.delim("http://dl.dropbox.com/u/361076/ab-no-xhprof-2.log",
sep = "\t")
df.noxhprof$test <- "no-xhprof"
df.xhprof <- read.delim("http://dl.dropbox.com/u/361076/ab-xhprof-2.log", sep = "\t")
df.xhprof$test <- "xhprof"
summary(df.xhprof$ttime)
## Min. 1st Qu. Median Mean 3rd Qu. Max.
## 250 260 260 264 270 360
summary(df.noxhprof$ttime)
## Min. 1st Qu. Median Mean 3rd Qu. Max.
## 130 140 140 146 150 340
df2 <- rbind(df.xhprof, df.noxhprof)
df2$fcalls <- 34219
df.noxhprof <- read.delim("http://dl.dropbox.com/u/361076/ab-no-xhprof-3.log",
sep = "\t")
df.noxhprof$test <- "no-xhprof"
df.xhprof <- read.delim("http://dl.dropbox.com/u/361076/ab-xhprof-3.log", sep = "\t")
df.xhprof$test <- "xhprof"
df3 <- rbind(df.xhprof, df.noxhprof)
df3$fcalls <- 48641
summary(df.xhprof$ttime)
## Min. 1st Qu. Median Mean 3rd Qu. Max.
## 330 340 340 347 350 540
summary(df.noxhprof$ttime)
## Min. 1st Qu. Median Mean 3rd Qu. Max.
## 160 170 170 179 180 440
df.noxhprof <- read.delim("http://dl.dropbox.com/u/361076/ab-no-xhprof-4.log",
sep = "\t")
df.noxhprof$test <- "no-xhprof"
df.xhprof <- read.delim("http://dl.dropbox.com/u/361076/ab-xhprof-4.log", sep = "\t")
df.xhprof$test <- "xhprof"
df4 <- rbind(df.xhprof, df.noxhprof)
df4$fcalls <- 63209
summary(df.xhprof$ttime)
## Min. 1st Qu. Median Mean 3rd Qu. Max.
## 400 418 420 426 430 620
summary(df.noxhprof$ttime)
## Min. 1st Qu. Median Mean 3rd Qu. Max.
## 190 200 210 210 210 460
df.noxhprof <- read.delim("http://dl.dropbox.com/u/361076/ab-no-xhprof-5.log",
sep = "\t")
df.noxhprof$test <- "no-xhprof"
df.xhprof <- read.delim("http://dl.dropbox.com/u/361076/ab-xhprof-5.log", sep = "\t")
df.xhprof$test <- "xhprof"
df5 <- rbind(df.xhprof, df.noxhprof)
df5$fcalls <- 77870
summary(df.xhprof$ttime)
## Min. 1st Qu. Median Mean 3rd Qu. Max.
## 480 500 510 511 510 790
summary(df.noxhprof$ttime)
## Min. 1st Qu. Median Mean 3rd Qu. Max.
## 220 240 240 248 250 460
df <- rbind(df2, df3, df4, df5)
ggplot(df, aes(factor(test), ttime, colour = factor(fcalls))) + geom_boxplot() +
geom_jitter(alpha = 0.5)
ggplot(df, aes(ttime, fill = test)) + geom_density(alpha = 0.5) + facet_wrap(~fcalls,
ncol = 1)