# Carregar base de dados usado na pesquisa
library(readr)
Tema02 <- read_delim("C:/Users/Wellen Dutra/Downloads/Tema02.csv",
delim = ";", escape_double = FALSE, col_types = cols(TAXA_ENTRE_HOMENS = col_number(),
TAXA_ENTRE_MULHERES = col_number(),
TAXA_EM_ESCOLA_PUBLICA = col_number(),
TAXA_EM_ESCOLA_PRIVADA = col_number()),
trim_ws = TRUE)
# Carregar tabela para visualização dos dados
library (kableExtra)
kable(Tema02, row.names = FALSE)%>%
kable_styling( full_width = FALSE,bootstrap_options = c("striped", "hover", "condensed", "responsive"),
position = "center", fixed_thead = T) %>%
scroll_box(width = "900px", height = "600px")| ESTADO | REGIAO | TAXA_ENTRE_HOMENS | TAXA_ENTRE_MULHERES | TAXA_EM_ESCOLA_PUBLICA | TAXA_EM_ESCOLA_PRIVADA |
|---|---|---|---|---|---|
| Rondonia | Norte | 211 | 183 | 202 | 116 |
| Acre | Norte | 18 | 124 | 155 | 89 |
| Amazonas | Norte | 188 | 173 | 184 | 113 |
| Roraima | Norte | 199 | 159 | 185 | 98 |
| Para | Norte | 164 | 166 | 17 | 117 |
| Amapa | Norte | 215 | 202 | 216 | 132 |
| Tocantins | Norte | 202 | 169 | 191 | 94 |
| Maranhao | Nordeste | 203 | 155 | 185 | 104 |
| Piaui | Nordeste | 144 | 112 | 131 | 108 |
| Ceara | Nordeste | 203 | 171 | 201 | 92 |
| Rio Grande do Norte | Nordeste | 187 | 164 | 191 | 98 |
| Paraiba | Nordeste | 183 | 154 | 182 | 10 |
| Pernambuco | Nordeste | 213 | 178 | 208 | 119 |
| Alagoas | Nordeste | 218 | 162 | 199 | 143 |
| Sergipe | Nordeste | 149 | 126 | 145 | 108 |
| Bahia | Nordeste | 157 | 139 | 155 | 93 |
| Minas Gerais | Sudeste | 226 | 167 | 21 | 99 |
| Espirito Santo | Sudeste | 199 | 166 | 193 | 10 |
| Rio de Janeiro | Sudeste | 274 | 245 | 30 | 148 |
| Sao Paulo | Sudeste | 224 | 218 | 248 | 102 |
| Parana | Sul | 203 | 193 | 213 | 106 |
| Santa Catarina | Sul | 207 | 144 | 186 | 86 |
| Rio Grande do Sul | Sul | 173 | 143 | 168 | 87 |
| Mato Grosso do Sul | Centro-Oeste | 216 | 188 | 214 | 108 |
| Mato Grosso | Centro-Oeste | 209 | 172 | 199 | 101 |
| Goias | Centro-Oeste | 209 | 152 | 192 | 115 |
| Distrito Federal | Centro-Oeste | 187 | 215 | 232 | 104 |
library(readxl)
Dicionario <- read_excel("C:/Users/Wellen Dutra/Downloads/Dicionario.xlsx")
View(Dicionario)
# Carregar tabela para visualização do dicionário
library(DT)
datatable(Dicionario,iris, rownames = FALSE,
extensions = 'Buttons', options = list(dom = 'Bfrtip', buttons = I('colvis')))str(Tema02)## spec_tbl_df [27 x 6] (S3: spec_tbl_df/tbl_df/tbl/data.frame)
## $ ESTADO : chr [1:27] "Rondonia" "Acre" "Amazonas" "Roraima" ...
## $ REGIAO : chr [1:27] "Norte" "Norte" "Norte" "Norte" ...
## $ TAXA_ENTRE_HOMENS : num [1:27] 211 18 188 199 164 215 202 203 144 203 ...
## $ TAXA_ENTRE_MULHERES : num [1:27] 183 124 173 159 166 202 169 155 112 171 ...
## $ TAXA_EM_ESCOLA_PUBLICA: num [1:27] 202 155 184 185 17 216 191 185 131 201 ...
## $ TAXA_EM_ESCOLA_PRIVADA: num [1:27] 116 89 113 98 117 132 94 104 108 92 ...
## - attr(*, "spec")=
## .. cols(
## .. ESTADO = col_character(),
## .. REGIAO = col_character(),
## .. TAXA_ENTRE_HOMENS = col_number(),
## .. TAXA_ENTRE_MULHERES = col_number(),
## .. TAXA_EM_ESCOLA_PUBLICA = col_number(),
## .. TAXA_EM_ESCOLA_PRIVADA = col_number()
## .. )
## - attr(*, "problems")=<externalptr>
summary(Tema02)## ESTADO REGIAO TAXA_ENTRE_HOMENS TAXA_ENTRE_MULHERES
## Length:27 Length:27 Min. : 18.0 Min. :112.0
## Class :character Class :character 1st Qu.:185.0 1st Qu.:153.0
## Mode :character Mode :character Median :203.0 Median :166.0
## Mean :191.9 Mean :168.1
## 3rd Qu.:212.0 3rd Qu.:180.5
## Max. :274.0 Max. :245.0
## TAXA_EM_ESCOLA_PUBLICA TAXA_EM_ESCOLA_PRIVADA
## Min. : 17.0 Min. : 10.0
## 1st Qu.:161.5 1st Qu.: 93.5
## Median :191.0 Median :104.0
## Mean :172.0 Mean :100.0
## 3rd Qu.:201.5 3rd Qu.:114.0
## Max. :248.0 Max. :148.0
library(dplyr)##
## Attaching package: 'dplyr'
## The following object is masked from 'package:kableExtra':
##
## group_rows
## The following objects are masked from 'package:stats':
##
## filter, lag
## The following objects are masked from 'package:base':
##
## intersect, setdiff, setequal, union
library(flextable)##
## Attaching package: 'flextable'
## The following objects are masked from 'package:kableExtra':
##
## as_image, footnote
# Boxplot 1 - Evasão de meninos de 13 a 17 anos
boxplot(TAXA_ENTRE_HOMENS~REGIAO, data = Tema02,
col=c ("orange", "green"),
main= "Grafico de faltas de meninos por região",
ylab = "Taxa de meninos")#Boxplot 2 - Evasão de meninas de 13 a 17 anos
boxplot(TAXA_ENTRE_MULHERES~REGIAO, data = Tema02,
col=c ("yellow", "pink"),
main= "Grafico de faltas de meninas por região",
ylab = "Taxa de meninas")#Boxplot 3 - Evasão em escolas privadas
boxplot(TAXA_EM_ESCOLA_PRIVADA~REGIAO, data = Tema02,
col=c ("red", "blue"),
main= "Gráfico de faltas em escolas privada por região",
ylab= "Escolas Privadas")#Boxplot 4 - Evasão em escolas públicas
boxplot(TAXA_EM_ESCOLA_PUBLICA~REGIAO, data = Tema02,
col=c ("purple", "brown"),
main= "Gráfico de faltas em escolas públicas",
ylab= "Escolas Públicas")####Utilizaremos o diagrama de dispersão para comparar a evasão entre escolas Públicas e Privadas.
par(bg="lightyellow")
plot(Tema02$TAXA_EM_ESCOLA_PUBLICA, Tema02$TAXA_EM_ESCOLA_PRIVADA, pch=16, col="blue",
main = "Gráfico entre de faltas entre escolas Públicas e Privadas",
ylab = "Escolas Privadas", xlab = "Escolas Públicas")
abline(lsfit(Tema02$TAXA_EM_ESCOLA_PUBLICA, Tema02$TAXA_EM_ESCOLA_PRIVADA),col="darkred")cor(Tema02$TAXA_EM_ESCOLA_PUBLICA, Tema02$TAXA_EM_ESCOLA_PRIVADA)## [1] -0.1643802
selecao = c("TAXA_EM_ESCOLA_PUBLICA", "TAXA_EM_ESCOLA_PRIVADA")
cor_escola = cor(Tema02[,selecao])
cor_escola## TAXA_EM_ESCOLA_PUBLICA TAXA_EM_ESCOLA_PRIVADA
## TAXA_EM_ESCOLA_PUBLICA 1.0000000 -0.1643802
## TAXA_EM_ESCOLA_PRIVADA -0.1643802 1.0000000
library(corrplot)## corrplot 0.92 loaded
par(cex=0.92)
corrplot(cor_escola)corrplot(cor_escola, method = "number")https://educacaopublica.cecierj.edu.br/artigos/21/19/evasao-escolar-um-problema-que-se-perpetua-na-educacao-brasileira#:~:text=O%20estudo%20apresenta%20o%20problema,de%20pessoas%20sem%20atividade%20educacional.