Column

flutuação das atividades relacionadas a Covid-19

Column

Estimativa de pessoas atendidas por categoria de dispesa

Chart C

---
title: "Análise dados Covid FAS"
Author: "Vinicius Bertin"
output: 
  flexdashboard::flex_dashboard:
    orientation: columns
    vertical_layout: fill
    theme: journal
    source_code: embed
---

```{r setup, include=FALSE}
library(flexdashboard)
library(ggplot2)
library(plotly)
library(readr)
covid_teste=read.csv("covid_teste.csv")
covid_teste3=read.csv("covid_teste3.csv")
covid_teste2=read.csv("covid_teste2.csv")
```



## Column {data-width=350}

### flutuação das atividades relacionadas a Covid-19

```{r}
j=ggplot(data=covid_teste, aes(x=MUNICÍPIO.DE.ATENDIMENTO, y=pessoas_atendidas, fill=CATEGORIA.DE.DESPESAS)) +
  geom_bar(stat="identity")+
  xlab("")+
  ylab("Estimativa n de pessoas")+
  theme(axis.text=element_text( 
    angle =, 
    color=, 
    size=4, 
    face=3,
    ),legend.position="none")
h=j+ aes(stringr::str_wrap(MUNICÍPIO.DE.ATENDIMENTO, 100),pessoas_atendidas)+ xlab(NULL)+coord_flip()
ggplotly(h)


```

Column {data-width=350}
-----------------------------------------------------------------------

### Estimativa de pessoas atendidas por categoria de dispesa

```{r}
klm=ggplot(data=covid_teste3, aes(x=CATEGORIA.DE.DESPESAS, y=pessoas_atendidas, fill=CATEGORIA.DE.DESPESAS)) +
  geom_bar(stat="identity")+
  xlab("")+
  ylab("Estimativa de pessoas atendidas")+
  theme(axis.text=element_text( 
    angle =20, 
    color=, 
    size=6, 
    face=3))+
  theme(legend.position="none")
ggplotly(klm)
```

### Chart C

```{r}

covid_teste2$data=as.Date(covid_teste2$data)
p <- ggplot(covid_teste2, aes(x=data, y=n_atividades)) +
  geom_line() + 
  xlab("")+ ylab("número de atividades")+
  scale_x_date(date_breaks = "months" , date_labels = "%b-%y")+
  theme(axis.text=element_text( 
    angle =90, 
    color=, 
    size=9, 
    face=3))

ggplotly(p)
```