#library(showtext)
library(sysfonts)
# Familia
#font_families_google()
#Fonte
#font_add_google("Alegreya Sans", "aleg")
font_add_google("Satisfy", "Satisfy")
font_add_google('Great Vibes','Great Vibes')
body {
color: #198c7b;
background-color: #f7f5de;
font-family: 'Satisfy', cursive;
font-size: 22px;
}
p::first-letter {
font-size: 200%;
color: #116155;
line-height: 70px;
}
h1,h2,h3,h4,h5,h6 {
color: #116155;
font-family: 'Great Vibes', cursive;
}
.list-group-item.active, .list-group-item.active:hover, .list-group-item.active:focus {
background-color: #116155;
font-family: 'Great Vibes', cursive;
}
Esse é o site original.
extrafont::loadfonts(quiet = TRUE)
extrafont::fonttable() %>%
as_tibble() %>%
filter(grepl("Awesom", FamilyName)) %>%
select(afmfile, FullName, FamilyName, FontName)
## # A tibble: 4 x 4
## afmfile FullName FamilyName FontName
## <chr> <chr> <chr> <chr>
## 1 fontawesome-webfont.afm.gz FontAwesome Regular FontAwesome FontAwesome
## 2 FontAwesome.afm.gz FontAwesome FontAwesome FontAwesome
## 3 fontawesome-webfont.afm.gz FontAwesome Regular FontAwesome FontAwesome
## 4 FontAwesome.afm.gz FontAwesome FontAwesome FontAwesome
## [1] "rocket" "rocketchat"
## [1] "apple" "apple-pay" "cc-apple-pay" "lemon"
tibble(
food_group = factor(
c("Fruit", "Sandwiches", "Pizza"),
levels=c("Fruit", "Sandwiches", "Pizza")
),
consumption = c(5, 20, 52)
) -> xdf
ggplot(xdf, aes(label = food_group, values = consumption)) +
geom_pictogram(n_rows = 10, make_proportional = TRUE, color = "black") +
scale_label_pictogram(
name = NULL,
values = c(
Fruit = "apple-alt",
Sandwiches = "bread-slice",
Pizza = "pizza-slice"
)
) +
coord_equal() +
theme_ipsum_rc(grid="") +
theme_enhance_waffle() +
theme(legend.key.height = unit(2.25, "line")) +
theme(legend.text = element_text(size = 10, hjust = 0, vjust = 0.75))
ggplot(xdf, aes(label = food_group, values = consumption, color = food_group)) +
geom_pictogram(n_rows = 10, make_proportional = TRUE) +
scale_color_manual(
name = NULL,
values = c(
Fruit = "#a40000",
Sandwiches = "#c68958",
Pizza = "#ae6056"
)
) +
scale_label_pictogram(
name = NULL,
values = c(
Fruit = "apple-alt",
Sandwiches = "bread-slice",
Pizza = "pizza-slice"
)
) +
coord_equal() +
theme_ipsum_rc(grid="") +
theme_enhance_waffle() +
theme(legend.key.height = unit(2.25, "line")) +
theme(legend.text = element_text(size = 10, hjust = 0, vjust = 0.75))