使用shapefile的R等值线图

时间:2013-06-12 07:47:21

标签: r map ggplot2 gis

Hello stackoverflow社区!

有人可以帮助我,因为我在R中创建一个等值区域图时遇到了一些困难。到目前为止,我已经将LL信息分配给了我感兴趣的点,现在我想用“创建一个等值线图”。 cans“由高中区域(highdist_n83.shp.zip)在数据集(data.csv)中变量。我想知道的是如何使用每个地区的罐头总和正确填充地图。我提供了代码,它从dropbox和我想要使用的shape文件中提取样本数据文件。

修改 对不起,我忘了添加,当我只绘制形状文件时,我能够看到它通过ggplot呈现。但是,当我尝试使用“cans”变量的数量“填充”区域时,R会挂起一段时间,然后渲染看起来像原始形状上的大量线条。我想知道错误是否是由于以下可能的原因

  1. 形状文件不好
  2. 我可能会遇到合并数据框和形状文件的问题,因为我注意到合并文件中添加了其他行
  3. 某个区域有多所学校,使用ddply时我没有合并。
  4. 感谢您的时间!

    ###load R scripts from dropbox
    dropbox.eval <- function(x, noeval=F) {
    require(RCurl)
    intext <- getURL(paste0("https://dl.dropboxusercontent.com/",x), ssl.verifypeer = FALSE)
    intext <- gsub("\r","", intext)
    if (!noeval) eval(parse(text = intext), envir= .GlobalEnv)
    return(intext)
    }
    
    ##pull scripts from dropbox 
    dropbox.eval("s/wgb3vtd9qfc9br9/pkg.load.r")    
    dropbox.eval("s/tf4ni48hf6oh2ou/dropbox.r")
    
    ##load packages
    pkg.load(c(ggplot2,plyr,gdata,sp,maptools,rgdal,reshape2))
    
    ###setup data frames
    dl_from_dropbox("data.csv","dx3qrcexmi9kagx")
        data<-read.csv(file='data.csv',header=TRUE)
    
    ###prepare GIS shape and data for plotting
    dropbox.eval("s/y2jsx3dditjucxu/dlshape.r")     
    temp <- tempfile()
    dlshape(shploc="http://files.hawaii.gov/dbedt/op/gis/data/highdist_n83.shp.zip", temp)
    shape<- readOGR(".","highdist_n83") #HDOE high school districts  
    shape@proj4string 
    
    shape2<- spTransform(shape, CRS("+proj=longlat +datum=NAD83"))
    
    data.2<-ddply(data, .(year, schoolcode, longitude, latitude,NAME,HDist,SDist), summarise,
            total = sum(total),
            cans= sum(cans))
    
    coordinates(data.2) <-~longitude + latitude
    shape2.df<-fortify(shape2)
    mshape2.df<- merge(shape2.df,shape2@data, by.x="id", by.y="ID",all=TRUE)
    
    newdata <- merge(mshape2.df,data.2, by.x="NAME", by.y="NAME", all=TRUE)
    newdata  <- newdata [order(newdata $order),]
    
    ###choropleth map: 
    mapPlot <- ggplot(newdata,aes(x=long, y=lat,drop=FALSE)) +
    geom_polygon(aes(fill=cans, drop=FALSE), colour = "black", lwd = 1/9,na.rm=FALSE)
    + ggtitle("Total of Cans Across State")
    print(mapPlot)
    

1 个答案:

答案 0 :(得分:7)

强化shapefile时,最终会出现错误的ID。相反,根据shapefile的行名显式添加ID列,并使用它进行合并。您也没有告诉geom_polygon如何对data.frame中的行进行分组,因此它们都被绘制为一个连续重叠的自相交多边形。将组参数添加到geom_polygon。我还想使用RColorBrewer为地图选择漂亮的颜色(使用函数brewer.pal)。

试试这个:

require(RColorBrewer)
shape2@data$id <- rownames(shape2@data)
sh.df <- as.data.frame(shape2)
sh.fort <- fortify(shape2 , region = "id" )
sh.line<- join(sh.fort, sh.df , by = "id" )


mapdf <- merge( sh.line , data.2 , by.x= "NAME", by.y="NAME" , all=TRUE)
mapdf <- mapdf[ order( mapdf$order ) , ]

ggplot( mapdf , aes( long , lat ) )+
  geom_polygon( aes( fill = cans , group = id ) , colour = "black" )+
  scale_fill_gradientn( colours = brewer.pal( 9 , "Reds" ) )+
  coord_equal()

enter image description here