Carregamento de base de dados

load("C:/Users/barba/Desktop/Base_de_dados-master/df_pokemon.RData")
View(df)
names(df)
##  [1] "id"              "pokemon"         "species_id"      "height"         
##  [5] "weight"          "base_experience" "type_1"          "type_2"         
##  [9] "attack"          "defense"         "hp"              "special_attack" 
## [13] "special_defense" "speed"           "color_1"         "color_2"        
## [17] "color_f"         "egg_group_1"     "egg_group_2"     "url_image"      
## [21] "x"               "y"

Desvio-padrão

var(df$attack)
## [1] 837.3524
sd(df$attack)
## [1] 28.93704
mean(df$attack)
## [1] 74.85376

Tabelas Qualitativa Vs Quantitativa

library(dplyr)
## 
## Attaching package: 'dplyr'
## The following objects are masked from 'package:stats':
## 
##     filter, lag
## The following objects are masked from 'package:base':
## 
##     intersect, setdiff, setequal, union
library(flextable)
library(reactable)


df %>% select(attack,type_2) %>%
  group_by(type_2) %>% 
  summarise(MEDIA=round(mean(attack),2),DESVIO_PADRAO=round(sd(attack),2)) %>%
  flextable() %>% theme_tron_legacy()
df %>% select(attack,type_2) %>%
  group_by(type_2) %>%
  summarise(minimo=min(attack),
            primeiro_quartil=quantile(attack,probs=0.25),
            mediana=median(attack),
            terceiro_quartil=quantile(attack,probs=0.75),
            maximo=max(attack)) %>%
  flextable() %>% theme_tron_legacy()

Box-plot

par(bg="#32a1d9")
boxplot(attack~type_2, data = df,
        col=c("#250c57","#7447cc","#5c15e8","#b595f5","#200b4a"),
        las = 2,
        main= "Boxplot - Ataque por tipo 2 de pokémon")

Conclusão

Podemos analisar que o desvio-padrão de ataque por tipo 2 de Pokémons se mantem na faixa entre 20 a 30, salva as poucas exceções. Já em relação, a média de ataques já temos uma variação maior muito maior.

No box-plot, podemos ver a presença outliers, indicando que existem valores discrepantes (no caso, nos tipos voadores, elétricos e psiquicos).

Ainda no box-plot, podemos analisar que os valores dos atauqes são bastante assimétricos.