Simple Example
suppressPackageStartupMessages(library(googleVis))
M<- gvisMotionChart(Fruits,"Fruit","Year",option=list(width=600,height=400))
plot(M)
## starting httpd help server ... done
#We can save as the html file to do the presentation
Profit~Country
G<- gvisGeoChart(Exports,locationvar="Country",colorvar="Profit",options=list(width=600,height=400))
plot(G)
Specifying a region.We can serch for the specific region on the developers documents
G2<- gvisGeoChart(Exports,locationvar="Country",colorvar="Profit",options=list(width=600,height=400,region="150"))
plot(G2)
Combining the multiple plots together
G<- gvisGeoChart(Exports,"Country","Profit",options=list(width=200,height=100))
T1<- gvisTable(Exports,options=list(width=200,height=270))
M<- gvisMotionChart(Fruits,"Fruit","Year",options=list(width=400,height=370))
GT<- gvisMerge(G,T1,horizontal=FALSE)
GTM<- gvisMerge(GT,M,horizontal=TRUE,tableOptions="bgcolor=\"#CCCCCC\"cellspacing=10")
plot(GTM)