I want to check whether the graph made by rCharts package is uploaded correctly or not.
library(rCharts)
hair_eye_male = subset(as.data.frame(HairEyeColor), Sex == "Male")
n1 <- nPlot(Freq ~ Hair, group = 'Eye',
data = hair_eye_male, type = 'multiBarChart'
)
n1$set(width = 600)
n1$show('iframesrc', cdn = TRUE)
Another method.
n1$save("def.html",standalone=TRUE)
My session info.
sessionInfo()
R version 3.1.2 (2014-10-31) Platform: i386-w64-mingw32/i386 (32-bit)
locale: [1] LC_COLLATE=Japanese_Japan.932 LC_CTYPE=Japanese_Japan.932
[3] LC_MONETARY=Japanese_Japan.932 LC_NUMERIC=C
[5] LC_TIME=Japanese_Japan.932
attached base packages: [1] stats graphics grDevices utils datasets methods base
other attached packages: [1] base64enc_0.1-2 rCharts_0.4.5 knitr_1.8
loaded via a namespace (and not attached): [1] digest_0.6.4 evaluate_0.5.5 formatR_1.0 grid_3.1.2
[5] htmltools_0.2.6 lattice_0.20-29 plyr_1.8.1 Rcpp_0.11.3
[9] RJSONIO_1.3-0 rmarkdown_0.3.11 stringr_0.6.2 tools_3.1.2
[13] whisker_0.3-2 yaml_2.1.13