29 dic 2011
Grafico de variables pareadas
Otra manera de hacer graficos elgantes con una extención de libreria ggplot2 que es GGally de R (extraído de SAS and R).
library(GGally)
ds = read.csv("http://www.math.smith.edu/r/data/help.csv")
ds$sex = as.factor(ifelse(ds$female==1, "female", "male"))
ds$housing = as.factor(ifelse(ds$homeless==1, "homeless", "housed"))
smallds = subset(ds, select=c("housing", "sex", "i1", "cesd"))
ggpairs(smallds, diag=list(continuous="density", discrete="bar"), axisLabels="show")
28 dic 2011
Estas en R y crees que es el infierno?
Otra de las miles guias sobre R http://www.burns-stat.com/pages/Tutor/R_inferno_090109.pdf
27 dic 2011
Moving data between R and Excel via the clipboard
Esta de gran utilidad, en realidad casi no lo utilizo pero lo intentare. http://www.johndcook.com/r_excel_clipboard.html
23 dic 2011
googleVis 0.2.13: new stepped area chart and improved geo charts
Esto en realidad puede ser de gran utilidad, yo intentare implemementar algo. http://www.r-bloggers.com/googlevis-0-2-13-new-stepped-area-chart-and-improved-geo-charts/?utm_source=twitterfeed&utm_medium=twitter&utm_campaign=Feed%3A+RBloggers+%28R+bloggers%29
21 dic 2011
Feliz Año con R.
http://experienceinstatistics.blogspot.com/2010/01/nuevo-ano-2010-con-r-y-con-bitacoras-en_05.html ,creo que con el tiempo implementare algo parecido para mi blog.
20 dic 2011
R y Latex.
Hace poco me preguntaron por automatización de informes con R, Sweave y LaTeX, y me he encontrado esto http://grserrano.es/docs/taller-informes-periodicos.pdf
19 dic 2011
Mapa de Antioquia en R
# El mapa con los municiopios se puede bajar de aqui http://sigotn.igac.gov.co/sigotn/default.aspx ##
library(maptools)
library(gplots)
library(RColorBrewer)
Municipios<- readShapePoly("Municipios.shp")
rgb.palette <- colorRampPalette(c("red", "orange","blue"), space = "Lab")
Antioquia<-Municipios[Municipios$NOM_DEPART=="ANTIOQUIA",]
plot(Antioquia,border="black",col=colorRampPalette(brewer.pal(9,"Blues"))(90),lwd=0.9,asp=0,axes =T, las = 2)
library(maptools)
library(gplots)
library(RColorBrewer)
Municipios<- readShapePoly("Municipios.shp")
rgb.palette <- colorRampPalette(c("red", "orange","blue"), space = "Lab")
Antioquia<-Municipios[Municipios$NOM_DEPART=="ANTIOQUIA",]
plot(Antioquia,border="black",col=colorRampPalette(brewer.pal(9,"Blues"))(90),lwd=0.9,asp=0,axes =T, las = 2)
Mapa de Colombia en R
library(maptools)
library(ggplot2)
library(lattice)
library(sp)
#El archivo .shp se puede bajar de http://www.gadm.org/country #
xx <- readShapePoly("COL_adm1.shp",IDvar="NAME_1", proj4string=CRS("+proj=longlat +ellps=clrk66"))
mapa<-function(xx,depto,sati)
{
col<-matrix(NA,ncol=2,nrow=length(depto))
color<-numeric(length(depto))
for(i in 1:length(depto)){
ifelse(sati[i]<73.3,color[i]<-"red", ifelse(sati[i]<85.5, color[i]<-"yellow", color[i]<-"darkgreen"))}
col[,1]<-depto;col[,2]<-color
col<-col[order(col[,1]),]
posi<-numeric(length(depto))
xxx <-xx[xx$NAME_1 %in%depto,]
plot(xx,border="gray",col="white",lwd=0.9,asp=0,axes =F, las = 1)
plot(xxx, border="gray", col=col[,2],lwd=1,asp=0,add=T)
text(coordinates(xxx), labels=sapply(slot(xxx, "polygons"),function(i) slot(i, "ID")), cex=0.65,font=2, pos=1, col="black")
}
mapa(xx,c("Norte de Santander","Quindío","Bolívar","Santander","Atlántico","Valle del Cauca","Cundinamarca","Antioquia"),c(83,78,76.9,75.6,74.3,73.8,70.1,68.6))
library(ggplot2)
library(lattice)
library(sp)
#El archivo .shp se puede bajar de http://www.gadm.org/country #
xx <- readShapePoly("COL_adm1.shp",IDvar="NAME_1", proj4string=CRS("+proj=longlat +ellps=clrk66"))
mapa<-function(xx,depto,sati)
{
col<-matrix(NA,ncol=2,nrow=length(depto))
color<-numeric(length(depto))
for(i in 1:length(depto)){
ifelse(sati[i]<73.3,color[i]<-"red", ifelse(sati[i]<85.5, color[i]<-"yellow", color[i]<-"darkgreen"))}
col[,1]<-depto;col[,2]<-color
col<-col[order(col[,1]),]
posi<-numeric(length(depto))
xxx <-xx[xx$NAME_1 %in%depto,]
plot(xx,border="gray",col="white",lwd=0.9,asp=0,axes =F, las = 1)
plot(xxx, border="gray", col=col[,2],lwd=1,asp=0,add=T)
text(coordinates(xxx), labels=sapply(slot(xxx, "polygons"),function(i) slot(i, "ID")), cex=0.65,font=2, pos=1, col="black")
}
mapa(xx,c("Norte de Santander","Quindío","Bolívar","Santander","Atlántico","Valle del Cauca","Cundinamarca","Antioquia"),c(83,78,76.9,75.6,74.3,73.8,70.1,68.6))
Suscribirse a:
Entradas
(
Atom
)