
Genshin Impact Stats
Kaggle
database
genshin <- readr::read_csv("Genshin_Impact_All_Character_Stat.csv")
## Rows: 574 Columns: 10
## -- Column specification --------------------------------------------------------
## Delimiter: ","
## chr (5): Character, Element, Weapon, Main role, Ascension
## dbl (5): Lv, Rarity, Base HP, Base ATK, Base DEF
##
## i Use `spec()` to retrieve the full column specification for this data.
## i Specify the column types or set `show_col_types = FALSE` to quiet this message.
Personajes por elemento
gi_ep <- genshin %>%
ggplot(aes(x = "", y = n_distinct(Character), fill=Element)) +
geom_bar(width = 1, stat = "identity") +
coord_polar("y", start = 0) +
theme_void()
gi_ep

Personajes por Arma
gi_wp <- genshin %>%
ggplot(aes(x = "", y = n_distinct(Character), fill=Weapon)) +
geom_bar(width = 1, stat = "identity") +
coord_polar("y", start = 0) +
theme_void()
gi_wp

Vida Base de personajes por elemento
gi_hp <- genshin %>%
ggplot(aes(x= Element, y=`Base HP`, color=Element)) +
geom_point() +
theme_void()
gi_hp

Ataque Base de personajes por elemento
gi_atk <- genshin %>%
ggplot(aes(x= Element, y=`Base ATK`, color=Element)) +
geom_point() +
theme_void()
gi_atk

Defensa Base de personajes por elemento
gi_df <- genshin %>%
ggplot(aes(x= Element, y=`Base DEF`, color=Element)) +
geom_point() +
theme_void()
gi_df
