Visualmente el PP es el el más valorado, pero ¿POR QUÉ DIABLOS LA BARRA DEL 3.5 ES MAYOR A LA DEL 3.7? click - este grafico claramente tiene modificaciones para manipular al publico sin los respectivos ejes x y y con rotulos y nomencladuras.
library(tidyverse)
library(readxl)
grafico <- read_xlsx("grafico_encuesta_lideres.xlsx")
grafico
library(hrbrthemes)
## Warning: package 'hrbrthemes' was built under R version 4.0.3
grafico %>%
ggplot(mapping = aes(x= lideres, y= puntaje))+
geom_line( color="grey") +
geom_point(shape=21, color="blue", fill="#69b3a2", size=6) +
theme_ipsum() +
ggtitle("candidatos")+
scale_y_continuous(limits = c(0,4))
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family not
## found in Windows font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family not
## found in Windows font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family not
## found in Windows font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family not found in Windows font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family not found in Windows font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family not found in Windows font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family not found in Windows font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family not found in Windows font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family not found in Windows font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family not found in Windows font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family not found in Windows font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family not found in Windows font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family not found in Windows font database
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## font family not found in Windows font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family not found in Windows font database
Este es el grafico corregido para la encuesta con eje x y y y sus valores respectivos identificando se claramente su diferencia de puntaje.