Objectives :
- To create an interactive map of a transmission network model for Renewable European electricity system.
- The transmission network model is based on Jensen and Pinson (2017)
- The dataset is downloaded from https://zenodo.org/record/35177#.XVZqicszabI
Import all static data csv file
Transmission Network in EU zone: igraph
g = graph.data.frame(df_from_to, directed = FALSE, vertices = network_nodes_meta_df$ID)
project_layout = layout.norm(as.matrix(network_nodes_meta_df[,6:5]))
nodeigraph = plot.igraph(g, layout = project_layout, vertex.size=1.2,vertex.label=NA, vertex.color="red" )Create spatial object
## [1] "SpatialPointsDataFrame"
## attr(,"package")
## [1] "sp"
## class : Extent
## xmin : -9.0545
## xmax : 28.607
## ymin : 36.1828
## ymax : 57.0736
## class : SpatialPointsDataFrame
## features : 969
## extent : -9.0545, 28.607, 36.1828, 57.0736 (xmin, xmax, ymin, ymax)
## coord. ref. : +init=epsg:4124 +proj=longlat +ellps=bessel +towgs84=414.1,41.3,603.1,-0.855,2.141,-7.023,0 +no_defs
## variables : 13
## # A tibble: 969 x 13
## ID name country origin status primaryfuel secondaryfuel capacity
## <int> <fct> <fct> <int> <fct> <fct> <fct> <dbl>
## 1 2069 Alma~ Spain 162 No Da~ Nuclear Unknown 1957
## 2 2142 Aram~ France 486 Opera~ Fuel Oil Unknown 1400
## 3 2154 Arge~ France 457 No Da~ Hydro Unknown 47.5
## 4 2175 Asco~ Spain 124 No Da~ Nuclear Unknown 2060
## 5 2300 Bell~ France 357 Opera~ Nuclear Unknown 2726
## 6 2329 Bezn~ Switze~ 990 No Da~ Nuclear Unknown 760
## 7 2336 Bibl~ Germany 932 No Da~ Nuclear Unknown 2525
## 8 2366 Blay~ France 451 No Da~ Nuclear Unknown 3640
## 9 2368 Blé~ France 278 Opera~ Coal Fuel Oil 750
## 10 2385 Bohu~ Slovak~ 1215 No Da~ Nuclear Unknown 880
## # ... with 959 more rows, and 5 more variables: lincost <dbl>,
## # cyclecost <dbl>, minuptime <int>, mindowntime <int>,
## # minonlinecapacity <dbl>
Generator Database
begin.coord = data.frame(lon=df123[,4], lat=df123[,3])
end.coord = data.frame(lon=df123[,6], lat=df123[,5])
line_sf = vector("list", nrow(begin.coord))
for (i in seq_along(line_sf)){line_sf[[i]] = st_linestring(as.matrix(rbind(begin.coord[i, ], end.coord[i,])))}
line_sfc = st_sfc(line_sf, crs = '+proj=longlat +ellps=bessel +towgs84=414.1,41.3,603.1,-0.855,2.141,-7.023,0 +no_defs')
plot(line_sfc, col = 'blue')colorlist = list("#ffff00","#1a0000", "#ff8000", "#00ffff", "#ff00ff", "#ff0000" , "#800000", "#ffe6e6","#a9a9a9" )
mapviewOptions(basemaps = c( "OpenTopoMap", "CartoDB.Positron", "CartoDB.DarkMatter","OpenStreetMap", "Esri.WorldImagery" ) )
mapview(line_sfc, lwd = 1) +
mapview(generator_info, zcol = 'primaryfuel' , legend = TRUE, col.regions= colorlist , burst = TRUE, cex = 5)Jensen, Tue V., and Pierre Pinson. 2017. “RE-Europe, a Large-Scale Dataset for Modeling a Highly Renewable European Electricity System.” Scientific Data 4 (November): 170175. https://doi.org/10.1038/sdata.2017.175.