---
title: "ggplotly geoms"
author: "Carson Sievert"
output:
flexdashboard::flex_dashboard:
orientation: rows
social: menu
source_code: embed
---
```{r setup, include=FALSE}
library(ggplot2)
library(plotly)
library(plyr)
library(flexdashboard)
library(rgdal)
library(stars)
mapa_1991 <- st_read("D:/0_PROYECTOS_2021/1_CEDIB/FINAL_2022/1_PELECHUCO/p1991.shp")
mapa_1992 <- st_read("D:/0_PROYECTOS_2021/1_CEDIB/FINAL_2022/1_PELECHUCO/p1992.shp")
mapa_1993 <- st_read("D:/0_PROYECTOS_2021/1_CEDIB/FINAL_2022/1_PELECHUCO/p1993.shp")
mapa_1994 <- st_read("D:/0_PROYECTOS_2021/1_CEDIB/FINAL_2022/1_PELECHUCO/p1994.shp")
z <- rbind(mapa_1991, mapa_1992,mapa_1993,mapa_1994)
######################## GRAFICOS
ggplot(z)+
#geom_sf(data=limite,color="blue") +
geom_sf(aes(fill=Categoria),size=0.09, color="white", linetype = 0.1)+
scale_fill_manual(values=c("Bosque Denso Andino Montano Húmedo"="#267300",
"Herbazal Graminoide Vivaz Altimontano Pluvionebular"="#70A800",
"Herbazal Graminoide Vivaz Bofedal Puneño"="#A8A800",
"Herbazal Graminoide Vivaz Puna semiárida"="#E6E600",
"Impacto"="#FF0000",
"Lagunas"="#005CE6",
"Mancha Urbana"="#734C00",
"Nevados"="#E1E1E1",
"Rios"="#73DFFF",
"Vegetación Dispersa Vivaz en pedregales Puna Altoandina"="#D1FF73"
))+
facet_wrap(~ Fecha, ncol = 2)+
theme(panel.background = element_blank(),legend.position = "bottom",
axis.title.x = element_blank(),
axis.title.y = element_blank(),
axis.text.x = element_blank(),
axis.text.y = element_blank(),
axis.ticks = element_blank())
```
geom_point
=======================================================================
Row
-----------------------------------------------------------------------