but best to use just 11kV feeders within “mygeometry”
my_filtered_list <- st_intersects(mySubstations, JustNoosaLGA,sparse = FALSE)
Noosa_Substations <- mySubstations[my_filtered_list, ]
Noosa_Substations$MAX_KVA <- as.numeric(as.character(Noosa_Substations$MAX_KVA))
Noosa_Substations_no_geom <- Noosa_Substations %>% st_drop_geometry() %>% select(c(1,3,4,5,6))
datatable(Noosa_Substations_no_geom)
tmap_mode(mode = "view")
## tmap mode set to interactive viewing
tm <- tm_shape(JustNoosaLGA) + tm_polygons(col = "MAP_COLORS", alpha = 0.2, border.col = "darkmagenta") +
tm_shape(myOH_132kV)+tm_lines(col='red', lwd=12) +
# tm_shape(myUG_132kV)+tm_lines(col='orange',lwd=10)+ nothing to display !
tm_shape(myOH_110kV)+tm_lines(col='blue',lwd=10)+
tm_shape(myUG_110kV)+tm_lines(col='green',lwd=10) +
tm_shape(myOH_33kV)+tm_lines(col='purple',lwd=8) +
tm_shape(myUG_33kV)+tm_lines(col='pink',lwd=8) +
tm_shape(Noosa_myOH_11kV)+tm_lines(col='black',lwd=4) +
tm_shape(Noosa_myUG_11kV)+tm_lines(col='brown',lwd=4) +
tm_shape(myZoneSub)+tm_dots(size=0.1) +
tm_shape(Noosa_myOH_LV)+tm_lines(col='red',lwd=2) +
tm_shape(Noosa_myUG_LV)+tm_lines(col='orange',lwd=2) +
tm_shape(Noosa_Substations)+tm_dots(size=0.04)
# tm_shape(myPillars) +tm_dots(size=0,06, col = 'pink')
tm