diff --git a/.gitattributes b/.gitattributes
index e69de29..c9685d8 100644
--- a/.gitattributes
+++ b/.gitattributes
@@ -0,0 +1,4 @@
+*.R filter=lfs diff=lfs merge=lfs -text
+*.png filter=lfs diff=lfs merge=lfs -text
+*.csv filter=lfs diff=lfs merge=lfs -text
+*.jpg filter=lfs diff=lfs merge=lfs -text
diff --git a/zz_resto_organizar/code/001.imposto-nexojornal/ideal-nexografico.jpg b/zz_resto_organizar/code/001.imposto-nexojornal/ideal-nexografico.jpg
index 73753f4..f6f598a 100644
Binary files a/zz_resto_organizar/code/001.imposto-nexojornal/ideal-nexografico.jpg and b/zz_resto_organizar/code/001.imposto-nexojornal/ideal-nexografico.jpg differ
diff --git a/zz_resto_organizar/code/realdesign/plot_vis_ger.R b/zz_resto_organizar/code/realdesign/plot_vis_ger.R
index 40d10b3..4bba068 100644
--- a/zz_resto_organizar/code/realdesign/plot_vis_ger.R
+++ b/zz_resto_organizar/code/realdesign/plot_vis_ger.R
@@ -1,93 +1,3 @@
-library(ggtext)
-library(extrafont)
-library(ggplot2)
-# Painel - visão geral ----
-
-panel_vis_ger <-
- readr::read_csv(
- file = "data/realdesign/Visão geral personalizada.csv",
- skip = 2,
- ) |>
- dplyr::select(
- -"Código da moeda"
- )
-
-# tibble::view(panel_vis_ger)
-
-# gráfico ----
-
-d <-
- ggplot2::ggplot(
- data = panel_vis_ger,
- ggplot2::aes(x = Dia)
- ) +
- ggplot2::geom_line(
- ggplot2::aes(y = `Impr.`, color = "Impressões"),
- linewidth = 1.2,
- ) +
- ggplot2::geom_line(
- ggplot2::aes(y = `Interações`, color = "Interações"),
- linewidth = 1.2,
- ) +
- ggplot2::scale_y_continuous(
- breaks = seq(0, max(panel_vis_ger$`Impr.`), 50),
- expand = c(0, 0),
- ) +
- ggplot2::annotate(
- "text",
- x = min(panel_vis_ger$Dia),
- # y = seq(0, max(panel_vis_ger$`Impr.`), 50),
- y = seq(0, 250, 50),
- label = c("0", "50", "100", "150", "200", "250"),
- vjust = -.5,
- hjust = 0
- ) +
- ggplot2::scale_color_manual(
- values = c("Impressões" = "#ff8e01", "Interações" = "#1c88e3")
- ) +
- ggplot2::scale_x_date(expand = c(0, 0)) +
- ggplot2::labs(
- title = "Análise de desempenho dos
anúncios do Google Ads de 2024",
- caption = "Comparação de
-
- Impressõese
-
- Interações
de 14 de abril a 13 de maio."
- ) +
- ggplot2::theme(
- rect = element_rect(fill = "#ffffff"),
- text = element_text(family = "SF Compact"),
- axis.ticks.y = element_blank(),
- axis.ticks.x = element_line(color = "black", linewidth = 1, lineend = "round"),
- axis.title.y = element_blank(),
- axis.title.x = element_blank(),
- axis.text.y = element_blank(),
- axis.text.x = element_text(color = "#000029", size = 8, face = "bold"),
- axis.line.x.bottom = element_line(color = "black", linewidth = 1, lineend = "round"),
- legend.position = "top",
- legend.title = element_blank(),
- legend.text = element_markdown(),
- legend.key = element_blank(),
- legend.justification.top = "left",
- legend.margin = margin(t = 0, r = 2, b = -40, l = 2),
- panel.background = element_rect("#ffffff"),
- panel.grid = element_blank(),
- panel.grid.major.y = element_line(colour = "#000009", linetype = 2),
- plot.title = element_markdown(size = 10), # pacote ggtext - usar html em ggplot2
- plot.subtitle = element_markdown(size = 7), # pacote ggtext - usar html em ggplot2
- plot.caption = element_markdown(),
- # plot.margin = margin(t = 0, r = 0.5, b = 0, l = 0.5, unit = "cm"),
- plot.margin = margin(t = 0.6, r = 0.5, b = 0.6, l = 0.5, unit = "cm"),
- )
-
-
-# save ----
-d |>
- ggplot2::ggsave(
- filename = "plot_vis_ger_impr_click.png",
- device = "png",
- path = "graficos/construindo/realdesign",
- width = 1080,
- height = 1350,
- units = "px"
- )
+version https://git-lfs.github.com/spec/v1
+oid sha256:59f876ba87d044d3c19e8f07f605ab6c19d998bb0fa775c36599b8b48b7e6044
+size 3056
diff --git a/zz_resto_organizar/dicas/graficos.R b/zz_resto_organizar/dicas/graficos.R
index f30c6e7..938cd88 100644
--- a/zz_resto_organizar/dicas/graficos.R
+++ b/zz_resto_organizar/dicas/graficos.R
@@ -1,238 +1,3 @@
-library(ggplot2)
-
-# View(mtcars)
-
-str(mtcars)
-
-# link : https://www.nexojornal.com.br/grafico/2023/11/13/Absten%C3%A7%C3%A3o-do-Enem-2023-fica-pr%C3%B3xima-ao-percentual-de-2022
-ggplot(
- data = mtcars,
-) +
- geom_line(aes(x = mpg, y = disp), linewith = 1, color = "#0287FF") +
- geom_point(aes(x = mpg, y = disp), shape = 20, size = 4.5, color = "#FFFFFF") +
- geom_point(aes(x = mpg, y = disp), shape = 19, size = 1.5, color = "#0287FF") +
- theme_minimal()
-
-
-
-
-# EXEMPLO Gráfico com HTML ----
-library(ggplot2)
-library(ggtext)
-
-ggplot(iris, aes(Sepal.Length, Sepal.Width, color = Species)) +
- geom_point(size = 3) +
- scale_color_manual(
- name = NULL,
- values = c(setosa = "#0072B2", virginica = "#009E73", versicolor = "#D55E00"),
- labels = c(
- setosa = "I. setosa",
- virginica = "I. virginica",
- versicolor = "I. versicolor"
- )
- ) +
- labs(
- title = "**Fisher's *Iris* dataset**
- Sepal width vs. sepal length for three *Iris*
- species",
- x = "Sepal length (cm)", y = "Sepal width (cm)",
- caption = "Source: *Fisher's Iris dataset*"
- ) +
- theme_minimal() +
- theme(
- plot.title = element_markdown(lineheight = 1.1),
- legend.text = element_markdown(size = 11),
- plot.caption = element_markdown(size = 11)
- )
-
-
-
-
-# gráfico BARRAS ----
-dados <- data.frame(
- Categoria = c("A", "B", "C", "D"),
- Valor = c(30, 50, 20, 40)
-)
-
-
-ggplot(dados, aes(x = Categoria, y = Valor, fill = Categoria)) +
- geom_bar(stat = "identity") +
- guides(fill = FALSE) + # Remove a legenda
- scale_fill_manual(
- values = c(
- "A" = "#87CEFA",
- "B" = "#87CEFA",
- "C" = "#87CEFA",
- "D" = "#000080"
- )
- ) +
- theme_minimal()
-
-
-
-# COLUNAS - cores Diferentes ----
-dados <- data.frame(
- Variavel = rep(c("A", "B", "C", "D"), each = 2),
- Estado = rep(c("Antes", "Depois"), times = 4),
- Valor = c(30, 40, 50, 60, 20, 25, 40, 50)
-)
-
-cores <- c(
- "Antes_A" = "#2A6D98", "Depois_A" = "#45B5FD",
- "Antes_B" = "#2A6D98", "Depois_B" = "#45B5FD",
- "Antes_C" = "#2A6D98", "Depois_C" = "#45B5FD",
- "Antes_D" = "#1C4966", "Depois_D" = "#0000A0"
-)
-library(ggplot2)
-ggplot(dados, aes(x = Variavel, y = Valor, fill = paste0(Estado, "_", Variavel))) +
- geom_bar(stat = "identity", position = "dodge") +
- labs(title = "Gráfico Antes e Depois para Cada Variável", x = "Variável", y = "Valor") +
- scale_fill_manual(values = cores, guide = "none") +
- tema_nexo()
-
-
-
-
-# THEME NEXOS ----
-#' Tema inspirado nos graficos do Nexo Jornal
-#'
-#'
-#' @inheritParams ggplot2::theme_grey
-#' @family themes nexo
-#' @export
-#' @importFrom grid unit
-#' @note
-#' Fontes originais
-#'
-#' Titulo e subtitulo: Sentinel
-#'
-#' Grafico: Gotham Rounded
-tema_nexo <- function(base_size = 12, base_family = "sans") {
- (tema_base(base_size = base_size, base_family = base_family)
- + theme( # plot.margin = margin(t = 18, r = 20, b = 6, l = 20),
- plot.background = element_rect(fill = "#eeeeee", color = NA),
- panel.background = element_rect(fill = NA, color = NA),
- plot.title = element_text(size = rel(2)),
- plot.subtitle = element_text(
- color = "#7d7d7d",
- margin = margin(0, 0, 20, 0)
- ),
- plot.title.position = "plot",
- plot.caption = element_text(hjust = 0),
- plot.caption.position = "plot",
- axis.line.x = element_line(size = 1.2),
- axis.line.y = element_blank(),
- axis.text.x = element_text(
- color = "#263238",
- face = "bold",
- size = rel(1.2)
- ),
- axis.text.y = element_text(
- color = "#656565",
- size = rel(1.2)
- ),
- axis.title = element_blank(),
- axis.ticks.x = element_line(color = "#1b1b19", size = 0.8),
- axis.ticks.length.x = unit(5, "pt"),
- axis.ticks.y = element_blank(),
- panel.grid = element_line(
- color = "#b8b8b8", size = 0.1,
- linetype = "dashed"
- ),
- panel.grid.major.x = element_blank(),
- panel.grid.minor.x = element_blank()
- ))
-}
-
-#' Tema base
-#'
-#' This theme is designed to be a foundation from which to build new
-#' themes, and not meant to be used directly. \code{theme_foundation()}
-#' is a complete theme with only minimal number of elements defined.
-#' It is easier to create new themes by extending this one rather
-#' than \code{\link[ggplot2]{theme_gray}()} or \code{\link[ggplot2]{theme_bw}()},
-#' because those themes define elements deep in the hierarchy.
-#'
-#' This theme takes \code{\link[ggplot2]{theme_gray}()} and sets all
-#' \code{colour} and \code{fill} values to \code{NULL}, except for the top-level
-#' elements (\code{line}, \code{rect}, and \code{title}), which have
-#' \code{colour = "black"}, and \code{fill = "white"}. This leaves the spacing
-#' and-non colour defaults of the default \pkg{ggplot2} themes in place.
-#'
-#' @inheritParams ggplot2::theme_grey
-#'
-#' @family themes
-#' @export
-#' @importFrom ggplot2 theme_grey
-tema_base <- function(base_size = 12, base_family = "") {
- thm <- theme_grey(base_size = base_size, base_family = base_family)
- for (i in names(thm)) {
- if ("colour" %in% names(thm[[i]])) {
- thm[[i]]["color"] <- list(NULL)
- }
- if ("fill" %in% names(thm[[i]])) {
- thm[[i]]["fill"] <- list(NULL)
- }
- }
- thm + theme(
- panel.border = element_rect(fill = NA),
- legend.background = element_rect(color = NA),
- line = element_line(color = "black"),
- rect = element_rect(fill = "white", color = NA),
- text = element_text(color = "black")
- )
-}
-
-
-# Gráfico tracejado ----
-set.seed(35)
-df <- data.frame(
- Class = factor(rep(c(1, 2), times = 80), labels = c("Math", "Science")),
- StudyTime = factor(sort(sample(1:4, 16, prob = c(0.25, 0.3, 0.3, 0.15), replace = TRUE)), labels = c("<5", "5-10", "10-20", ">20")),
- Nerd = factor(sapply(rep(c(0.1, 0.3, 0.5, 0.8), c(30, 50, 50, 30)), function(x) sample(c("Nerd", "NotNerd"), size = 1, prob = c(x, 1 - x))), levels = c("NotNerd", "Nerd"))
-)
-
-library(ggplot2)
-# remotes::install_github("coolbutuseless/ggpattern")
-library(ggpattern)
-ggplot(data = df, aes(x = Class, fill = StudyTime)) +
- geom_bar_pattern(
- position = position_dodge(preserve = "single"),
- color = "#fffffff4",
- pattern_fill = "#ffffff",
- pattern_angle = 0,
- # pattern_density = 0.1,
- pattern_spacing = 0.075,
- pattern_key_scale_factor = 0.6
- ) +
- scale_fill_brewer(palette = "Set1", guide = guide_legend(title = "Study Time")) +
- scale_color_brewer(palette = "Set1", guide = guide_legend(title = "Study Time"))
-
-
-
-# Listas nas barras ----
-
-set.seed(35)
-df <- data.frame(
- Class = factor(rep(c(1, 2), times = 80), labels = c("Math", "Science")),
- StudyTime = factor(sort(sample(1:4, 16, prob = c(0.25, 0.3, 0.3, 0.15), replace = TRUE)), labels = c("<5", "5-10", "10-20", ">20")),
- Nerd = factor(sapply(rep(c(0.1, 0.3, 0.5, 0.8), c(30, 50, 50, 30)), function(x) sample(c("Nerd", "NotNerd"), size = 1, prob = c(x, 1 - x))), levels = c("NotNerd", "Nerd"))
-)
-
-library(ggplot2)
-# remotes::install_github("coolbutuseless/ggpattern")
-library(ggpattern)
-ggplot(data = df, aes(x = Class, fill = StudyTime)) +
- geom_bar_pattern(
- position = position_dodge(preserve = "single"),
- color = "#fffffff4",
- pattern_fill = "#ffffff",
- pattern_angle = 0,
- # pattern_density = 0.1,
- pattern_spacing = 0.075,
- pattern_key_scale_factor = 0.6
- )
-
-
- scale_fill_brewer(palette = "Set1", guide = guide_legend(title = "Study Time")) +
- scale_color_brewer(palette = "Set1", guide = guide_legend(title = "Study Time"))
+version https://git-lfs.github.com/spec/v1
+oid sha256:418767785c28e5bc300d4df9ddec777e32a6e8d49eeaafb3ea2977d45f4284de
+size 7837
diff --git "a/zz_resto_organizar/dicas/replicando-gr\303\241ficos.R" "b/zz_resto_organizar/dicas/replicando-gr\303\241ficos.R"
index a74118b..ca93856 100644
--- "a/zz_resto_organizar/dicas/replicando-gr\303\241ficos.R"
+++ "b/zz_resto_organizar/dicas/replicando-gr\303\241ficos.R"
@@ -1,65 +1,3 @@
-# Replicando gráficos Histograma ----
-# https://www.nexojornal.com.br/grafico/2023/07/21/Maioria-dos-jogos-da-Copa-acontece-na-madrugada-brasileira
-
-
-# Instale o pacote ggplot2 se ainda não o tiver instalado
-# install.packages("ggplot2")
-
-# Carregue o pacote ggplot2
-library(ggplot2)
-
-# Crie um conjunto de dados de exemplo com horas aleatórias
-set.seed(123)
-horas <- sample(21:32, 100, replace = TRUE) # Gere horas entre 21 e 32 (9h da manhã do dia seguinte)
-dados <- data.frame(horas = horas) |>
- dplyr::mutate(
- horas = dplyr::if_else(horas >= 24, horas - 24, horas)
- )
-View(dados)
-
-
-# Rótulos a serem destacados
-rotulos_destacados <- c(3, 9, 15, 21)
-
-# Crie um histograma usando ggplot2
-ggplot(dados, aes(x = horas)) +
- geom_rect(
- xmin = 25, xmax = 28,
- ymin = 0, ymax = 12, fill = "red", alpha = 0.3
- ) +
- geom_histogram(
- binwidth = 1, fill = "#2B825B", color = "black", alpha = 0.7
- )+
- scale_y_continuous(
- breaks = c(seq(0, 10, 2), 12),
- labels = c(seq(0, 10, 2), "12 jogos")
- ) +
- theme(
- panel.grid.major.y = element_line(
- linewidth = .5,
- linetype = "dashed",
- colour = "#898989"
- ),
- panel.background = element_rect(
- fill = "#ffffff",
- linewidth = 2
- ),
- panel.grid.minor = element_blank(),
- panel.grid.minor.x = element_blank(),
- panel.grid = element_blank(),
- # axis.text.x = element_text(
- # color = ifelse(dados$horas %in% rotulos_destacados, "red", "black"),
- # face = ifelse(dados$horas %in% rotulos_destacados, "bold", "normal")
- # ),
- )
-
-
-
-
-
-
-
-
-
-
-
+version https://git-lfs.github.com/spec/v1
+oid sha256:8e4dfafd4521ddedb770ed159d77c59e0e443f1a76e592af9326bcb896c30475
+size 1636
diff --git a/zz_resto_organizar/recursos/pacotes/pacote.R b/zz_resto_organizar/recursos/pacotes/pacote.R
index d3bcb23..bfdc8dc 100644
--- a/zz_resto_organizar/recursos/pacotes/pacote.R
+++ b/zz_resto_organizar/recursos/pacotes/pacote.R
@@ -1,14 +1,3 @@
-install.packages('ggplot2')
-install.packages('ggrepel')
-install.packages("ggtext")
-install.packages("ggsci")
-install.packages("ggpattern")
-install.packages("ggpage")
-install.packages("ggwordcloud")
-install.packages("ggQC")
-install.packages("ggmapinset")
-install.packages("ggflowchart")
-install.packages("gghighlight")
-install.packages("ggforce")
-install.packages("ggplot2_extensions")
-devtools::install_github("thomasp85/ggforce")
\ No newline at end of file
+version https://git-lfs.github.com/spec/v1
+oid sha256:00613be4baf649223c9e09e7d258235aab90744f6352abad2bc75888108bc34b
+size 443
diff --git a/zz_resto_organizar/recursos/themas/meu_theme.R b/zz_resto_organizar/recursos/themas/meu_theme.R
index 29d982d..e00a850 100644
--- a/zz_resto_organizar/recursos/themas/meu_theme.R
+++ b/zz_resto_organizar/recursos/themas/meu_theme.R
@@ -1,101 +1,3 @@
-theme_custom <- function (base_size = 12, base_family = "Roboto Condensed") {
- half_line <- base_size/2
- theme(
- line = element_line(color = "black", linewidth = .5,
- linetype = 1, lineend = "butt"),
- rect = element_rect(fill = "white", color = "black",
- linewidth = .5, linetype = 1),
- text = element_text(family = base_family, face = "plain",
- color = "black", size = base_size,
- lineheight = .9, hjust = .5, vjust = .5,
- angle = 0, margin = margin(), debug = FALSE),
- axis.line = element_blank(),
- axis.line.x = NULL,
- axis.line.y = NULL,
- axis.text = element_text(size = base_size * 1.1, color = "gray30"),
- axis.text.x = element_text(margin = margin(t = .8 * half_line/2),
- vjust = 1),
- axis.text.x.top = element_text(margin = margin(b = .8 * half_line/2),
- vjust = 0),
- axis.text.y = element_text(margin = margin(r = .8 * half_line/2),
- hjust = 1),
- axis.text.y.right = element_text(margin = margin(l = .8 * half_line/2),
- hjust = 0),
- axis.ticks = element_line(color = "gray30", linewidth = .7),
- axis.ticks.length = unit(half_line / 1.5, "pt"),
- axis.ticks.length.x = NULL,
- axis.ticks.length.x.top = NULL,
- axis.ticks.length.x.bottom = NULL,
- axis.ticks.length.y = NULL,
- axis.ticks.length.y.left = NULL,
- axis.ticks.length.y.right = NULL,
- axis.title.x = element_text(margin = margin(t = half_line),
- vjust = 1, size = base_size * 1.3,
- face = "bold"),
- axis.title.x.top = element_text(margin = margin(b = half_line),
- vjust = 0),
- axis.title.y = element_text(angle = 90, vjust = 1,
- margin = margin(r = half_line),
- size = base_size * 1.3, face = "bold"),
- axis.title.y.right = element_text(angle = -90, vjust = 0,
- margin = margin(l = half_line)),
- legend.background = element_rect(color = NA),
- legend.spacing = unit(.4, "cm"),
- legend.spacing.x = NULL,
- legend.spacing.y = NULL,
- legend.margin = margin(.2, .2, .2, .2, "cm"),
- legend.key = element_rect(fill = "gray95", color = "white"),
- legend.key.size = unit(1.2, "lines"),
- legend.key.height = NULL,
- legend.key.width = NULL,
- legend.text = element_text(size = rel(.8)),
- legend.text.align = NULL,
- legend.title = element_text(hjust = 0),
- legend.title.align = NULL,
- legend.position = "right",
- legend.direction = NULL,
- legend.justification = "center",
- legend.box = NULL,
- legend.box.margin = margin(0, 0, 0, 0, "cm"),
- legend.box.background = element_blank(),
- legend.box.spacing = unit(.4, "cm"),
- panel.background = element_rect(fill = "white", color = NA),
- panel.border = element_rect(color = "gray30",
- fill = NA, linewidth = .7),
- panel.grid.major = element_line(color = "gray90", linewidth = 1),
- panel.grid.minor = element_line(color = "gray90", linewidth = .5,
- linetype = "dashed"),
- panel.spacing = unit(base_size, "pt"),
- panel.spacing.x = NULL,
- panel.spacing.y = NULL,
- panel.ontop = FALSE,
- strip.background = element_rect(fill = "white", color = "gray30"),
- strip.text = element_text(color = "black", size = base_size),
- strip.text.x = element_text(margin = margin(t = half_line,
- b = half_line)),
- strip.text.y = element_text(angle = -90,
- margin = margin(l = half_line,
- r = half_line)),
- strip.text.y.left = element_text(angle = 90),
- strip.placement = "inside",
- strip.placement.x = NULL,
- strip.placement.y = NULL,
- strip.switch.pad.grid = unit(0.1, "cm"),
- strip.switch.pad.wrap = unit(0.1, "cm"),
- plot.background = element_rect(color = NA),
- plot.title = element_text(size = base_size * 1.8, hjust = .5,
- vjust = 1, face = "bold",
- margin = margin(b = half_line * 1.2)),
- plot.title.position = "panel",
- plot.subtitle = element_text(size = base_size * 1.3,
- hjust = .5, vjust = 1,
- margin = margin(b = half_line * .9)),
- plot.caption = element_text(size = rel(0.9), hjust = 1, vjust = 1,
- margin = margin(t = half_line * .9)),
- plot.caption.position = "panel",
- plot.tag = element_text(size = rel(1.2), hjust = .5, vjust = .5),
- plot.tag.position = "topleft",
- plot.margin = margin(rep(base_size, 4)),
- complete = TRUE
- )
-}
\ No newline at end of file
+version https://git-lfs.github.com/spec/v1
+oid sha256:98da2917ef9ec95eeed16863eefcac95eb3550291eee1b633ec71439bc55385f
+size 5020
diff --git a/zz_resto_organizar/teste/teste.R b/zz_resto_organizar/teste/teste.R
index 94e046f..9f4bc39 100644
--- a/zz_resto_organizar/teste/teste.R
+++ b/zz_resto_organizar/teste/teste.R
@@ -1,111 +1,3 @@
-# Pesuisando detalhes ----
-# Carregue o pacote ggplot2
-library(ggplot2)
-library(extrafont)
-library(ggtext)
-
-# Crie um conjunto de dados de exemplo
-dados <- data.frame(
- x = seq(1, 100, length.out = 10),
- y = seq(0, 1, length.out = 10)^(5.5)
-)
-
-# g<-
-ggplot(
- dados, aes(x = x, y = y),
-) +
-
- # ADICIONANDO CAMADA EM DESTAQUE
- annotate(
- "rect",
- xmin = 0, xmax = 50,
- ymin = 0, ymax = Inf,
- fill = "#ececec", alpha = 0.3
- ) +
- annotate(
- "rect",
- xmin = 90, xmax = 100,
- ymin = 0, ymax = Inf,
- fill = "#ececec", alpha = 0.3
- ) +
-
- # Add linha
- geom_line(
- colour = "#008cff",
- linewidth = 1.5
- ) +
- scale_x_continuous(
- breaks = seq(0, 100, by = 10),
- minor_breaks = TRUE,
- labels = c("1", seq(10, 100, by = 10))
- ) +
- scale_y_continuous(
- breaks = c(0.0,0.2,0.4,0.6,0.8),
- expand = c(0,0)
- ) +
- annotate(
- "text",
- x = 0,
- y = 0.0,
- label = "0 ",
- color = "black",
- # hjust = 3,
- vjust = -0.5
- )+
- annotate(
- "text",
- x = 0,
- y = c(0.2,0.4,0.6),
- label = c("2%", "4%", "6%"),
- color = "black",
- # hjust = 1.3,
- vjust = -0.5
- )+
- annotate(
- "text",
- x = 0,
- y = 0.8,
- label = "8% de deduções",
- color = "black",
- hjust = 0.1,
- vjust = -0.5
- )+
-
- labs(
- title = "% do total de deduções que vai \npara cada grupo de declarantes ",
- subtitle = "Por centil, no Imposto de Renda de 2022"
- ) +
-
- theme(
- axis.title = element_blank(),
- axis.text.y = element_blank(), # REMOVER escala Y
- axis.ticks.x = element_line(linewidth = .5),
- axis.ticks.y = element_blank(),
- axis.line.x.bottom = element_line(linewidth = 1),
-
-
- plot.background = element_rect(fill = "#d9d9d9"),
- plot.title = element_text(color = "#333333", size = 12),
- plot.subtitle = element_text(color = "#999999"),
- plot.margin = margin(t = 12, r = 24, b = 12, l = 24, unit = "pt"),
-
-
- panel.background = element_rect(
- fill = "#d9d9d9",
- colour = "#d9d9d9"
- ),
- panel.grid.major.y = element_line(colour = "black", linetype = "dashed"),
- panel.grid.minor = element_blank(),
- panel.grid.major.x = element_blank(),
- aspect.ratio = 4/5
- )
-
-# g |>
-ggplot2::ggsave(
- path= "graficos/recrianndo/01/",
- filename = 'nexografico-final.png',
- width = 1080,
- height = 1350,
- units = "px",
- # dpi = 300
- )
+version https://git-lfs.github.com/spec/v1
+oid sha256:db48aa9562f84bb7047c5d35b28c4034e76af61194b17181c8625d5fc4b584bc
+size 2499