# WARNING - Generated by {fusen} from /dev/flat_minimal.Rmd: do not edit by hand
#' Funcion para insertar un salto de pagina luego de cada tabla. Necesario para que las tablas no se peguen.
#'
#' @import tidyverse
#' @import glue
#' @import sjlabelled
#' @import testthat
#' @import janitor
#' @import glue
#' @import lubridate
#' @import scales
#' @import Hmisc
#' @import lazyeval
#' @import plotly
#' @import ggrepel
#' @import cowplot
#' @import grid
#' @import fmsb
#' @import haven
#' @import rio
#' @import officer
#' @import officedown
#' @import sjlabelled
#' @import flextable
#' @import knitr
#' @import kableExtra
#' @import DT
#' @import gtsummary
#' @import ggpubr
#' @import paletteer
#' @import RColorBrewer
#' @import grDevices
#' @import graphics
#' @import utils
#' @return Un grafico radar
#' @examples
#'
#' # data_prueba_ruta <- system.file("data_prueba.sav", package = "pulso")
#' # data_prueba <- haven::read_sav(data_prueba_ruta)
#' #
#' # radar<-
#' # data_prueba %>%
#' # select(starts_with("q0008_")) %>%
#' # sjlabelled::label_to_colnames() %>%
#' # pivot_longer(everything(), names_to = "pregunta", values_to = "numero") %>%
#' # mutate(nombres=sjlabelled::as_label(numero)) %>%
#' # group_by(pregunta, numero, nombres) %>%
#' # dplyr::summarize(Freq = n()) %>%
#' # group_by(pregunta) %>%
#' # dplyr::mutate(prop = round_half_up(Freq/sum(Freq), digits = 2),
#' # numero = as.character(numero),
#' # nombres = as.character(nombres)) %>%
#' # separate(pregunta, c("Servicio","group", NA), sep=" - ") %>%
#' # filter(nombres!="No") %>%
#' # select(-c(numero, nombres, Freq)) %>%
#' # group_by(group) %>%
#' # pivot_wider(names_from = Servicio, values_from = prop) %>%
#' # mutate(
#' # group=case_when(
#' # group %in% "Conoce este servicio de bienestar que brinda la universidad" ~ "Lo conoce",
#' # TRUE ~ group)
#' # ) %>%
#' # ungroup()
#' #
#' # radar.tag<-
#' # data_prueba %>%
#' # select(starts_with("q0008_")) %>%
#' # nrow()
#' #
#' # radar %>%
#' # select(group, `Servicio de Salud`, `Servicio de actividad fisica y deportes`, `Bienestar psicologico`, `Servicios Culturales`) %>%
#' # grafico_radar(polygonfill = FALSE,
#' # grid.label.size = 3,
#' # axis.label.size = 3,
#' # group.line.width = 1,
#' # fullscore = as.numeric(rep(1,ncol(.)-1))
#' # ) +
#' #
#' # labs(caption = "Elaborado por Pulso PUCP",
#' # tag = glue("N=",radar.tag)) +
#' #
#' # theme(legend.title = element_blank(),legend.position = "bottom",legend.text = element_text(size=10, face = "bold",family="sans"),legend.key.height = unit(.2, "cm"),
#' # plot.caption = element_text(face = "italic",family="sans"),plot.margin = unit(c(0,0,1,0),"cm"),plot.tag = element_text(size = 8, color="grey40"),plot.tag.position = "bottomleft",
#' #
#' # text = element_text(size = 9, color="#002060",family="sans"),
#' # ) +
#' # guides(color=guide_legend(nrow = 2, byrow = TRUE)) +
#' # coord_equal(clip="off")
#'
#'
#' @export
salto<-function(){
officer::run_linebreak()
}
Add the following code to your website.
For more information on customizing the embed code, read Embedding Snippets.