library(lattice)
data <- read.table('NC_000913.tab', header = TRUE)
lm <- lm(time ~ k, data)
xyplot(time ~ k, data, type = c('p', 'r'),
panel = function(...) {
panel.xyplot(...)
panel.text(data$k[1], lm$coefficients[1],
paste('Intercept, Slope', toString(lm$coefficients), sep='\n'))
},
xlim = c(0, 1.1*max(data$k)),
ylim = c(0, 1.1*max(data$time)),
main = 'abyss-dbgfm NC_000913 Time vs. k',
xlab = 'Size of a k-mer',
ylab = 'Time (s)')