
石长顺
WISE XMU

R is a free software programming language and software environment for statistical computing and graphics.
this is a video R_intro
Data analysis software
Programming language
Environment for statistical analysis
Open-source software project under GNU.
Community

R is very popular statistical programming language and platform to perform data mining, analysis, and visualization.


High popularity often means easier communication between you and other users because you "speak" the same language.
All of the standard data analysis tools are built right into the R language:
Accessing data in various formats.(.txt, .csv, .xlsx, .dta... )
traditional and modern statistical models(regression, ANOVA, GLM, tree models,timeseries etc)
fit <- lm(weight ~ height, data=women)
summary(fit)
##
## Call:
## lm(formula = weight ~ height, data = women)
##
## Residuals:
## Min 1Q Median 3Q Max
## -1.7333 -1.1333 -0.3833 0.7417 3.1167
##
## Coefficients:
## Estimate Std. Error t value Pr(>|t|)
## (Intercept) -87.51667 5.93694 -14.74 1.71e-09 ***
## height 3.45000 0.09114 37.85 1.09e-14 ***
## ---
## Signif. codes: 0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
##
## Residual standard error: 1.525 on 13 degrees of freedom
## Multiple R-squared: 0.991, Adjusted R-squared: 0.9903
## F-statistic: 1433 on 1 and 13 DF, p-value: 1.091e-14
par(mfrow=c(2,2))
plot(fit)
Visualizations act as a campfire around which we gather to tell stories.(Al Shalloway)
package {ggplot2}

package {googleVis}
there another video

package {quandmod}
library(quantmod)
getSymbols("USD/CNY",src="oanda",from="2015-01-01")
chartSeries(USDCNY, theme = "white")

package {PerformanceAnalytics}
library(PerformanceAnalytics)
data("edhec")
charts.PerformanceSummary(edhec[,c(9,12)])



R has a huge, rapidly increasing amount of online resources and vibrant community.
r (untill Oct. 4th, 2015)