Flow map(Travel Path) Using Lat and Long in R

前端 未结 5 1728
臣服心动
臣服心动 2021-01-19 07:55

I am trying to plot flow map (for singapore) . I have Entry(Lat,Long) and Exit (Lat,long). I am trying to map the flow from entry to exit in singapore map.

s         


        
相关标签:
5条回答
  • 2021-01-19 08:36

    I've also written the mapdeck library to make visualisations like this more appealing*

    library(mapdeck)
    
    set_token("MAPBOX_TOKEN")  ## set your mapbox token here
    
    df$Exit_Station_Lat <- as.numeric(as.character(df$Exit_Station_Lat))
    df$Exit_Station_Long <- as.numeric(as.character(df$Exit_Station_Long))
    
    mapdeck(
      style = mapdeck_style('dark')
      , location = c(104, 1)
      , zoom = 8
      , pitch = 45
    ) %>%
      add_arc(
        data = df
        , origin = c("Entry_Station_Long", "Entry_Station_Lat")
        , destination = c("Exit_Station_Long", "Exit_Station_Lat")
        , layer_id = 'arcs'
        , stroke_from_opacity = 100
        , stroke_to_opacity = 100
        , stroke_width = 3
        , stroke_from = "#ccffff"
        , stroke_to = "#ccffff"
      )
    

    *subjectively speaking

    0 讨论(0)
  • 2021-01-19 08:41

    Just realized that the original solution usin geom_path was more complicated than necessary. geom_segmentworks without changing the data:

    require(ggplot2)
    require(ggmap)
    basemap <- get_map("Singapore",
                       source = "stamen",
                       maptype = "toner",
                       zoom = 11)
    
    g = ggplot(a)
    map = ggmap(basemap, base_layer = g)
    map = map + coord_cartesian() +
          geom_curve(size = 1.3,
                     aes(x=as.numeric(Entry_Station_Long),
                         y=as.numeric(Entry_Station_Lat),
                         xend=as.numeric(as.character(Exit_Station_Long)),
                         yend=as.numeric(as.character(Exit_Station_Lat)),
                         color=as.factor(token_id)))
    map
    

    This solution leverages Draw curved lines in ggmap, geom_curve not working to implement curved lines on a map.

    ggmaps used for simplicity - for more ambitious projects I would recommend leaflet.

    Below the solution using a long data format with some prior data wrangling. It also uses straight lines instead of the curves above.

    a %>%
      mutate(path = row_number()) -> a
    
    origin = select(a,token_id,Entry_Station_Lat,Entry_Station_Long,path)
    origin$type = "origin"
    dest = select(a,token_id,Exit_Station_Lat,Exit_Station_Long,path)
    dest$type = "dest"
    
    colnames(origin) = c("id","lat","long","path","type")
    colnames(dest) = c("id","lat","long","path","type")
    complete = rbind(origin,dest)
    complete %>% arrange(path,type) -> complete
    
    require(ggmap)
    basemap <- get_map("Singapore",
                       source = "stamen",
                       maptype = "toner",
                       zoom = 11)
    
    g = ggplot(complete, aes(x=as.numeric(long),
                             y=as.numeric(lat)))
    map = ggmap(basemap, base_layer = g)
    
    map + geom_path(aes(color = as.factor(id)),
                    size = 1.1)
    

    0 讨论(0)
  • 2021-01-19 08:49

    I would like to leave an alternative approach for you. What you can do is to restructure your data. Right now you have two columns for entry stations and the other two for exit stations. You can create one column for long, and another for lat by combing these columns. The trick is to use rbind() and c().

    Let's have a look of this simple example.

    x <- c(1, 3, 5)
    y <- c(2, 4, 6)
    c(rbind(x, y))
    
    #[1] 1 2 3 4 5 6
    

    Imagine x is long for entry stations and y for exit stations. 1 is longitude for a starting point. 2 is longitude where the first journey ended. As far as I can see from your sample data, it seems that 3 is identical 2. You could remove duplicated data points for each token_id. If you have a large set of data, perhaps this is something you want to consider. Back to the main point, you can create a column with longitude in the sequence you want with the combination of the two functions. Since you said you have date information, make sure you order the data by date. Then, the sequence of each journey appears in the right way in tmp. You want to do this with latitude as well.

    Now we look into your sample data. It seems that Exit_Station_Lat and Exit_Station_Long are in factor. The first operation is to convert them to numeric. Then, you apply the method above and create a data frame. I called your data mydf.

    library(dplyr)
    library(ggplot2)
    library(ggalt)
    library(ggthemes)
    library(raster)
    
    mydf %>%
    mutate_at(vars(Exit_Station_Lat: Exit_Station_Long),
              funs(as.numeric(as.character(.)))) -> mydf
    
    group_by(mydf, token_id) %>%
    do(data.frame(long = c(rbind(.$Entry_Station_Long,.$Exit_Station_Long)),
                  lat = c(rbind(.$Entry_Station_Lat, .$Exit_Station_Lat))
                 )
       ) -> tmp
    

    Now let's get a map data from GADM. You can download data using the raster package.

    getData(name = "GADM", country = "singapore", level = 0) %>%
    fortify -> singapore
    

    Finally, you draw a map. The key thing is to use group in aes in geom_path(). I hope this will let you move forward.

    ggplot() +
    geom_cartogram(data = singapore,
                   aes(x = long, y = lat, map_id = id),
                   map = singapore) +
    geom_path(data = tmp,
              aes(x = long, y = lat, group = token_id,
              color = as.character(token_id)),
              show.legend = FALSE) +
    theme_map() 
    

    0 讨论(0)
  • 2021-01-19 08:50

    If you want to plot it on an actual Google Map, and recreate the style of your linked map, you can use my googleway package that uses Google's Maps API. You need an API key to use their maps

    library(googleway)
    
    df$Exit_Station_Lat <- as.numeric(as.character(df$Exit_Station_Lat))
    df$Exit_Station_Long <- as.numeric(as.character(df$Exit_Station_Long))
    
    df$polyline <- apply(df, 1, function(x) {
        lat <- c(x['Entry_Station_Lat'], x['Exit_Station_Lat'])
        lon <- c(x['Entry_Station_Long'], x['Exit_Station_Long'])
        encode_pl(lat = lat, lon = lon)
    })
    
    mapKey <- 'your_api_key'
    
    style <- '[ { "stylers": [{ "visibility": "simplified"}]},{"stylers": [{"color": "#131314"}]},{"featureType": "water","stylers": [{"color": "#131313"},{"lightness": 7}]},{"elementType": "labels.text.fill","stylers": [{"visibility": "on"},{"lightness": 25}]}]'
    
    google_map(key = mapKey, style = style) %>%
        add_polylines(data = df, 
          polyline = "polyline", 
          mouse_over_group = "Entry_Station_Lat",
          stroke_weight = 0.7,  
          stroke_opacity = 0.5, 
          stroke_colour = "#ccffff")
    


    Note, to recreate the map using flight data, see the example given in ?add_polylines


    You can also show other types of routes, for example, driving between the locations by using Google's Directions API to encode the driving routes.

    df$drivingRoute <- lst_directions <- apply(df, 1, function(x){
        orig <- as.numeric(c(x['Entry_Station_Lat'], x['Entry_Station_Long']))
        dest <- as.numeric(c(x['Exit_Station_Lat'], x['Exit_Station_Long']))
    
        dir <- google_directions(origin = orig, destination = dest, key = apiKey)
        dir$routes$overview_polyline$points
    })
    
    
    google_map(key = mapKey, style = style) %>%
        add_polylines(data = df, 
          polyline = "drivingRoute", 
          mouse_over_group = "Entry_Station_Lat",
          stroke_weight = 0.7,  
          stroke_opacity = 0.5, 
          stroke_colour = "#ccffff")
    

    0 讨论(0)
  • 2021-01-19 08:56

    Alternative answer using leaflet and geosphere

    #get Packages
    require(leaflet)
    require(geosphere)
    
    #format data
    a$Entry_Station_Long = as.numeric(as.character(a$Entry_Station_Long))
    a$Entry_Station_Lat = as.numeric(as.character(a$Entry_Station_Lat))
    a$Exit_Station_Long = as.numeric(as.character(a$Exit_Station_Long))
    a$Exit_Station_Lat = as.numeric(as.character(a$Exit_Station_Lat))
    a$id = as.factor(as.numeric(as.factor(a$token_id)))
    
    #create some colors
    factpal <- colorFactor(heat.colors(30), pathList$id)
    
    #create a list of interpolated paths
    pathList = NULL
    for(i in 1:nrow(a))
    {
    tmp = gcIntermediate(c(a$Entry_Station_Long[i],
                     a$Entry_Station_Lat[i]),
                   c(a$Exit_Station_Long[i],
                     a$Exit_Station_Lat[i]),n = 25,
                   addStartEnd=TRUE)
    tmp = data.frame(tmp)
    tmp$id = a[i,]$id
    tmp$color = factpal(a[i,]$id)
    pathList = c(pathList,list(tmp))
    }
    
    #create empty base leaflet object
    leaflet() %>% addTiles() -> lf
    
    #add each entry of pathlist to the leaflet object
    for (path in pathList)
    {
      lf %>% addPolylines(data = path,
                          lng = ~lon, 
                          lat = ~lat,
                          color = ~color) -> lf
    
    }
    #show output
    lf
    

    Note that as I mentioned before there is no way of geosphering the paths in such a small locality - the great circles are effectively straight lines. If you want the rounded edges for sake of aesthetics you may have to use the geom_curve way described in my other answer.

    0 讨论(0)
提交回复
热议问题