Yingyu Hsieh
2015/01/24
View agent_results.txt - the dataset of client responding time
uniform distributed. Let's sort by time.Use pamk in fpc library
library(fpc)
pam.best <- pamk(x)
cluster.number <- pam.best$nc
active.thread <- round(length(x)/cluster.number, 1)
The best estimation number of clusters is 10
The active thread number is 12
set.seed(1024)
dc <- kmeans(sort(x), cluster.number)
plot(sort(x), xlab="Agent", ylab="Task durating (seconds)",
pch=20, col=dc$cluster)