setwd("~/APAMI/2019/Aprendizagem/Kromberg")
library(tidyverse)
## -- Attaching packages --------------------------------------------------------------------------- tidyverse 1.2.1 --
## v ggplot2 3.1.0 v purrr 0.3.2
## v tibble 2.1.1 v dplyr 0.8.0.1
## v tidyr 0.8.3 v stringr 1.4.0
## v readr 1.3.1 v forcats 0.4.0
## -- Conflicts ------------------------------------------------------------------------------ tidyverse_conflicts() --
## x dplyr::filter() masks stats::filter()
## x dplyr::lag() masks stats::lag()
library(readxl)
library(ggplot2)
mydata<-read_xlsx("Avaliação.xlsx")
mydata2<-read_xlsx("satisfatorio.xlsx")
## New names:
## * `` -> ...3
mydata2 %>%
rename(perc = ...3) -> mydata2
ordemava<-c("Insatisfatório", "Pouco Satisfatório", "Regular", "Satisfatório", "Muito Satisfatório")
ggplot(data=mydata2, aes(x=Avaliacao,y=perc, fill=Avaliacao))+
geom_bar(stat="identity")+
scale_x_discrete(limits = ordemava)+
geom_text(aes( label = scales::percent(perc),
y= perc), vjust = -.5)+
theme_minimal()+
scale_y_continuous(labels=scales::percent)+
guides(fill=guide_legend(title=NULL))+
ylab(NULL)+
xlab(NULL)+
ggtitle("Avaliação dos Aprendizes \n 2019")+
theme(plot.title = element_text(size=20, hjust = 0.5))
