1 Librerias y funciones usadas

library(haven)
## Registered S3 methods overwritten by 'tibble':
##   method     from  
##   format.tbl pillar
##   print.tbl  pillar
library(tidyverse)
## -- Attaching packages ---------------- tidyverse 1.3.0 --
## v ggplot2 3.3.2     v purrr   0.3.4
## v tibble  3.0.3     v dplyr   1.0.7
## v tidyr   1.1.1     v stringr 1.4.0
## v readr   1.3.1     v forcats 0.5.0
## Warning: package 'dplyr' was built under R version 4.0.5
## -- Conflicts ------------------- tidyverse_conflicts() --
## x dplyr::filter() masks stats::filter()
## x dplyr::lag()    masks stats::lag()
library(ggthemes)
## Warning: package 'ggthemes' was built under R version 4.0.3
library(rlang)
## Warning: package 'rlang' was built under R version 4.0.5
## 
## Attaching package: 'rlang'
## The following objects are masked from 'package:purrr':
## 
##     %@%, as_function, flatten, flatten_chr, flatten_dbl, flatten_int,
##     flatten_lgl, flatten_raw, invoke, list_along, modify, prepend,
##     splice
library(likert)
## Warning: package 'likert' was built under R version 4.0.5
## Loading required package: xtable
## 
## Attaching package: 'likert'
## The following object is masked from 'package:dplyr':
## 
##     recode
library(tm)
## Warning: package 'tm' was built under R version 4.0.5
## Loading required package: NLP
## Warning: package 'NLP' was built under R version 4.0.3
## 
## Attaching package: 'NLP'
## The following object is masked from 'package:ggplot2':
## 
##     annotate
library(SnowballC)
## Warning: package 'SnowballC' was built under R version 4.0.3
library(wordcloud)
## Warning: package 'wordcloud' was built under R version 4.0.5
## Loading required package: RColorBrewer
## Warning: package 'RColorBrewer' was built under R version 4.0.3
library(RColorBrewer)
library(Rcpp)
## Warning: package 'Rcpp' was built under R version 4.0.5
grafico <- function(tipo, data, xlab, ylab, title) {
  if (tipo == "cualitativo1") {

  colnames(data) <- "xlab"
  data %>%
  mutate(xlab = xlab %>% fct_infreq() %>% fct_rev()) %>%
  count(xlab, sort = TRUE) %>%
  mutate(porcentaje = paste0(sprintf("%4.1f", n / sum(n) * 100), "%")) %>%
  rename(frecuencia = n) %>%
ggplot(mapping = aes(x = xlab, y = frecuencia, fill = frecuencia)) +
  geom_col() +
    geom_label(mapping = aes(label = paste(frecuencia, porcentaje, sep = " ; ")), fill = "white", size = 2.5, hjust = 0.5) +
  labs(x = xlab, y = ylab, title = title, subtitle = "Barras(ud), etiquetas(ud; %)", caption = "Elaboración propia") +
  coord_flip() +
    theme_igray() +
  scale_fill_gradient(low = "#28e2e5", high = "#cc3d6f")
    
  } else if (tipo == "cualitativo2") {
    
  colnames(data) <- "xlab"
  data %>%
  mutate(xlab = xlab %>% fct_infreq() %>% fct_rev()) %>%
  count(xlab, sort = TRUE) %>%
  mutate(porcentaje = paste0(sprintf("%4.1f", n / sum(n) * 100), "%")) %>%
  rename(frecuencia = n) %>%
ggplot(mapping = aes(x = xlab, y = frecuencia, fill = frecuencia)) +
  geom_col() +
    geom_label(mapping = aes(label = paste(frecuencia, porcentaje, sep = " ; ")), fill = "white", size = 2.5, hjust = 0.5) +
  labs(x = xlab, y = ylab, title = title, subtitle = "Sectores(ud), etiquetas(ud; %)", caption = "Elaboración propia") +
  coord_polar("y") +
    theme_igray() +
  scale_fill_gradient(low = "#28e2e5", high = "#cc3d6f")
    
  } else if (tipo == "ordinal") {

  colnames(data) <- "xlab"
  data %>%
  count(xlab) %>%
  mutate(porcentaje = paste0(sprintf("%4.1f", n / sum(n) * 100), "%")) %>%
  rename(frecuencia = n) %>%
ggplot(mapping = aes(x = xlab, y = frecuencia, fill = frecuencia)) +
  geom_col() +
    geom_label(mapping = aes(label = paste(frecuencia, porcentaje, sep = " ; ")), fill = "white", size = 2.5, hjust = 0.5) +
  labs(x = xlab, y = ylab, title = title, subtitle = "Barras(ud), etiquetas(ud; %)", caption = "Elaboración propia") +
  coord_flip() +
    theme_igray() +
  scale_fill_gradient(low = "#28e2e5", high = "#cc3d6f")
  
  } else if (tipo == "discreto") {

  colnames(data) <- "xlab"
  data %>%
  count(xlab, sort = TRUE) %>%
  mutate(porcentaje = paste0(sprintf("%4.1f", n / sum(n) * 100), "%")) %>%
  rename(frecuencia = n) %>%
  ggplot(mapping = aes(x = xlab, y = frecuencia, color = frecuencia)) +
  geom_point(size = 4) +
  geom_segment(mapping = aes(x = xlab, y = 0,  xend = xlab, yend = frecuencia)) +
  geom_text(mapping = aes(label = frecuencia), color = "black", size = 2.5, vjust = -1) +
  labs(x = xlab, y = ylab, color = "frecuencia", title = title, subtitle = "Bastones(ud), etiquetas(ud)", caption = "Elaboración propia") +
  theme_igray() +
  scale_color_gradient(low = "#28e2e5", high = "#cc3d6f")
    
  } else if (tipo == "continuo") {
    print(NULL)
  }
}
  grafico_likert <- function(data, titulo) {
    data %>%
      as.data.frame() %>%
      likert() %>%
      plot(low.color = "#28e2e5", high.col = "#cc3d6f") +
      ggtitle(titulo) +
      theme(legend.key.size=unit(0.01,"npc")) +
      guides(fill=guide_legend(""))
  }
cloud <- function(t1) {
  
  colnames(t1) <- "Review_Text"

  corpus = Corpus(VectorSource(t1$Review_Text))
  #Conversion to Lowercase
corpus = tm_map(corpus, PlainTextDocument)
corpus = tm_map(corpus, tolower)
 
#Removing Punctuation
corpus = tm_map(corpus, removePunctuation)
 
#Remove stopwords
corpus = tm_map(corpus, removeWords, c("cloth", stopwords("spanish")))
 
# Stemming
corpus = tm_map(corpus, stemDocument)
 
# Eliminate white spaces
corpus = tm_map(corpus, stripWhitespace)

DTM <- TermDocumentMatrix(corpus)
mat <- as.matrix(DTM)
f <- sort(rowSums(mat),decreasing=TRUE)
dat <- data.frame(word = names(f),freq=f)

if (nrow(dat) > 0) {
set.seed(100)
wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words=500, random.order=FALSE, rot.per=0.30, colors=c("#28e2e5", "#cc3d6f"))  
} else {
 print(NULL) 
}
  
}

2 Bases de Datos a usar

Data_Hogar <- read_sav("3.3.- Data_Hogares.sav")

Data_Hogar <- Data_Hogar %>%
  mutate(LUGAR = factor(LUGAR, levels = c(1, 2, 3), labels = c("Lima Metropolitana excepto Sur", "Lima Metropolitana Sur", "Ica, Pisco, Chincha")),
         LUGAR_X = factor(LUGAR_X, levels = c(1, 2), labels = c("Lima", "Ica")))

Data_Hogar_Lima_Metropolitana <- Data_Hogar %>%
  filter(LUGAR_X == "Lima")

Data_Hogar_Lima_Metropolitana_Sur <- Data_Hogar %>%
  filter(LUGAR == "Lima Metropolitana Sur")

Data_Hogar_Ica_Pisco_Chincha <- Data_Hogar %>%
  filter(LUGAR == "Ica, Pisco, Chincha")

Data_Docentes <- read_sav("1.3.- Data_Docentes.sav")

Data_Estudiantes <- read_sav("2.3.- Data_Estudiantes.sav")

Data_Operadores <- read_sav("4.3.- Data_Operadores.sav")

3 Data Hogar Muestra en Lima Metropolitana

3.1 ¿En que distrito vive actualmente?

Data_Hogar_Lima_Metropolitana %>%
  select(q0003_0003) %>%
  mutate(q0003_0003 = str_to_title(q0003_0003),
         q0003_0003 = str_replace(q0003_0003, "Smp", "San Martín De Porres"),
         q0003_0003 = str_replace(q0003_0003, "Villa Maria Del Triunfo", "Villa María Del Triunfo"),
         q0003_0003 = str_replace(q0003_0003, "Chorrilos", "Chorrillos"),
         q0003_0003 = str_replace(q0003_0003, "San Juan De Lurignacho", "San Juan De Lurigancho"),
         q0003_0003 = factor(q0003_0003),
         q0003_0003 = str_replace(q0003_0003, "San Martin De Porres", "San Martín De Porres")) %>%
  grafico(tipo = "cualitativo1", xlab = "Distritos", ylab = "Encuestas recopiladas", title = "Cantidad de encuestas recopiladas por Distrito")

3.2 ¿Que edad tiene usted ?

Data_Hogar_Lima_Metropolitana %>%
  select(q0004_X_Rang) %>%
  mutate(q0004_X_Rang = factor(q0004_X_Rang, levels = c("1", "2", "3", "4"), labels = c("Menos a 30 años", "De 30 a 44 Años", "De 45 a 59 años", "De 60 a más años"))) %>%
  grafico(tipo = "ordinal", xlab = "Edad", ylab = "Encuestas recopiladas", title = "Cantidad de encuestas recopiladas por Edad")

3.3 ¿Cuál es su lengua materna?

Data_Hogar_Lima_Metropolitana %>%
  select(q0005, q0005_other) %>%
  mutate(q0005 = as.character(q0005),
         q0005_other = as.character(q0005_other),
         q0005 = case_when(q0005 == "0" ~ "Otro",
                           q0005 == "1" ~ "Quechua",
                           q0005 == "2" ~ "Asháninca",
                           q0005 == "3" ~ "Aimara",
                           q0005 == "4" ~ "Español",
                           TRUE ~ q0005)) %>%
  select(q0005) %>%
  mutate(q0005 = factor(q0005)) %>%
  grafico(tipo = "cualitativo2", xlab = "Lengua materna", ylab = "Encuestas recopiladas", title = "Cantidad de encuestas recopiladas por Lengua materna")

3.3.1 Otro

Data_Hogar_Lima_Metropolitana %>%
  select(q0005_other) %>%
  mutate(q0005_other = as.character(q0005_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

3.4 ¿Domina alguna lengua además de la materna?

Data_Hogar_Lima_Metropolitana %>%
  select(q0006) %>%
  mutate(q0006 = as.character(q0006),
         q0006 = case_when(q0006 == "1" ~ "Si",
                           q0006 == "2" ~ "No",
                           TRUE ~ q0006),
         q0006 = factor(q0006)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Domina alguna lengua además de la materna?")

3.5 ¿Qué otra lengua domina?

Data_Hogar_Lima_Metropolitana %>%
  select(q0007_0001:q0007_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0007_0001:q0007_other) %>%
  filter(!is.na(value), value != "", key != "q0007_0008") %>%
  mutate(key = case_when(key == "q0007_0001" ~ "Quechua",
                         key == "q0007_0002" ~ "Aimara",
                         key == "q0007_0003" ~ "Asháninca",
                         key == "q0007_0004" ~ "Español",
                         key == "q0007_0005" ~ "Ingles",
                         key == "q0007_0006" ~ "Portugués",
                         key == "q0007_0007" ~ "Francés",
                         key == "q0007_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "Idioma", ylab = "frecuencia", title = "¿Qué otra lengua domina?")

3.5.1 Otro

Data_Hogar_Lima_Metropolitana %>%
  select(q0007_other) %>%
  mutate(q0007_other = as.character(q0007_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

3.6 Según las actividades que realiza diariamente ¿Cuál es su ocupación actual?

Data_Hogar_Lima_Metropolitana %>%
  select(q0008, q0008_other) %>%
  mutate_all(as.character) %>%
  mutate(q0008 = case_when(q0008 == "0" ~ "Otro",
                           q0008 == "1" ~ "Trabajador dependiente",
                           q0008 == "2" ~ "Trabajador independiente",
                           q0008 == "3" ~ "Ama (o) de casa",
                           q0008 == "4" ~ "Estudiante técnico o universitario",
                           q0008 == "5" ~ "Sin ocupación",
                           TRUE ~ q0008),
         q0008 = factor(q0008)) %>%
  select(q0008) %>%
  grafico(tipo = "cualitativo1", xlab = "Ocupacion", ylab = "frecuencia", title = "¿Cuál es su ocupación actual?")

3.6.1 Otro

Data_Hogar_Lima_Metropolitana %>%
  select(q0008_other) %>%
  mutate(q0008_other = as.character(q0008_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

3.7 Por el tiempo que destina semanalmente a su trabajo ¿Cuál de las siguientes opciones lo define mejor?

Data_Hogar_Lima_Metropolitana %>%
  select(q0009) %>%
  mutate(q0009 = as.character(q0009),
         q0009 = case_when(q0009 == "1" ~ "Trabajador Full-Time \n (8 Horas x 6 dias o 48 horas semanales)",
                           q0009 == "2" ~ "Trabajador Middle- Time \n (6 Horas x 6 Dias o 36 horas semanales)",
                           q0009 == "3" ~ "Trabajador Part- Time \n (4 Horas x 6 dias o 24 horas semanales)",
                           q0009 == "4" ~ "Tengo más de un trabajo a la vez",
                           TRUE ~ q0009),
         q0009 = factor(q0009, levels = c("Tengo más de un trabajo a la vez", "Trabajador Part- Time \n (4 Horas x 6 dias o 24 horas semanales)", "Trabajador Middle- Time \n (6 Horas x 6 Dias o 36 horas semanales)", "Trabajador Full-Time \n (8 Horas x 6 dias o 48 horas semanales)"))) %>%
  filter(!is.na(q0009)) %>%
  grafico(tipo = "ordinal", xlab = "Tiempos de trabajo", ylab = "frecuencia", title = "¿Cuál de las siguientes opciones \n lo define mejor?")

3.8 ¿Cuál es su nivel de instrucción?

Data_Hogar_Lima_Metropolitana %>%
  select(q0010) %>%
  mutate(q0010 = as.character(q0010),
         q0010 = case_when(q0010 == "1" ~ "Inicial",
                           q0010 == "2" ~ "Primaria",
                           q0010 == "3" ~ "Secundaria",
                           q0010 == "4" ~ "Superior Técnico",
                           q0010 == "5" ~ "Superior Universitario",
                           q0010 == "6" ~ "Postgrado",
                           q0010 == "7" ~ "Ningún grado de instrucción",
                           TRUE ~ q0010),
         q0010 = factor(q0010, levels = c("Ningún grado de instrucción", "Inicial", "Primaria", "Secundaria", "Superior Técnico", "Superior Universitario", "Postgrado"))) %>%
  grafico(tipo = "ordinal", xlab = "Nivel", ylab = "frecuencia", title = "¿Cuál es su nivel de instrucción?")

3.9 Por tu autoidentificación de género te consideras:

Data_Hogar_Lima_Metropolitana %>%
  select(q0011, q0011_other) %>%
  mutate_all(as.character) %>%
  mutate(q0011 = case_when(q0011 == "0" ~ "Otro",
                           q0011 == "1" ~ "Hombre",
                           q0011 == "2" ~ "Mujer",
                           q0011 == "3" ~ "Prefiero no decirlo",
                           q0011 == "4" ~ "Otro",
                           TRUE ~ q0011),
         q0011 = factor(q0011)) %>%
  select(q0011) %>%
  grafico(tipo = "cualitativo2", xlab = "Género", ylab = "frecuencia", title = "Por tu autoidentificación de género te consideras:")

3.9.1 Otro

Data_Hogar_Lima_Metropolitana %>%
  select(q0011_other) %>%
  mutate(q0011_other = as.character(q0011_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents
## NULL

3.10 Por sus costumbres y sus antepasados usted se considera:

Data_Hogar_Lima_Metropolitana %>%
  select(q0012, q0012_other) %>%
  sapply(as.character) %>%
  as_tibble() %>%
  mutate(q0012 = case_when(q0012 == "0" ~ "Otro",
                           q0012 == "1" ~ "Quechua",
                           q0012 == "2" ~ "Aimara",
                           q0012 == "3" ~ "Parte de otro pueblo indígena u originario",
                           q0012 == "4" ~ "Mestizo",
                           q0012 == "5" ~ "Blanco",
                           q0012 == "6" ~ "Negro, moreno, zambo, mulato / \n pueblo afroperuano o afrodescendiente",
                           q0012 == "7" ~ "Tusan",
                           q0012 == "8" ~ "Nikkei",
                           q0012 == "9" ~ "Otro",
                           TRUE ~ q0012),
         q0012 = factor(q0012)) %>%
  select(q0012) %>%
  filter(!is.na(q0012), q0012 != "") %>%
  grafico(tipo = "cualitativo1", xlab = "Costumbres", ylab = "frecuencia", title = "Por sus costumbres y sus antepasados \n usted se considera:")

3.10.1 Otro

Data_Hogar_Lima_Metropolitana %>%
  select(q0012_other) %>%
  mutate(q0012_other = as.character(q0012_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents
## NULL

3.11 ¿Qué tan importante considera el aspecto cultural en su vida y en la de su familia?

Data_Hogar_Lima_Metropolitana %>%
  select(q0013) %>%
  mutate(q0013 = factor(q0013),
         q0013 = recode_factor(q0013, "1" = "5", "2" = "4", "4" = "2", "5" = "1"),
         q0013 = factor(q0013, levels = c(1, 2, 3, 4, 5), labels = c("Nada importante", 2, 3, 4, "Muy importante"))) %>%
  filter(!is.na(q0013)) %>%
  rename(aspecto_cultural = q0013) %>%
  grafico_likert(titulo = "¿Qué tan importante considera el aspecto cultural \n en su vida y en la de su familia?")

3.12 ¿Alguna vez ha visitado un museo?

Data_Hogar_Lima_Metropolitana %>%
  select(q0014) %>%
  mutate(q0014 = as.character(q0014),
         q0014 = case_when(q0014 == "1" ~ "Si",
                           q0014 == "2" ~ "No",
                           TRUE ~ q0014),
         q0014 = factor(q0014)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "frecuencia", title = "¿Alguna vez ha visitado un museo?")

3.13 ¿Le gusta visitar museos?

Data_Hogar_Lima_Metropolitana %>%
  select(q0015) %>%
  mutate(q0015 = as.character(q0015),
         q0015 = case_when(q0015 == "1" ~ "Si",
                           q0015 == "2" ~ "No",
                           TRUE ~ q0015),
         q0015 = factor(q0015)) %>%
  filter(!is.na(q0015)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "frecuencia", title = "¿Le gusta visitar museos?")

3.14 ¿Qué te motiva a visitarlos?

Data_Hogar_Lima_Metropolitana %>%
  select(q0016_0001:q0016_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0016_0001:q0016_other) %>%
  filter(!is.na(value), value != "", key != "q0016_0011") %>%
  mutate(key = case_when(key == "q0016_0001" ~ "enriquece mi conocimiento cultural",
                         key == "q0016_0002" ~ "buscar una nueva experiencia",
                         key == "q0016_0003" ~ "pasar un día con amigos/pareja",
                         key == "q0016_0004" ~ "visitar las exposiciones temporales",
                         key == "q0016_0005" ~ "para ver algo en específico que he oído hablar",
                         key == "q0016_0006" ~ "pasar un día en familia",
                         key == "q0016_0007" ~ "enseñar el museo a amigos, conocidos o familiares",
                         key == "q0016_0008" ~ "conocer las colecciones",
                         key == "q0016_0009" ~ "por una actividad organizada por \n el museo/centro expositivo (servicio complementario)",
                         key == "q0016_0010" ~ "esta incluido en una visita turística",
                         key == "q0016_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "Motivo", ylab = "frecuencia", title = "¿Qué te motiva a visitarlos?")

3.14.1 Otro

Data_Hogar_Lima_Metropolitana %>%
  select(q0016_other) %>%
  mutate(q0016_other = as.character(q0016_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

3.15 ¿Qué no le gustó de ellos?

Data_Hogar_Lima_Metropolitana %>%
  select(q0017_0001:q0017_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0017_0001:q0017_other) %>%
  filter(!is.na(value), value != "", key != "q0017_0007") %>%
  mutate(key = case_when(key == "q0017_0001" ~ "Que fue aburrido y monótono",
                         key == "q0017_0002" ~ "Que no se entienden",
                         key == "q0017_0003" ~ "Exponen cosas que no me interesan",
                         key == "q0017_0004" ~ "Mala calidad de los servicios del museo",
                         key == "q0017_0005" ~ "Guías de turismo no brindaron un buen servicio",
                         key == "q0017_0006" ~ "Nada me ha disgustado en mi visita",
                         key == "q0017_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Qué no le gustó de ellos?")

3.15.1 Otro

Data_Hogar_Lima_Metropolitana %>%
  select(q0017_other) %>%
  mutate(q0017_other = as.character(q0017_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

3.16 ¿Qué no le gusta de ellos?

Data_Hogar_Lima_Metropolitana %>%
  select(q0018_0001:q0018_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0018_0001:q0018_other) %>%
  filter(!is.na(value), value != "", key != "q0018_0006") %>%
  mutate(key = case_when(key == "q0018_0001" ~ "Que sean aburridos y monótonos",
                         key == "q0018_0002" ~ "Que no se entienden",
                         key == "q0018_0003" ~ "Exponen cosas que no me interesan",
                         key == "q0018_0004" ~ "Mala calidad de los servicios del museo",
                         key == "q0018_0005" ~ "Guías de turismo no brindan un buen servicio",
                         key == "q0018_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Qué no le gusta de ellos?")

3.16.1 Otro

Data_Hogar_Lima_Metropolitana %>%
  select(q0018_other_X) %>%
  mutate(q0018_other_X = as.character(q0018_other_X)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

3.17 En el año 2019, ¿ha visitado museos de manera presencial?

Data_Hogar_Lima_Metropolitana %>%
  select(q0019) %>%
  mutate(q0019 = as.character(q0019),
         q0019 = case_when(q0019 == "1" ~ "Si",
                           q0019 == "2" ~ "No",
                           TRUE ~ q0019),
         q0019 = factor(q0019)) %>%
  filter(!is.na(q0019)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "En el año 2019, ¿ha visitado museos \n de manera presencial?")

3.18 ¿Cuántas veces ha visitado un museo en el 2019?

Data_Hogar_Lima_Metropolitana %>%
  select(q00020_X_Rang) %>%
  mutate(q00020_X_Rang = factor(q00020_X_Rang, levels = c(1, 2), labels = c("De 1 a 3 veces", "Más de 4 veces"))) %>%
  filter(!is.na(q00020_X_Rang)) %>%
  grafico(tipo = "ordinal", xlab = "N° de Veces", ylab = "Encuestas recopiladas", title = "¿Cuántas veces ha visitado un museo en el 2019?")

3.19 Respecto a su última visita ¿usted realizo la visita solo o acompañado o formo parte de un grupo?

Data_Hogar_Lima_Metropolitana %>%
  select(q0021) %>%
  mutate(q0021 = as.character(q0021),
         q0021 = case_when(q0021 == "1" ~ "He ido solo",
                           q0021 == "2" ~ "He ido acompañado de otras personas \n (pareja, amigos, familia)",
                           q0021 == "3" ~ "He ido en un grupo organizado \n (tours turísticos, grupos con algún fin u objetivo)",
                           TRUE ~ q0021),
         q0021 = factor(q0021)) %>%
  filter(!is.na(q0021)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "Respecto a su última visita \n ¿usted realizo la visita solo \n o acompañado o formo parte \n de un grupo?")

3.20 ¿Cuántas personas lo acompañaron en promedio?

Data_Hogar_Lima_Metropolitana %>%
  select(q00022_X_Rang) %>%
  mutate(q00022_X_Rang = factor(q00022_X_Rang, levels = c(1, 2, 3), labels = c("De 1 a 9 personas", "De 10 a 15 personas", "Más de 15 personas"))) %>%
  filter(!is.na(q00022_X_Rang)) %>%
  grafico(tipo = "ordinal", xlab = "N° de personas", ylab = "Encuestas recopiladas", title = "¿Cuántas personas lo acompañaron en promedio?")

3.21 Cuéntenos, ¿con quién fue al museo? (Puede marcar varias de las siguientes opciones):

Data_Hogar_Lima_Metropolitana %>%
  select(q0023_0001:q0023_0005) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0023_0001:q0023_0005) %>%
  filter(!is.na(value), value != "") %>%
  mutate(key = case_when(key == "q0023_0001" ~ "Solo con mi pareja",
                         key == "q0023_0002" ~ "Mi familia (hijos(as), esposa (o))",
                         key == "q0023_0003" ~ "Mis padres",
                         key == "q0023_0004" ~ "Otros parientes",
                         key == "q0023_0005" ~ "Colegas o amigos",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿con quién fue al museo?")  

3.22 ¿Cuántas personas lo acompañaron en promedio?

Data_Hogar_Lima_Metropolitana %>%
  select(q00024_X_Rang) %>%
  mutate(q00024_X_Rang = factor(q00024_X_Rang, levels = c(1, 2, 3), labels = c("De 1 a 9 personas", "De 10 a 15 personas", "Más de 15 personas"))) %>%
  filter(!is.na(q00024_X_Rang)) %>%
  grafico(tipo = "ordinal", xlab = "N° de personas", ylab = "Encuestas recopiladas", title = "¿Cuántas personas lo acompañaron en promedio?")

3.23 ¿Qué tipo de grupo fue? (Puede marcar varias de las siguientes opciones):

Data_Hogar_Lima_Metropolitana %>%
  select(q0025_0001:q0025_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0025_0001:q0025_other) %>%
  filter(!is.na(value), value != "", key != "q0025_0004") %>%
  mutate(key = case_when(key == "q0025_0001" ~ "Un grupo de personas \n organizado en visitas turísticas",
                         key == "q0025_0002" ~ "Un grupo escolar/educativo",
                         key == "q0025_0003" ~ "Un grupo organizado \n en visita cultural",
                         key == "q0025_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "frecuencia", title = "¿Qué tipo de grupo fue?")

3.23.1 Otro

Data_Hogar_Lima_Metropolitana %>%
  select(q0025_other) %>%
  mutate(q0025_other = as.character(q0025_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

3.24 En general ¿Cuáles son los tres (03) principales problemas que ha experimentado o que encuentra en la actualidad durante su visita a un museo?

Data_Hogar_Lima_Metropolitana %>%
  select(q0026_0001:q0026_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0026_0001:q0026_other) %>%
  filter(!is.na(value), value != "", key != "q0026_0011") %>%
  mutate(key = case_when(key == "q0026_0001" ~ "Respecto a la ubicación del museo (entorno)",
                         key == "q0026_0002" ~ "Respecto a costo de tickets",
                         key == "q0026_0003" ~ "Respecto a distancias en el transporte",
                         key == "q0026_0004" ~ "Respecto a costo del transporte",
                         key == "q0026_0005" ~ "Respecto a disponibilidad de estacionamientos",
                         key == "q0026_0006" ~ "Respecto a espacios de investigación",
                         key == "q0026_0007" ~ "Respecto a espacios pedagógicos/didácticos",
                         key == "q0026_0008" ~ "Exposiciones no están acordes \n al curriculum nacional",
                         key == "q0026_0009" ~ "No hay guiado especializado para niños",
                         key == "q0026_0010" ~ "No he tenido problemas durante mi visita",
                         key == "q0026_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "En general ¿Cuáles son los tres (03) \n principales problemas que \n ha experimentado o que encuentra en la \n actualidad durante su visita a un museo?")

3.24.1 Otro

Data_Hogar_Lima_Metropolitana %>%
  select(q0026_other) %>%
  mutate(q0026_other = as.character(q0026_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

3.25 ¿Ud. buscó información antes de realizar una visita?

Data_Hogar_Lima_Metropolitana %>%
  select(q0027) %>%
  mutate(q0027 = as.character(q0027),
         q0027 = case_when(q0027 == "1" ~ "Si",
                           q0027 == "2" ~ "No",
                           TRUE ~ q0027),
         q0027 = factor(q0027)) %>%
  filter(!is.na(q0027)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "En el año 2019, ¿Ud. buscó información \n antes de realizar una visita?")

3.26 ¿Qué tipo de información buscó?

Data_Hogar_Lima_Metropolitana %>%
  select(q0028_0001:q0028_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0028_0001:q0028_other) %>%
  filter(!is.na(value), value != "", key != "q0028_0008") %>%
  mutate(key = case_when(key == "q0028_0001" ~ "Precios de entrada",
                         key == "q0028_0002" ~ "Dirección exacta/referencias",
                         key == "q0028_0003" ~ "Actividades adicionales dentro del museo \n (concierto, teatro, cine, otros)",
                         key == "q0028_0004" ~ "Servicios adicionales (restaurantes, cafeterías)",
                         key == "q0028_0005" ~ "Servicios para personas con habilidades especiales",
                         key == "q0028_0006" ~ "Si el lugar cuenta con personal capacitado \n e instalaciones adecuadas para acoger a \n personas con habilidades especiales.",
                         key == "q0028_0007" ~ "Tipo de contenido",
                         key == "q0028_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Qué tipo de información buscó?")

3.26.1 Otro

Data_Hogar_Lima_Metropolitana %>%
  select(q0028_other) %>%
  mutate(q0028_other = as.character(q0028_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

3.27 ¿Por qué no?

Proviene de la respuesta “no” de la pregunta: ¿alguna vez ha visitado un museo?

Data_Hogar_Lima_Metropolitana %>%
select(q0029_0001:q0029_0004) %>%
mutate_all(as.character) %>%
gather(key = "key", value = "value", q0029_0001:q0029_0004) %>%
filter(!is.na(value), value != "") %>%
mutate(key = case_when(key == "q0029_0001" ~ "Falta de tiempo",
                       key == "q0029_0002" ~ "Lejanía/ poca accesibilidad al museo",
                       key == "q0029_0003" ~ "Falta de información sobre los museos",
                       key == "q0029_0004" ~ "No me resulta interesante/no me gusta",
                       TRUE ~ key),
       key = factor(key)) %>%
select(key) %>%
grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Por qué no?")  

3.28 ¿Qué redes sociales utiliza frecuentemente?

Data_Hogar_Lima_Metropolitana %>%
  select(q0030_0001:q0030_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0030_0001:q0030_other) %>%
  filter(!is.na(value), value != "", key != "q0030_0006") %>%
  mutate(key = case_when(key == "q0030_0001" ~ "Facebook",
                         key == "q0030_0002" ~ "Instagram",
                         key == "q0030_0003" ~ "YouTube",
                         key == "q0030_0004" ~ "Tik Tok",
                         key == "q0030_0005" ~ "No utilizo ninguna red social",
                         key == "q0030_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Qué redes sociales utiliza frecuentemente?")

3.28.1 otros

Data_Hogar_Lima_Metropolitana %>%
  select(q0030_other) %>%
  mutate(q0030_other = as.character(q0030_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

3.29 ¿Sigue a museos (nacionales/extranjeros) en sus redes sociales?

Data_Hogar_Lima_Metropolitana %>%
  select(q0031) %>%
  mutate(q0031 = as.character(q0031),
         q0031 = case_when(q0031 == "1" ~ "Si",
                           q0031 == "2" ~ "No",
                           TRUE ~ q0031),
         q0031 = factor(q0031)) %>%
  filter(!is.na(q0031)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Sigue a museos (nacionales/extranjeros) \n en sus redes sociales?")

3.30 ¿Se siente identificado(a) con sus contenidos?

Data_Hogar_Lima_Metropolitana %>%
  select(q0032) %>%
  mutate(q0032 = factor(q0032),
         q0032 = recode_factor(q0032, "1" = "5", "2" = "4", "4" = "2", "5" = "1"),
         q0032 = factor(q0032, levels = c(1, 2, 3, 4, 5), labels = c("Nada identificado", 2, 3, 4, "Muy identificado"))) %>%
  filter(!is.na(q0032)) %>%
  rename(contenidos = q0032) %>%
  grafico_likert(titulo = "¿Se siente identificado(a) con sus contenidos?")

3.31 ¿Ha considerado ir a un museo actualmente?

Data_Hogar_Lima_Metropolitana %>%
  select(q0033) %>%
  mutate(q0033 = as.character(q0033),
         q0033 = case_when(q0033 == "1" ~ "Si",
                           q0033 == "2" ~ "No",
                           TRUE ~ q0033),
         q0033 = factor(q0033)) %>%
  filter(!is.na(q0033)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Ha considerado ir a un museo actualmente?")

3.32 ¿Por que no iría a un museo actualmente?

Data_Hogar_Lima_Metropolitana %>%
  select(q0034) %>%
  mutate(q0034 = as.character(q0034)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

3.33 ¿Alguna vez ha visitado un museo de manera virtual?

Data_Hogar_Lima_Metropolitana %>%
  select(q0035) %>%
  mutate(q0035 = as.character(q0035),
         q0035 = case_when(q0035 == "1" ~ "Si",
                           q0035 == "2" ~ "No",
                           TRUE ~ q0035),
         q0035 = factor(q0035)) %>%
  filter(!is.na(q0035)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Alguna vez ha visitado un museo de manera virtual?")

3.34 ¿Qué museo visitaste virtualmente?

Data_Hogar_Lima_Metropolitana %>%
  select(q0036) %>%
  mutate(q0036 = as.character(q0036),
         q0036 = str_remove_all(q0036, "MUSEO"),
         q0036 = str_remove_all(q0036, "Museo"),
         q0036 = str_remove_all(q0036, "museo")) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

3.35 ¿Qué otros espacios culturales visita o ha visitado con frecuencia?

Data_Hogar_Lima_Metropolitana %>%
  select(q0037_0001:q0037_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0037_0001:q0037_other) %>%
  filter(!is.na(value), value != "", key != "q0037_0006") %>%
  mutate(key = case_when(key == "q0037_0001" ~ "Teatro",
                         key == "q0037_0002" ~ "Cine",
                         key == "q0037_0003" ~ "Conciertos",
                         key == "q0037_0004" ~ "Parques",
                         key == "q0037_0005" ~ "Ferias y circos",
                         key == "q0037_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Qué otros espacios culturales visita \n o ha visitado con frecuencia?")

3.35.1 otros

Data_Hogar_Lima_Metropolitana %>%
  select(q0037_other) %>%
  mutate(q0037_other = as.character(q0037_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

3.36 ¿Dónde realiza o ha realizado estas actividades culturales?

Data_Hogar_Lima_Metropolitana %>%
  select(q0038_0001:q0038_0003) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0038_0001:q0038_0003) %>%
  filter(!is.na(value), value != "") %>%
  mutate(key = case_when(key == "q0038_0001" ~ "En mi distrito",
                         key == "q0038_0002" ~ "En otro distrito",
                         key == "q0038_0003" ~ "Virtualmente",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Dónde realiza o ha realizado estas \n actividades culturales?")  

3.37 ¿Alguna vez ha visto o recuerda alguna publicidad de algún museo?

Data_Hogar_Lima_Metropolitana %>%
  select(q0039) %>%
  mutate(q0039 = as.character(q0039),
         q0039 = case_when(q0039 == "1" ~ "Si",
                           q0039 == "2" ~ "No",
                           TRUE ~ q0039),
         q0039 = factor(q0039)) %>%
  filter(!is.na(q0039)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Alguna vez ha visto o recuerda \n alguna publicidad de algún museo?")

3.38 ¿Por cual de los siguientes medios la vio?

Data_Hogar_Lima_Metropolitana %>%
  select(q0040_0001:q0040_other) %>%
  sapply(as.character) %>%
  as_tibble() %>%
  gather(key = "key", value = "value", q0040_0001:q0040_other) %>%
  filter(!is.na(value), value != "", key != "q0040_0010") %>%
  mutate(key = case_when(key == "q0040_0001" ~ "Páginas web",
                         key == "q0040_0002" ~ "Redes sociales",
                         key == "q0040_0003" ~ "Radio",
                         key == "q0040_0004" ~ "Televisión",
                         key == "q0040_0005" ~ "Folletos o volantes",
                         key == "q0040_0006" ~ "En la calle (carteles, vallas)",
                         key == "q0040_0007" ~ "Periódicos",
                         key == "q0040_0008" ~ "Revistas",
                         key == "q0040_0009" ~ "Correo electrónico o llamadas",
                         key == "q0040_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Por cual de los siguientes medios la vio?")

3.38.1 otros

Data_Hogar_Lima_Metropolitana %>%
  select(q0040_other) %>%
  mutate(q0040_other = as.character(q0040_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

3.39 ¿A que museo pertenecía dicha publicidad?

Data_Hogar_Lima_Metropolitana %>%
  select(q0041) %>%
  mutate(q0041 = as.character(q0041),
         q0041 = str_remove(q0041, "Museo"),
         q0041 = str_remove(q0041, "museo")) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

3.40 ¿Te gustaría ver o escuchar alguna publicidad/información del Museo Nacional del Perú (MUNA)?

Data_Hogar_Lima_Metropolitana %>%
  select(q0042) %>%
  mutate(q0042 = as.character(q0042),
         q0042 = case_when(q0042 == "1" ~ "Si",
                           q0042 == "2" ~ "No",
                           TRUE ~ q0042),
         q0042 = factor(q0042)) %>%
  filter(!is.na(q0042)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Te gustaría ver o escuchar alguna \n publicidad/información del Museo Nacional \n del Perú (MUNA)?")

3.41 ¿Por cuales de los siguientes medios te gustaría hacerlo?

Data_Hogar_Lima_Metropolitana %>%
  select(q0043_0001:q0043_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0043_0001:q0043_other) %>%
  filter(!is.na(value), value != "", key != "q0043_0010") %>%
  mutate(key = case_when(key == "q0043_0001" ~ "Páginas web",
                         key == "q0043_0002" ~ "Redes sociales",
                         key == "q0043_0003" ~ "Radio",
                         key == "q0043_0004" ~ "Televisión",
                         key == "q0043_0005" ~ "Folletos o volantes",
                         key == "q0043_0006" ~ "En la calle (carteles, vallas)",
                         key == "q0043_0007" ~ "Periódicos",
                         key == "q0043_0008" ~ "Revistas",
                         key == "q0043_0009" ~ "Correo electrónico o llamadas",
                         key == "q0043_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Por cuales de los siguientes medios  \n te gustaría hacerlo?")

3.41.1 otros

Data_Hogar_Lima_Metropolitana %>%
  select(q0043_other) %>%
  mutate(q0043_other = as.character(q0043_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents
## Warning in wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words
## = 500, : masivament could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words
## = 500, : documental could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words
## = 500, : comunidad could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words
## = 500, : hacen could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words
## = 500, : hagan could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words
## = 500, : museo could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words
## = 500, : vece could not be fit on page. It will not be plotted.

3.42 ¿A usted le gustaría visitar el MUNA con tu familia de manera presencial?

Data_Hogar_Lima_Metropolitana %>%
  select(q0044) %>%
  mutate(q0044 = as.character(q0044),
         q0044 = case_when(q0044 == "1" ~ "Si",
                           q0044 == "2" ~ "No",
                           TRUE ~ q0044),
         q0044 = factor(q0044)) %>%
  filter(!is.na(q0044)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿A usted le gustaría visitar el MUNA con tu familia \n de manera presencial?")

3.43 ¿Cuáles son las 3 razones principales por las que Sí visitaría el MUNA?

Data_Hogar_Lima_Metropolitana %>%
  select(q0045_0001:q0045_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0045_0001:q0045_other) %>%
  filter(!is.na(value), value != "", key != "q0045_0013") %>%
  mutate(key = case_when(key == "q0045_0001" ~ "Enriquece mi conocimiento cultural",
                         key == "q0045_0002" ~ "Buscar una nueva experiencia",
                         key == "q0045_0003" ~ "Para investigación académica",
                         key == "q0045_0004" ~ "Por curiosidad",
                         key == "q0045_0005" ~ "Pasar un día con amigos/pareja",
                         key == "q0045_0006" ~ "Visitar las exposiciones temporales",
                         key == "q0045_0007" ~ "Para ver algo en específico que he oído hablar",
                         key == "q0045_0008" ~ "Para pasar un día en familia",
                         key == "q0045_0009" ~ "Enseñar el museo a amigos, conocidos o familiares",
                         key == "q0045_0010" ~ "Conocer las colecciones",
                         key == "q0045_0011" ~ "Por una actividad organizada por el museo/centro \n expositivo (servicio complementario)",
                         key == "q0045_0012" ~ "Estar incluido en una visita turística",
                         key == "q0045_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Cuáles son las 3 razones \n principales por las que \n Sí visitaría el MUNA?")

3.43.1 otros

Data_Hogar_Lima_Metropolitana %>%
  select(q0045_other) %>%
  mutate(q0045_other = as.character(q0045_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

3.44 Considerando el tiempo de traslado hacia el MUNA (distrito de Lurín en Lima) ¿Cuánto tiempo aproximadamente destinaria para visitar el MUNA ?

Data_Hogar_Lima_Metropolitana %>%
  select(q0046) %>%
  mutate(q0046 = as.character(q0046),
         q0046 = case_when(q0046 == "1" ~ "1 hora",
                           q0046 == "2" ~ "De 1 a 3 horas",
                           q0046 == "3" ~ "De 3 a 4 horas",
                           q0046 == "4" ~ "De 5 a 6 horas",
                           q0046 == "5" ~ "Más de 6 horas",
                           TRUE ~ q0046),
         q0046 = factor(q0046, levels = c("1 hora", "De 1 a 3 horas", "De 3 a 4 horas", "De 5 a 6 horas", "Más de 6 horas"))) %>%
  filter(!is.na(q0046)) %>%
  grafico(tipo = "ordinal", xlab = "", ylab = "Encuestas recopiladas", title = "Considerando el tiempo de traslado hacia el MUNA \n (distrito de Lurín en Lima) ¿Cuánto tiempo \n aproximadamente destinaria para visitar el MUNA ?")

3.45 ¿Cuánto estaría dispuesto a pagar por el ticket de entrada al MUNA ?

Data_Hogar_Lima_Metropolitana %>%
  select(q0047) %>%
  mutate(q0047 = as.character(q0047),
         q0047 = case_when(q0047 == "1" ~ "Entre 0 y 5 Soles",
                           q0047 == "2" ~ "Entre 6 y 10 Soles",
                           q0047 == "3" ~ "Entre 11 y 20 Soles",
                           q0047 == "4" ~ "Entre 21 y 50 Soles",
                           q0047 == "5" ~ "Más de 50 Soles",
                           TRUE ~ q0047),
         q0047 = factor(q0047, levels = c("Entre 0 y 5 Soles", "Entre 6 y 10 Soles", "Entre 11 y 20 Soles", "Entre 21 y 50 Soles", "Más de 50 Soles"))) %>%
  filter(!is.na(q0047)) %>%
  grafico(tipo = "ordinal", xlab = "", ylab = "Encuestas recopiladas", title = "¿Cuánto estaría dispuesto a pagar por el ticket \n de entrada al MUNA ?")

3.46 ¿Cuáles son las 3 razones principales por las que NO visitaría el MUNA?

Data_Hogar_Lima_Metropolitana %>%
  select(q0048_0001:q0048_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0048_0001:q0048_other) %>%
  filter(!is.na(value), value != "", key != "q0048_0007") %>%
  mutate(key = case_when(key == "q0048_0001" ~ "Falta de tiempo",
                         key == "q0048_0002" ~ "Desinterés",
                         key == "q0048_0003" ~ "El costo asociado a la visita \n (movilidad, alimentación, entre otros)",
                         key == "q0048_0004" ~ "El costo del ticket de entrada al MUNA",
                         key == "q0048_0005" ~ "Falta de información",
                         key == "q0048_0006" ~ "Por lejanía y poca accesibilidad",
                         key == "q0048_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Cuáles son las 3 razones principales \n por las que NO visitaría el MUNA?")

3.46.1 otros

Data_Hogar_Lima_Metropolitana %>%
  select(q0048_other) %>%
  mutate(q0048_other = as.character(q0048_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

3.47 ¿Te gustaría realizar visitas virtuales al MUNA?

Data_Hogar_Lima_Metropolitana %>%
  select(q0049) %>%
  mutate(q0049 = as.character(q0049),
         q0049 = case_when(q0049 == "1" ~ "Si",
                           q0049 == "2" ~ "No",
                           TRUE ~ q0049),
         q0049 = factor(q0049)) %>%
  filter(!is.na(q0049)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Te gustaría realizar visitas virtuales al MUNA?")

3.48 ¿Por qué no lo haria?

Data_Hogar_Lima_Metropolitana %>%
  select(q0050) %>%
  mutate(q0050 = as.character(q0050)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

3.49 ¿Cuáles son los 3 servicios más importantes que esperaría encontrar en su visita a un museo?

Data_Hogar_Lima_Metropolitana %>%
  select(q0051_0001:q0051_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0051_0001:q0051_other) %>%
  filter(!is.na(value), value != "") %>%
  mutate(key = case_when(key == "q0051_0001" ~ "Información en boletería o en sala",
                         key == "q0051_0002" ~ "Folletos de información entregados",
                         key == "q0051_0003" ~ "Espacios de encuentro, \n lugares sin carga expositiva, \n espacios no intervenidos",
                         key == "q0051_0004" ~ "Actividades guiadas por el museo",
                         key == "q0051_0005" ~ "Cafetería/restaurantes",
                         key == "q0051_0006" ~ "Tienda de souvenir",
                         key == "q0051_0007" ~ "Estacionamiento",
                         key == "q0051_0008" ~ "Traducciones",
                         key == "q0051_0009" ~ "Otro",
                         key == "q0051_other" ~ "",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  filter(!is.na(key), key != "") %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Cuáles son los 3 servicios más importantes \n que esperaría encontrar en su \n visita a un museo?")

3.49.1 Otros

Data_Hogar_Lima_Metropolitana %>%
  select(q0051_other) %>%
  mutate(q0051_other = as.character(q0051_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

3.50 ¿Qué tipo de actividades culturales le gustaría encontrar al llegar al MUNA?

Data_Hogar_Lima_Metropolitana %>%
  select(q0052_0001:q0052_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0052_0001:q0052_other) %>%
  filter(!is.na(value), value != "", key != "q0052_0006") %>%
  mutate(key = case_when(key == "q0052_0001" ~ "Exposiciones",
                         key == "q0052_0002" ~ "Conciertos",
                         key == "q0052_0003" ~ "Obras de teatro",
                         key == "q0052_0004" ~ "Danzas",
                         key == "q0052_0005" ~ "Ferias (de artesanía, \n de comida, musicales, etc.)",
                         key == "q0052_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Qué tipo de actividades culturales \n le gustaría encontrar al llegar al MUNA?")

3.50.1 Otros

Data_Hogar_Lima_Metropolitana %>%
  select(q0052_other) %>%
  mutate(q0052_other = as.character(q0052_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

3.51 En base a lo que conoces de los museos ¿Estás de acuerdo con tener un museo nacional?

Data_Hogar_Lima_Metropolitana %>%
  select(q0053) %>%
  mutate(q0053 = factor(q0053),
         q0053 = recode_factor(q0053, "1" = "5", "2" = "4", "4" = "2", "5" = "1"),
         q0053 = factor(q0053, levels = c(1, 2, 3, 4, 5), labels = c("Muy desacuerdo", 2, 3, 4, "Muy de acuerdo"))) %>%
  filter(!is.na(q0053)) %>%
  rename(estas_de_acuerdo = q0053) %>%
  grafico_likert(titulo = "En base a lo que conoces de los museos ¿Estás de acuerdo \n con tener un museo nacional?")

3.52 ¿Qué tipo de contenidos debe mostrar el museo en sus exposiciones?

Data_Hogar_Lima_Metropolitana %>%
  select(q0054_0001:q0054_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0054_0001:q0054_other) %>%
  filter(!is.na(value), value != "", key != "q0054_0010") %>%
  mutate(key = case_when(key == "q0054_0001" ~ "Temas históricos",
                         key == "q0054_0002" ~ "Identidad Cultural",
                         key == "q0054_0003" ~ "Diversidades",
                         key == "q0054_0004" ~ "Temas Coyunturales",
                         key == "q0054_0005" ~ "Realidades Regionales",
                         key == "q0054_0006" ~ "Temas educativos",
                         key == "q0054_0007" ~ "Temas innovadores",
                         key == "q0054_0008" ~ "Temas científicos tecnológicos",
                         key == "q0054_0009" ~ "No sabe, no opina",
                         key == "q0054_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Qué tipo de contenidos debe mostrar el museo \n en sus exposiciones?")

3.52.1 Otros

Data_Hogar_Lima_Metropolitana %>%
  select(q0054_other) %>%
  mutate(q0054_other = as.character(q0054_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

3.53 Según toda la información que hayas podido percibir sobre los museos ¿Me siento representado por ellos?

Data_Hogar_Lima_Metropolitana %>%
  select(q0055) %>%
  mutate(q0055 = factor(q0055),
         q0055 = recode_factor(q0055, "1" = "5", "2" = "4", "4" = "2", "5" = "1"),
         q0055 = factor(q0055, levels = c(1, 2, 3, 4, 5), labels = c("Nada representado", 2, 3, 4, "Muy representado"))) %>%
  filter(!is.na(q0055)) %>%
  rename(representado = q0055) %>%
  grafico_likert(titulo = "Según toda la información que hayas podido percibir sobre los museos \n ¿Me siento representado por ellos?")

3.54 Según lo que los museos pueda aportar en experiencia e información. ¿Qué tan importante consideras a los museos para tu familia?

Data_Hogar_Lima_Metropolitana %>%
  select(q0056) %>%
  mutate(q0056 = factor(q0056),
         q0056 = recode_factor(q0056, "1" = "5", "2" = "4", "4" = "2", "5" = "1"),
         q0056 = factor(q0056, levels = c(1, 2, 3, 4, 5), labels = c("Nada importante", 2, 3, 4, "Muy importante"))) %>%
  filter(!is.na(q0056)) %>%
  grafico_likert("Según lo que los museos pueda aportar en experiencia e información. \n ¿Qué tan importante consideras a los museos para tu familia?")

3.55 LIKERT

Data_Hogar_Lima_Metropolitana %>%
  select(q0057_0001:q0057_0005) %>%
  mutate(q0057_0001 = factor(q0057_0001, levels = c(1, 2, 3, 4, 5), labels = c("Muy en desacuerdo.", 2, 3, 4, "Muy de acuerdo.")),
         q0057_0002 = factor(q0057_0002, levels = c(1, 2, 3, 4, 5), labels = c("Muy en desacuerdo.", 2, 3, 4, "Muy de acuerdo.")),
         q0057_0003 = factor(q0057_0003, levels = c(1, 2, 3, 4, 5), labels = c("Muy en desacuerdo.", 2, 3, 4, "Muy de acuerdo.")),
         q0057_0004 = factor(q0057_0004, levels = c(1, 2, 3, 4, 5), labels = c("Muy en desacuerdo.", 2, 3, 4, "Muy de acuerdo.")),
         q0057_0005 = factor(q0057_0005, levels = c(1, 2, 3, 4, 5), labels = c("Muy en desacuerdo.", 2, 3, 4, "Muy de acuerdo."))) %>%
  rename(educacion = q0057_0001,
         turismo = q0057_0002,
         recreacion = q0057_0003,
         aprendizaje = q0057_0004,
         diversidad = q0057_0005) %>%
  grafico_likert(titulo = "Los museos contribuyen a la 'educación' de todas las personas. \n El museo es un lugar para hacer 'turismo'. \n El museo es un lugar de 'recreación'. \n El museo es un lugar de 'aprendizaje'. \n Los museos contribuyen a valorar la 'diversidad' cultural.")

3.56 Para usted, el museo significa:

Data_Hogar_Lima_Metropolitana %>%
  select(q0058_0001:q0058_0003) %>%
  gather(key = "key", value = "value", q0058_0001:q0058_0003) %>%
  select(value) %>%
  filter(!is.na(value), value != "") %>%
  mutate(value = as.character(value)) %>%
  cloud()
## Warning: attributes are not identical across measure variables;
## they will be dropped
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

4 Data Hogar Muestra en Lima Metropolitana Sur

4.1 ¿En que distrito vive actualmente?

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0003_0003) %>%
  mutate(q0003_0003 = str_to_title(q0003_0003),
         q0003_0003 = str_replace(q0003_0003, "Smp", "San Martín De Porres"),
         q0003_0003 = str_replace(q0003_0003, "Villa Maria Del Triunfo", "Villa María Del Triunfo"),
         q0003_0003 = str_replace(q0003_0003, "Chorrilos", "Chorrillos"),
         q0003_0003 = str_replace(q0003_0003, "San Juan De Lurignacho", "San Juan De Lurigancho"),
         q0003_0003 = factor(q0003_0003),
         q0003_0003 = str_replace(q0003_0003, "San Martin De Porres", "San Martín De Porres")) %>%
  grafico(tipo = "cualitativo1", xlab = "Distritos", ylab = "Encuestas recopiladas", title = "Cantidad de encuestas recopiladas por Distrito")

4.2 ¿Que edad tiene usted ?

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0004_X_Rang) %>%
  mutate(q0004_X_Rang = factor(q0004_X_Rang, levels = c("1", "2", "3", "4"), labels = c("Menos a 30 años", "De 30 a 44 Años", "De 45 a 59 años", "De 60 a más años"))) %>%
  grafico(tipo = "ordinal", xlab = "Edad", ylab = "Encuestas recopiladas", title = "Cantidad de encuestas recopiladas por Edad")

4.3 ¿Cuál es su lengua materna?

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0005, q0005_other) %>%
  mutate(q0005 = as.character(q0005),
         q0005_other = as.character(q0005_other),
         q0005 = case_when(q0005 == "0" ~ "Otro",
                           q0005 == "1" ~ "Quechua",
                           q0005 == "2" ~ "Asháninca",
                           q0005 == "3" ~ "Aimara",
                           q0005 == "4" ~ "Español",
                           TRUE ~ q0005)) %>%
  select(q0005) %>%
  mutate(q0005 = factor(q0005)) %>%
  grafico(tipo = "cualitativo2", xlab = "Lengua materna", ylab = "Encuestas recopiladas", title = "Cantidad de encuestas recopiladas por Lengua materna")

4.3.1 Otro

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0005_other) %>%
  mutate(q0005_other = as.character(q0005_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

4.4 ¿Domina alguna lengua además de la materna?

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0006) %>%
  mutate(q0006 = as.character(q0006),
         q0006 = case_when(q0006 == "1" ~ "Si",
                           q0006 == "2" ~ "No",
                           TRUE ~ q0006),
         q0006 = factor(q0006)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Domina alguna lengua además de la materna?")

4.5 ¿Qué otra lengua domina?

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0007_0001:q0007_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0007_0001:q0007_other) %>%
  filter(!is.na(value), value != "", key != "q0007_0008") %>%
  mutate(key = case_when(key == "q0007_0001" ~ "Quechua",
                         key == "q0007_0002" ~ "Aimara",
                         key == "q0007_0003" ~ "Asháninca",
                         key == "q0007_0004" ~ "Español",
                         key == "q0007_0005" ~ "Ingles",
                         key == "q0007_0006" ~ "Portugués",
                         key == "q0007_0007" ~ "Francés",
                         key == "q0007_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "Idioma", ylab = "frecuencia", title = "¿Qué otra lengua domina?")

4.5.1 Otro

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0007_other) %>%
  mutate(q0007_other = as.character(q0007_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

4.6 Según las actividades que realiza diariamente ¿Cuál es su ocupación actual?

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0008, q0008_other) %>%
  mutate_all(as.character) %>%
  mutate(q0008 = case_when(q0008 == "0" ~ "Otro",
                           q0008 == "1" ~ "Trabajador dependiente",
                           q0008 == "2" ~ "Trabajador independiente",
                           q0008 == "3" ~ "Ama (o) de casa",
                           q0008 == "4" ~ "Estudiante técnico o universitario",
                           q0008 == "5" ~ "Sin ocupación",
                           TRUE ~ q0008),
         q0008 = factor(q0008)) %>%
  select(q0008) %>%
  grafico(tipo = "cualitativo1", xlab = "Ocupacion", ylab = "frecuencia", title = "¿Cuál es su ocupación actual?")

4.6.1 Otro

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0008_other) %>%
  mutate(q0008_other = as.character(q0008_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

4.7 Por el tiempo que destina semanalmente a su trabajo ¿Cuál de las siguientes opciones lo define mejor?

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0009) %>%
  mutate(q0009 = as.character(q0009),
         q0009 = case_when(q0009 == "1" ~ "Trabajador Full-Time \n (8 Horas x 6 dias o 48 horas semanales)",
                           q0009 == "2" ~ "Trabajador Middle- Time \n (6 Horas x 6 Dias o 36 horas semanales)",
                           q0009 == "3" ~ "Trabajador Part- Time \n (4 Horas x 6 dias o 24 horas semanales)",
                           q0009 == "4" ~ "Tengo más de un trabajo a la vez",
                           TRUE ~ q0009),
         q0009 = factor(q0009, levels = c("Tengo más de un trabajo a la vez", "Trabajador Part- Time \n (4 Horas x 6 dias o 24 horas semanales)", "Trabajador Middle- Time \n (6 Horas x 6 Dias o 36 horas semanales)", "Trabajador Full-Time \n (8 Horas x 6 dias o 48 horas semanales)"))) %>%
  filter(!is.na(q0009)) %>%
  grafico(tipo = "ordinal", xlab = "Tiempos de trabajo", ylab = "frecuencia", title = "¿Cuál de las siguientes opciones \n lo define mejor?")

4.8 ¿Cuál es su nivel de instrucción?

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0010) %>%
  mutate(q0010 = as.character(q0010),
         q0010 = case_when(q0010 == "1" ~ "Inicial",
                           q0010 == "2" ~ "Primaria",
                           q0010 == "3" ~ "Secundaria",
                           q0010 == "4" ~ "Superior Técnico",
                           q0010 == "5" ~ "Superior Universitario",
                           q0010 == "6" ~ "Postgrado",
                           q0010 == "7" ~ "Ningún grado de instrucción",
                           TRUE ~ q0010),
         q0010 = factor(q0010, levels = c("Ningún grado de instrucción", "Inicial", "Primaria", "Secundaria", "Superior Técnico", "Superior Universitario", "Postgrado"))) %>%
  grafico(tipo = "ordinal", xlab = "Nivel", ylab = "frecuencia", title = "¿Cuál es su nivel de instrucción?")

4.9 Por tu autoidentificación de género te consideras:

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0011, q0011_other) %>%
  mutate_all(as.character) %>%
  mutate(q0011 = case_when(q0011 == "0" ~ "Otro",
                           q0011 == "1" ~ "Hombre",
                           q0011 == "2" ~ "Mujer",
                           q0011 == "3" ~ "Prefiero no decirlo",
                           q0011 == "4" ~ "Otro",
                           TRUE ~ q0011),
         q0011 = factor(q0011)) %>%
  select(q0011) %>%
  grafico(tipo = "cualitativo2", xlab = "Género", ylab = "frecuencia", title = "Por tu autoidentificación de género te consideras:")

4.9.1 Otro

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0011_other) %>%
  mutate(q0011_other = as.character(q0011_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents
## NULL

4.10 Por sus costumbres y sus antepasados usted se considera:

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0012, q0012_other) %>%
  sapply(as.character) %>%
  as_tibble() %>%
  mutate(q0012 = case_when(q0012 == "0" ~ "Otro",
                           q0012 == "1" ~ "Quechua",
                           q0012 == "2" ~ "Aimara",
                           q0012 == "3" ~ "Parte de otro pueblo indígena u originario",
                           q0012 == "4" ~ "Mestizo",
                           q0012 == "5" ~ "Blanco",
                           q0012 == "6" ~ "Negro, moreno, zambo, mulato / \n pueblo afroperuano o afrodescendiente",
                           q0012 == "7" ~ "Tusan",
                           q0012 == "8" ~ "Nikkei",
                           q0012 == "9" ~ "Otro",
                           TRUE ~ q0012),
         q0012 = factor(q0012)) %>%
  select(q0012) %>%
  filter(!is.na(q0012), q0012 != "") %>%
  grafico(tipo = "cualitativo1", xlab = "Costumbres", ylab = "frecuencia", title = "Por sus costumbres y sus antepasados \n usted se considera:")

4.10.1 Otro

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0012_other) %>%
  mutate(q0012_other = as.character(q0012_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents
## NULL

4.11 ¿Qué tan importante considera el aspecto cultural en su vida y en la de su familia?

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0013) %>%
  mutate(q0013 = factor(q0013),
         q0013 = recode_factor(q0013, "1" = "5", "2" = "4", "4" = "2", "5" = "1"),
         q0013 = factor(q0013, levels = c(1, 2, 3, 4, 5), labels = c("Nada importante", 2, 3, 4, "Muy importante"))) %>%
  filter(!is.na(q0013)) %>%
  rename(aspecto_cultural = q0013) %>%
  grafico_likert(titulo = "¿Qué tan importante considera el aspecto cultural \n en su vida y en la de su familia?")

4.12 ¿Alguna vez ha visitado un museo?

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0014) %>%
  mutate(q0014 = as.character(q0014),
         q0014 = case_when(q0014 == "1" ~ "Si",
                           q0014 == "2" ~ "No",
                           TRUE ~ q0014),
         q0014 = factor(q0014)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "frecuencia", title = "¿Alguna vez ha visitado un museo?")

4.13 ¿Le gusta visitar museos?

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0015) %>%
  mutate(q0015 = as.character(q0015),
         q0015 = case_when(q0015 == "1" ~ "Si",
                           q0015 == "2" ~ "No",
                           TRUE ~ q0015),
         q0015 = factor(q0015)) %>%
  filter(!is.na(q0015)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "frecuencia", title = "¿Le gusta visitar museos?")

4.14 ¿Qué te motiva a visitarlos?

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0016_0001:q0016_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0016_0001:q0016_other) %>%
  filter(!is.na(value), value != "", key != "q0016_0011") %>%
  mutate(key = case_when(key == "q0016_0001" ~ "enriquece mi conocimiento cultural",
                         key == "q0016_0002" ~ "buscar una nueva experiencia",
                         key == "q0016_0003" ~ "pasar un día con amigos/pareja",
                         key == "q0016_0004" ~ "visitar las exposiciones temporales",
                         key == "q0016_0005" ~ "para ver algo en específico que he oído hablar",
                         key == "q0016_0006" ~ "pasar un día en familia",
                         key == "q0016_0007" ~ "enseñar el museo a amigos, conocidos o familiares",
                         key == "q0016_0008" ~ "conocer las colecciones",
                         key == "q0016_0009" ~ "por una actividad organizada por \n el museo/centro expositivo (servicio complementario)",
                         key == "q0016_0010" ~ "esta incluido en una visita turística",
                         key == "q0016_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "Motivo", ylab = "frecuencia", title = "¿Qué te motiva a visitarlos?")

4.14.1 Otro

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0016_other) %>%
  mutate(q0016_other = as.character(q0016_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents
## Warning in wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words
## = 500, : antepasado could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words
## = 500, : costumbr could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words
## = 500, : representada could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words
## = 500, : sentirm could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words
## = 500, : conoc could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words
## = 500, : emocionant could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words
## = 500, : recreación could not be fit on page. It will not be plotted.

4.15 ¿Qué no le gustó de ellos?

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0017_0001:q0017_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0017_0001:q0017_other) %>%
  filter(!is.na(value), value != "", key != "q0017_0007") %>%
  mutate(key = case_when(key == "q0017_0001" ~ "Que fue aburrido y monótono",
                         key == "q0017_0002" ~ "Que no se entienden",
                         key == "q0017_0003" ~ "Exponen cosas que no me interesan",
                         key == "q0017_0004" ~ "Mala calidad de los servicios del museo",
                         key == "q0017_0005" ~ "Guías de turismo no brindaron un buen servicio",
                         key == "q0017_0006" ~ "Nada me ha disgustado en mi visita",
                         key == "q0017_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Qué no le gustó de ellos?")

4.15.1 Otro

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0017_other) %>%
  mutate(q0017_other = as.character(q0017_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

4.16 ¿Qué no le gusta de ellos?

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0018_0001:q0018_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0018_0001:q0018_other) %>%
  filter(!is.na(value), value != "", key != "q0018_0006") %>%
  mutate(key = case_when(key == "q0018_0001" ~ "Que sean aburridos y monótonos",
                         key == "q0018_0002" ~ "Que no se entienden",
                         key == "q0018_0003" ~ "Exponen cosas que no me interesan",
                         key == "q0018_0004" ~ "Mala calidad de los servicios del museo",
                         key == "q0018_0005" ~ "Guías de turismo no brindan un buen servicio",
                         key == "q0018_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Qué no le gusta de ellos?")

4.16.1 Otro

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0018_other_X) %>%
  mutate(q0018_other_X = as.character(q0018_other_X)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

4.17 En el año 2019, ¿ha visitado museos de manera presencial?

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0019) %>%
  mutate(q0019 = as.character(q0019),
         q0019 = case_when(q0019 == "1" ~ "Si",
                           q0019 == "2" ~ "No",
                           TRUE ~ q0019),
         q0019 = factor(q0019)) %>%
  filter(!is.na(q0019)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "En el año 2019, ¿ha visitado museos \n de manera presencial?")

4.18 ¿Cuántas veces ha visitado un museo en el 2019?

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q00020_X_Rang) %>%
  mutate(q00020_X_Rang = factor(q00020_X_Rang, levels = c(1, 2), labels = c("De 1 a 3 veces", "Más de 4 veces"))) %>%
  filter(!is.na(q00020_X_Rang)) %>%
  grafico(tipo = "ordinal", xlab = "N° de Veces", ylab = "Encuestas recopiladas", title = "¿Cuántas veces ha visitado un museo en el 2019?")

4.19 Respecto a su última visita ¿usted realizo la visita solo o acompañado o formo parte de un grupo?

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0021) %>%
  mutate(q0021 = as.character(q0021),
         q0021 = case_when(q0021 == "1" ~ "He ido solo",
                           q0021 == "2" ~ "He ido acompañado de otras personas \n (pareja, amigos, familia)",
                           q0021 == "3" ~ "He ido en un grupo organizado \n (tours turísticos, grupos con algún fin u objetivo)",
                           TRUE ~ q0021),
         q0021 = factor(q0021)) %>%
  filter(!is.na(q0021)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "Respecto a su última visita \n ¿usted realizo la visita solo \n o acompañado o formo parte \n de un grupo?")

4.20 ¿Cuántas personas lo acompañaron en promedio?

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q00022_X_Rang) %>%
  mutate(q00022_X_Rang = factor(q00022_X_Rang, levels = c(1, 2, 3), labels = c("De 1 a 9 personas", "De 10 a 15 personas", "Más de 15 personas"))) %>%
  filter(!is.na(q00022_X_Rang)) %>%
  grafico(tipo = "ordinal", xlab = "N° de personas", ylab = "Encuestas recopiladas", title = "¿Cuántas personas lo acompañaron en promedio?")

4.21 Cuéntenos, ¿con quién fue al museo? (Puede marcar varias de las siguientes opciones):

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0023_0001:q0023_0005) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0023_0001:q0023_0005) %>%
  filter(!is.na(value), value != "") %>%
  mutate(key = case_when(key == "q0023_0001" ~ "Solo con mi pareja",
                         key == "q0023_0002" ~ "Mi familia (hijos(as), esposa (o))",
                         key == "q0023_0003" ~ "Mis padres",
                         key == "q0023_0004" ~ "Otros parientes",
                         key == "q0023_0005" ~ "Colegas o amigos",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿con quién fue al museo?")  

4.22 ¿Cuántas personas lo acompañaron en promedio?

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q00024_X_Rang) %>%
  mutate(q00024_X_Rang = factor(q00024_X_Rang, levels = c(1, 2, 3), labels = c("De 1 a 9 personas", "De 10 a 15 personas", "Más de 15 personas"))) %>%
  filter(!is.na(q00024_X_Rang)) %>%
  grafico(tipo = "ordinal", xlab = "N° de personas", ylab = "Encuestas recopiladas", title = "¿Cuántas personas lo acompañaron en promedio?")

4.23 ¿Qué tipo de grupo fue? (Puede marcar varias de las siguientes opciones):

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0025_0001:q0025_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0025_0001:q0025_other) %>%
  filter(!is.na(value), value != "", key != "q0025_0004") %>%
  mutate(key = case_when(key == "q0025_0001" ~ "Un grupo de personas \n organizado en visitas turísticas",
                         key == "q0025_0002" ~ "Un grupo escolar/educativo",
                         key == "q0025_0003" ~ "Un grupo organizado \n en visita cultural",
                         key == "q0025_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "frecuencia", title = "¿Qué tipo de grupo fue?")

4.23.1 Otro

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0025_other) %>%
  mutate(q0025_other = as.character(q0025_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents
## NULL

4.24 En general ¿Cuáles son los tres (03) principales problemas que ha experimentado o que encuentra en la actualidad durante su visita a un museo?

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0026_0001:q0026_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0026_0001:q0026_other) %>%
  filter(!is.na(value), value != "", key != "q0026_0011") %>%
  mutate(key = case_when(key == "q0026_0001" ~ "Respecto a la ubicación del museo (entorno)",
                         key == "q0026_0002" ~ "Respecto a costo de tickets",
                         key == "q0026_0003" ~ "Respecto a distancias en el transporte",
                         key == "q0026_0004" ~ "Respecto a costo del transporte",
                         key == "q0026_0005" ~ "Respecto a disponibilidad de estacionamientos",
                         key == "q0026_0006" ~ "Respecto a espacios de investigación",
                         key == "q0026_0007" ~ "Respecto a espacios pedagógicos/didácticos",
                         key == "q0026_0008" ~ "Exposiciones no están acordes \n al curriculum nacional",
                         key == "q0026_0009" ~ "No hay guiado especializado para niños",
                         key == "q0026_0010" ~ "No he tenido problemas durante mi visita",
                         key == "q0026_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "En general ¿Cuáles son los tres (03) \n principales problemas que \n ha experimentado o que encuentra en la \n actualidad durante su visita a un museo?")

4.24.1 Otro

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0026_other) %>%
  mutate(q0026_other = as.character(q0026_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

4.25 ¿Ud. buscó información antes de realizar una visita?

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0027) %>%
  mutate(q0027 = as.character(q0027),
         q0027 = case_when(q0027 == "1" ~ "Si",
                           q0027 == "2" ~ "No",
                           TRUE ~ q0027),
         q0027 = factor(q0027)) %>%
  filter(!is.na(q0027)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "En el año 2019, ¿Ud. buscó información \n antes de realizar una visita?")

4.26 ¿Qué tipo de información buscó?

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0028_0001:q0028_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0028_0001:q0028_other) %>%
  filter(!is.na(value), value != "", key != "q0028_0008") %>%
  mutate(key = case_when(key == "q0028_0001" ~ "Precios de entrada",
                         key == "q0028_0002" ~ "Dirección exacta/referencias",
                         key == "q0028_0003" ~ "Actividades adicionales dentro del museo \n (concierto, teatro, cine, otros)",
                         key == "q0028_0004" ~ "Servicios adicionales (restaurantes, cafeterías)",
                         key == "q0028_0005" ~ "Servicios para personas con habilidades especiales",
                         key == "q0028_0006" ~ "Si el lugar cuenta con personal capacitado \n e instalaciones adecuadas para acoger a \n personas con habilidades especiales.",
                         key == "q0028_0007" ~ "Tipo de contenido",
                         key == "q0028_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Qué tipo de información buscó?")

4.26.1 Otro

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0028_other) %>%
  mutate(q0028_other = as.character(q0028_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

4.27 ¿Por qué no?

Proviene de la respuesta “no” de la pregunta: ¿alguna vez ha visitado un museo?

Data_Hogar_Lima_Metropolitana_Sur %>%
select(q0029_0001:q0029_0004) %>%
mutate_all(as.character) %>%
gather(key = "key", value = "value", q0029_0001:q0029_0004) %>%
filter(!is.na(value), value != "") %>%
mutate(key = case_when(key == "q0029_0001" ~ "Falta de tiempo",
                       key == "q0029_0002" ~ "Lejanía/ poca accesibilidad al museo",
                       key == "q0029_0003" ~ "Falta de información sobre los museos",
                       key == "q0029_0004" ~ "No me resulta interesante/no me gusta",
                       TRUE ~ key),
       key = factor(key)) %>%
select(key) %>%
grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Por qué no?")  

4.28 ¿Qué redes sociales utiliza frecuentemente?

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0030_0001:q0030_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0030_0001:q0030_other) %>%
  filter(!is.na(value), value != "", key != "q0030_0006") %>%
  mutate(key = case_when(key == "q0030_0001" ~ "Facebook",
                         key == "q0030_0002" ~ "Instagram",
                         key == "q0030_0003" ~ "YouTube",
                         key == "q0030_0004" ~ "Tik Tok",
                         key == "q0030_0005" ~ "No utilizo ninguna red social",
                         key == "q0030_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Qué redes sociales utiliza frecuentemente?")

4.28.1 otros

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0030_other) %>%
  mutate(q0030_other = as.character(q0030_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

4.29 ¿Sigue a museos (nacionales/extranjeros) en sus redes sociales?

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0031) %>%
  mutate(q0031 = as.character(q0031),
         q0031 = case_when(q0031 == "1" ~ "Si",
                           q0031 == "2" ~ "No",
                           TRUE ~ q0031),
         q0031 = factor(q0031)) %>%
  filter(!is.na(q0031)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Sigue a museos (nacionales/extranjeros) \n en sus redes sociales?")

4.30 ¿Se siente identificado(a) con sus contenidos?

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0032) %>%
  mutate(q0032 = factor(q0032),
         q0032 = recode_factor(q0032, "1" = "5", "2" = "4", "4" = "2", "5" = "1"),
         q0032 = factor(q0032, levels = c(1, 2, 3, 4, 5), labels = c("Nada identificado", 2, 3, 4, "Muy identificado"))) %>%
  filter(!is.na(q0032)) %>%
  rename(contenidos = q0032) %>%
  grafico_likert(titulo = "¿Se siente identificado(a) con sus contenidos?")

4.31 ¿Ha considerado ir a un museo actualmente?

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0033) %>%
  mutate(q0033 = as.character(q0033),
         q0033 = case_when(q0033 == "1" ~ "Si",
                           q0033 == "2" ~ "No",
                           TRUE ~ q0033),
         q0033 = factor(q0033)) %>%
  filter(!is.na(q0033)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Ha considerado ir a un museo actualmente?")

4.32 ¿Por que no iría a un museo actualmente?

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0034) %>%
  mutate(q0034 = as.character(q0034)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

4.33 ¿Alguna vez ha visitado un museo de manera virtual?

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0035) %>%
  mutate(q0035 = as.character(q0035),
         q0035 = case_when(q0035 == "1" ~ "Si",
                           q0035 == "2" ~ "No",
                           TRUE ~ q0035),
         q0035 = factor(q0035)) %>%
  filter(!is.na(q0035)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Alguna vez ha visitado un museo de manera virtual?")

4.34 ¿Qué museo visitaste virtualmente?

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0036) %>%
  mutate(q0036 = as.character(q0036),
         q0036 = str_remove_all(q0036, "MUSEO"),
         q0036 = str_remove_all(q0036, "Museo"),
         q0036 = str_remove_all(q0036, "museo")) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

4.35 ¿Qué otros espacios culturales visita o ha visitado con frecuencia?

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0037_0001:q0037_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0037_0001:q0037_other) %>%
  filter(!is.na(value), value != "", key != "q0037_0006") %>%
  mutate(key = case_when(key == "q0037_0001" ~ "Teatro",
                         key == "q0037_0002" ~ "Cine",
                         key == "q0037_0003" ~ "Conciertos",
                         key == "q0037_0004" ~ "Parques",
                         key == "q0037_0005" ~ "Ferias y circos",
                         key == "q0037_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Qué otros espacios culturales visita \n o ha visitado con frecuencia?")

4.35.1 otros

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0037_other) %>%
  mutate(q0037_other = as.character(q0037_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

4.36 ¿Dónde realiza o ha realizado estas actividades culturales?

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0038_0001:q0038_0003) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0038_0001:q0038_0003) %>%
  filter(!is.na(value), value != "") %>%
  mutate(key = case_when(key == "q0038_0001" ~ "En mi distrito",
                         key == "q0038_0002" ~ "En otro distrito",
                         key == "q0038_0003" ~ "Virtualmente",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Dónde realiza o ha realizado estas \n actividades culturales?")  

4.37 ¿Alguna vez ha visto o recuerda alguna publicidad de algún museo?

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0039) %>%
  mutate(q0039 = as.character(q0039),
         q0039 = case_when(q0039 == "1" ~ "Si",
                           q0039 == "2" ~ "No",
                           TRUE ~ q0039),
         q0039 = factor(q0039)) %>%
  filter(!is.na(q0039)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Alguna vez ha visto o recuerda \n alguna publicidad de algún museo?")

4.38 ¿Por cual de los siguientes medios la vio?

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0040_0001:q0040_other) %>%
  sapply(as.character) %>%
  as_tibble() %>%
  gather(key = "key", value = "value", q0040_0001:q0040_other) %>%
  filter(!is.na(value), value != "", key != "q0040_0010") %>%
  mutate(key = case_when(key == "q0040_0001" ~ "Páginas web",
                         key == "q0040_0002" ~ "Redes sociales",
                         key == "q0040_0003" ~ "Radio",
                         key == "q0040_0004" ~ "Televisión",
                         key == "q0040_0005" ~ "Folletos o volantes",
                         key == "q0040_0006" ~ "En la calle (carteles, vallas)",
                         key == "q0040_0007" ~ "Periódicos",
                         key == "q0040_0008" ~ "Revistas",
                         key == "q0040_0009" ~ "Correo electrónico o llamadas",
                         key == "q0040_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Por cual de los siguientes medios la vio?")

4.38.1 otros

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0040_other) %>%
  mutate(q0040_other = as.character(q0040_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

4.39 ¿A que museo pertenecía dicha publicidad?

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0041) %>%
  mutate(q0041 = as.character(q0041),
         q0041 = str_remove(q0041, "Museo"),
         q0041 = str_remove(q0041, "museo")) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

4.40 ¿Te gustaría ver o escuchar alguna publicidad/información del Museo Nacional del Perú (MUNA)?

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0042) %>%
  mutate(q0042 = as.character(q0042),
         q0042 = case_when(q0042 == "1" ~ "Si",
                           q0042 == "2" ~ "No",
                           TRUE ~ q0042),
         q0042 = factor(q0042)) %>%
  filter(!is.na(q0042)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Te gustaría ver o escuchar alguna \n publicidad/información del Museo Nacional \n del Perú (MUNA)?")

4.41 ¿Por cuales de los siguientes medios te gustaría hacerlo?

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0043_0001:q0043_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0043_0001:q0043_other) %>%
  filter(!is.na(value), value != "", key != "q0043_0010") %>%
  mutate(key = case_when(key == "q0043_0001" ~ "Páginas web",
                         key == "q0043_0002" ~ "Redes sociales",
                         key == "q0043_0003" ~ "Radio",
                         key == "q0043_0004" ~ "Televisión",
                         key == "q0043_0005" ~ "Folletos o volantes",
                         key == "q0043_0006" ~ "En la calle (carteles, vallas)",
                         key == "q0043_0007" ~ "Periódicos",
                         key == "q0043_0008" ~ "Revistas",
                         key == "q0043_0009" ~ "Correo electrónico o llamadas",
                         key == "q0043_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Por cuales de los siguientes medios  \n te gustaría hacerlo?")

4.41.1 otros

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0043_other) %>%
  mutate(q0043_other = as.character(q0043_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

4.42 ¿A usted le gustaría visitar el MUNA con tu familia de manera presencial?

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0044) %>%
  mutate(q0044 = as.character(q0044),
         q0044 = case_when(q0044 == "1" ~ "Si",
                           q0044 == "2" ~ "No",
                           TRUE ~ q0044),
         q0044 = factor(q0044)) %>%
  filter(!is.na(q0044)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿A usted le gustaría visitar el MUNA con tu familia \n de manera presencial?")

4.43 ¿Cuáles son las 3 razones principales por las que Sí visitaría el MUNA?

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0045_0001:q0045_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0045_0001:q0045_other) %>%
  filter(!is.na(value), value != "", key != "q0045_0013") %>%
  mutate(key = case_when(key == "q0045_0001" ~ "Enriquece mi conocimiento cultural",
                         key == "q0045_0002" ~ "Buscar una nueva experiencia",
                         key == "q0045_0003" ~ "Para investigación académica",
                         key == "q0045_0004" ~ "Por curiosidad",
                         key == "q0045_0005" ~ "Pasar un día con amigos/pareja",
                         key == "q0045_0006" ~ "Visitar las exposiciones temporales",
                         key == "q0045_0007" ~ "Para ver algo en específico que he oído hablar",
                         key == "q0045_0008" ~ "Para pasar un día en familia",
                         key == "q0045_0009" ~ "Enseñar el museo a amigos, conocidos o familiares",
                         key == "q0045_0010" ~ "Conocer las colecciones",
                         key == "q0045_0011" ~ "Por una actividad organizada por el museo/centro \n expositivo (servicio complementario)",
                         key == "q0045_0012" ~ "Estar incluido en una visita turística",
                         key == "q0045_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Cuáles son las 3 razones \n principales por las que \n Sí visitaría el MUNA?")

4.43.1 otros

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0045_other) %>%
  mutate(q0045_other = as.character(q0045_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

4.44 Considerando el tiempo de traslado hacia el MUNA (distrito de Lurín en Lima) ¿Cuánto tiempo aproximadamente destinaria para visitar el MUNA ?

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0046) %>%
  mutate(q0046 = as.character(q0046),
         q0046 = case_when(q0046 == "1" ~ "1 hora",
                           q0046 == "2" ~ "De 1 a 3 horas",
                           q0046 == "3" ~ "De 3 a 4 horas",
                           q0046 == "4" ~ "De 5 a 6 horas",
                           q0046 == "5" ~ "Más de 6 horas",
                           TRUE ~ q0046),
         q0046 = factor(q0046, levels = c("1 hora", "De 1 a 3 horas", "De 3 a 4 horas", "De 5 a 6 horas", "Más de 6 horas"))) %>%
  filter(!is.na(q0046)) %>%
  grafico(tipo = "ordinal", xlab = "", ylab = "Encuestas recopiladas", title = "Considerando el tiempo de traslado hacia el MUNA \n (distrito de Lurín en Lima) ¿Cuánto tiempo \n aproximadamente destinaria para visitar el MUNA ?")

4.45 ¿Cuánto estaría dispuesto a pagar por el ticket de entrada al MUNA ?

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0047) %>%
  mutate(q0047 = as.character(q0047),
         q0047 = case_when(q0047 == "1" ~ "Entre 0 y 5 Soles",
                           q0047 == "2" ~ "Entre 6 y 10 Soles",
                           q0047 == "3" ~ "Entre 11 y 20 Soles",
                           q0047 == "4" ~ "Entre 21 y 50 Soles",
                           q0047 == "5" ~ "Más de 50 Soles",
                           TRUE ~ q0047),
         q0047 = factor(q0047, levels = c("Entre 0 y 5 Soles", "Entre 6 y 10 Soles", "Entre 11 y 20 Soles", "Entre 21 y 50 Soles", "Más de 50 Soles"))) %>%
  filter(!is.na(q0047)) %>%
  grafico(tipo = "ordinal", xlab = "", ylab = "Encuestas recopiladas", title = "¿Cuánto estaría dispuesto a pagar por el ticket \n de entrada al MUNA ?")

4.46 ¿Cuáles son las 3 razones principales por las que NO visitaría el MUNA?

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0048_0001:q0048_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0048_0001:q0048_other) %>%
  filter(!is.na(value), value != "", key != "q0048_0007") %>%
  mutate(key = case_when(key == "q0048_0001" ~ "Falta de tiempo",
                         key == "q0048_0002" ~ "Desinterés",
                         key == "q0048_0003" ~ "El costo asociado a la visita \n (movilidad, alimentación, entre otros)",
                         key == "q0048_0004" ~ "El costo del ticket de entrada al MUNA",
                         key == "q0048_0005" ~ "Falta de información",
                         key == "q0048_0006" ~ "Por lejanía y poca accesibilidad",
                         key == "q0048_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Cuáles son las 3 razones principales \n por las que NO visitaría el MUNA?")

4.46.1 otros

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0048_other) %>%
  mutate(q0048_other = as.character(q0048_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

4.47 ¿Te gustaría realizar visitas virtuales al MUNA?

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0049) %>%
  mutate(q0049 = as.character(q0049),
         q0049 = case_when(q0049 == "1" ~ "Si",
                           q0049 == "2" ~ "No",
                           TRUE ~ q0049),
         q0049 = factor(q0049)) %>%
  filter(!is.na(q0049)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Te gustaría realizar visitas virtuales al MUNA?")

4.48 ¿Por qué no lo haria?

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0050) %>%
  mutate(q0050 = as.character(q0050)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

4.49 ¿Cuáles son los 3 servicios más importantes que esperaría encontrar en su visita a un museo?

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0051_0001:q0051_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0051_0001:q0051_other) %>%
  filter(!is.na(value), value != "") %>%
  mutate(key = case_when(key == "q0051_0001" ~ "Información en boletería o en sala",
                         key == "q0051_0002" ~ "Folletos de información entregados",
                         key == "q0051_0003" ~ "Espacios de encuentro, \n lugares sin carga expositiva, \n espacios no intervenidos",
                         key == "q0051_0004" ~ "Actividades guiadas por el museo",
                         key == "q0051_0005" ~ "Cafetería/restaurantes",
                         key == "q0051_0006" ~ "Tienda de souvenir",
                         key == "q0051_0007" ~ "Estacionamiento",
                         key == "q0051_0008" ~ "Traducciones",
                         key == "q0051_0009" ~ "Otro",
                         key == "q0051_other" ~ "",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  filter(!is.na(key), key != "") %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Cuáles son los 3 servicios más importantes \n que esperaría encontrar en su \n visita a un museo?")

4.49.1 Otros

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0051_other) %>%
  mutate(q0051_other = as.character(q0051_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

4.50 ¿Qué tipo de actividades culturales le gustaría encontrar al llegar al MUNA?

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0052_0001:q0052_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0052_0001:q0052_other) %>%
  filter(!is.na(value), value != "", key != "q0052_0006") %>%
  mutate(key = case_when(key == "q0052_0001" ~ "Exposiciones",
                         key == "q0052_0002" ~ "Conciertos",
                         key == "q0052_0003" ~ "Obras de teatro",
                         key == "q0052_0004" ~ "Danzas",
                         key == "q0052_0005" ~ "Ferias (de artesanía, \n de comida, musicales, etc.)",
                         key == "q0052_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Qué tipo de actividades culturales \n le gustaría encontrar al llegar al MUNA?")

4.50.1 Otros

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0052_other) %>%
  mutate(q0052_other = as.character(q0052_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

4.51 En base a lo que conoces de los museos ¿Estás de acuerdo con tener un museo nacional?

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0053) %>%
  mutate(q0053 = factor(q0053),
         q0053 = recode_factor(q0053, "1" = "5", "2" = "4", "4" = "2", "5" = "1"),
         q0053 = factor(q0053, levels = c(1, 2, 3, 4, 5), labels = c("Muy desacuerdo", 2, 3, 4, "Muy de acuerdo"))) %>%
  filter(!is.na(q0053)) %>%
  rename(estas_de_acuerdo = q0053) %>%
  grafico_likert(titulo = "En base a lo que conoces de los museos ¿Estás de acuerdo \n con tener un museo nacional?")

4.52 ¿Qué tipo de contenidos debe mostrar el museo en sus exposiciones?

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0054_0001:q0054_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0054_0001:q0054_other) %>%
  filter(!is.na(value), value != "", key != "q0054_0010") %>%
  mutate(key = case_when(key == "q0054_0001" ~ "Temas históricos",
                         key == "q0054_0002" ~ "Identidad Cultural",
                         key == "q0054_0003" ~ "Diversidades",
                         key == "q0054_0004" ~ "Temas Coyunturales",
                         key == "q0054_0005" ~ "Realidades Regionales",
                         key == "q0054_0006" ~ "Temas educativos",
                         key == "q0054_0007" ~ "Temas innovadores",
                         key == "q0054_0008" ~ "Temas científicos tecnológicos",
                         key == "q0054_0009" ~ "No sabe, no opina",
                         key == "q0054_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Qué tipo de contenidos debe mostrar el museo \n en sus exposiciones?")

4.52.1 Otros

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0054_other) %>%
  mutate(q0054_other = as.character(q0054_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents
## Warning in wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words
## = 500, : exposicion could not be fit on page. It will not be plotted.

4.53 Según toda la información que hayas podido percibir sobre los museos ¿Me siento representado por ellos?

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0055) %>%
  mutate(q0055 = factor(q0055),
         q0055 = recode_factor(q0055, "1" = "5", "2" = "4", "4" = "2", "5" = "1"),
         q0055 = factor(q0055, levels = c(1, 2, 3, 4, 5), labels = c("Nada representado", 2, 3, 4, "Muy representado"))) %>%
  filter(!is.na(q0055)) %>%
  rename(representado = q0055) %>%
  grafico_likert(titulo = "Según toda la información que hayas podido percibir sobre los museos \n ¿Me siento representado por ellos?")

4.54 Según lo que los museos pueda aportar en experiencia e información. ¿Qué tan importante consideras a los museos para tu familia?

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0056) %>%
  mutate(q0056 = factor(q0056),
         q0056 = recode_factor(q0056, "1" = "5", "2" = "4", "4" = "2", "5" = "1"),
         q0056 = factor(q0056, levels = c(1, 2, 3, 4, 5), labels = c("Nada importante", 2, 3, 4, "Muy importante"))) %>%
  filter(!is.na(q0056)) %>%
  grafico_likert("Según lo que los museos pueda aportar en experiencia e información. \n ¿Qué tan importante consideras a los museos para tu familia?")

4.55 LIKERT

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0057_0001:q0057_0005) %>%
  mutate(q0057_0001 = factor(q0057_0001, levels = c(1, 2, 3, 4, 5), labels = c("Muy en desacuerdo.", 2, 3, 4, "Muy de acuerdo.")),
         q0057_0002 = factor(q0057_0002, levels = c(1, 2, 3, 4, 5), labels = c("Muy en desacuerdo.", 2, 3, 4, "Muy de acuerdo.")),
         q0057_0003 = factor(q0057_0003, levels = c(1, 2, 3, 4, 5), labels = c("Muy en desacuerdo.", 2, 3, 4, "Muy de acuerdo.")),
         q0057_0004 = factor(q0057_0004, levels = c(1, 2, 3, 4, 5), labels = c("Muy en desacuerdo.", 2, 3, 4, "Muy de acuerdo.")),
         q0057_0005 = factor(q0057_0005, levels = c(1, 2, 3, 4, 5), labels = c("Muy en desacuerdo.", 2, 3, 4, "Muy de acuerdo."))) %>%
  rename(educacion = q0057_0001,
         turismo = q0057_0002,
         recreacion = q0057_0003,
         aprendizaje = q0057_0004,
         diversidad = q0057_0005) %>%
  grafico_likert(titulo = "Los museos contribuyen a la 'educación' de todas las personas. \n El museo es un lugar para hacer 'turismo'. \n El museo es un lugar de 'recreación'. \n El museo es un lugar de 'aprendizaje'. \n Los museos contribuyen a valorar la 'diversidad' cultural.")

4.56 Para usted, el museo significa:

Data_Hogar_Lima_Metropolitana_Sur %>%
  select(q0058_0001:q0058_0003) %>%
  gather(key = "key", value = "value", q0058_0001:q0058_0003) %>%
  select(value) %>%
  filter(!is.na(value), value != "") %>%
  mutate(value = as.character(value)) %>%
  cloud()
## Warning: attributes are not identical across measure variables;
## they will be dropped
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

5 Data Hogar Muestra en Ica, Pisco y Chincha

5.1 ¿En que distrito vive actualmente?

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0003_0003) %>%
  mutate(q0003_0003 = str_to_title(q0003_0003),
         q0003_0003 = str_replace(q0003_0003, "Smp", "San Martín De Porres"),
         q0003_0003 = str_replace(q0003_0003, "Villa Maria Del Triunfo", "Villa María Del Triunfo"),
         q0003_0003 = str_replace(q0003_0003, "Chorrilos", "Chorrillos"),
         q0003_0003 = str_replace(q0003_0003, "San Juan De Lurignacho", "San Juan De Lurigancho"),
         q0003_0003 = factor(q0003_0003),
         q0003_0003 = str_replace(q0003_0003, "San Martin De Porres", "San Martín De Porres")) %>%
  grafico(tipo = "cualitativo1", xlab = "Distritos", ylab = "Encuestas recopiladas", title = "Cantidad de encuestas recopiladas por Distrito")

5.2 ¿Que edad tiene usted ?

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0004_X_Rang) %>%
  mutate(q0004_X_Rang = factor(q0004_X_Rang, levels = c("1", "2", "3", "4"), labels = c("Menos a 30 años", "De 30 a 44 Años", "De 45 a 59 años", "De 60 a más años"))) %>%
  grafico(tipo = "ordinal", xlab = "Edad", ylab = "Encuestas recopiladas", title = "Cantidad de encuestas recopiladas por Edad")

5.3 ¿Cuál es su lengua materna?

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0005, q0005_other) %>%
  mutate(q0005 = as.character(q0005),
         q0005_other = as.character(q0005_other),
         q0005 = case_when(q0005 == "0" ~ "Otro",
                           q0005 == "1" ~ "Quechua",
                           q0005 == "2" ~ "Asháninca",
                           q0005 == "3" ~ "Aimara",
                           q0005 == "4" ~ "Español",
                           TRUE ~ q0005)) %>%
  select(q0005) %>%
  mutate(q0005 = factor(q0005)) %>%
  grafico(tipo = "cualitativo2", xlab = "Lengua materna", ylab = "Encuestas recopiladas", title = "Cantidad de encuestas recopiladas por Lengua materna")

5.3.1 Otro

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0005_other) %>%
  mutate(q0005_other = as.character(q0005_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents
## NULL

5.4 ¿Domina alguna lengua además de la materna?

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0006) %>%
  mutate(q0006 = as.character(q0006),
         q0006 = case_when(q0006 == "1" ~ "Si",
                           q0006 == "2" ~ "No",
                           TRUE ~ q0006),
         q0006 = factor(q0006)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Domina alguna lengua además de la materna?")

5.5 ¿Qué otra lengua domina?

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0007_0001:q0007_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0007_0001:q0007_other) %>%
  filter(!is.na(value), value != "", key != "q0007_0008") %>%
  mutate(key = case_when(key == "q0007_0001" ~ "Quechua",
                         key == "q0007_0002" ~ "Aimara",
                         key == "q0007_0003" ~ "Asháninca",
                         key == "q0007_0004" ~ "Español",
                         key == "q0007_0005" ~ "Ingles",
                         key == "q0007_0006" ~ "Portugués",
                         key == "q0007_0007" ~ "Francés",
                         key == "q0007_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "Idioma", ylab = "frecuencia", title = "¿Qué otra lengua domina?")

5.5.1 Otro

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0007_other) %>%
  mutate(q0007_other = as.character(q0007_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

5.6 Según las actividades que realiza diariamente ¿Cuál es su ocupación actual?

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0008, q0008_other) %>%
  mutate_all(as.character) %>%
  mutate(q0008 = case_when(q0008 == "0" ~ "Otro",
                           q0008 == "1" ~ "Trabajador dependiente",
                           q0008 == "2" ~ "Trabajador independiente",
                           q0008 == "3" ~ "Ama (o) de casa",
                           q0008 == "4" ~ "Estudiante técnico o universitario",
                           q0008 == "5" ~ "Sin ocupación",
                           TRUE ~ q0008),
         q0008 = factor(q0008)) %>%
  select(q0008) %>%
  grafico(tipo = "cualitativo1", xlab = "Ocupacion", ylab = "frecuencia", title = "¿Cuál es su ocupación actual?")

5.6.1 Otro

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0008_other) %>%
  mutate(q0008_other = as.character(q0008_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents
## Warning in wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words
## = 500, : agroexportadora could not be fit on page. It will not be plotted.

5.7 Por el tiempo que destina semanalmente a su trabajo ¿Cuál de las siguientes opciones lo define mejor?

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0009) %>%
  mutate(q0009 = as.character(q0009),
         q0009 = case_when(q0009 == "1" ~ "Trabajador Full-Time \n (8 Horas x 6 dias o 48 horas semanales)",
                           q0009 == "2" ~ "Trabajador Middle- Time \n (6 Horas x 6 Dias o 36 horas semanales)",
                           q0009 == "3" ~ "Trabajador Part- Time \n (4 Horas x 6 dias o 24 horas semanales)",
                           q0009 == "4" ~ "Tengo más de un trabajo a la vez",
                           TRUE ~ q0009),
         q0009 = factor(q0009, levels = c("Tengo más de un trabajo a la vez", "Trabajador Part- Time \n (4 Horas x 6 dias o 24 horas semanales)", "Trabajador Middle- Time \n (6 Horas x 6 Dias o 36 horas semanales)", "Trabajador Full-Time \n (8 Horas x 6 dias o 48 horas semanales)"))) %>%
  filter(!is.na(q0009)) %>%
  grafico(tipo = "ordinal", xlab = "Tiempos de trabajo", ylab = "frecuencia", title = "¿Cuál de las siguientes opciones \n lo define mejor?")

5.8 ¿Cuál es su nivel de instrucción?

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0010) %>%
  mutate(q0010 = as.character(q0010),
         q0010 = case_when(q0010 == "1" ~ "Inicial",
                           q0010 == "2" ~ "Primaria",
                           q0010 == "3" ~ "Secundaria",
                           q0010 == "4" ~ "Superior Técnico",
                           q0010 == "5" ~ "Superior Universitario",
                           q0010 == "6" ~ "Postgrado",
                           q0010 == "7" ~ "Ningún grado de instrucción",
                           TRUE ~ q0010),
         q0010 = factor(q0010, levels = c("Ningún grado de instrucción", "Inicial", "Primaria", "Secundaria", "Superior Técnico", "Superior Universitario", "Postgrado"))) %>%
  grafico(tipo = "ordinal", xlab = "Nivel", ylab = "frecuencia", title = "¿Cuál es su nivel de instrucción?")

5.9 Por tu autoidentificación de género te consideras:

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0011, q0011_other) %>%
  mutate_all(as.character) %>%
  mutate(q0011 = case_when(q0011 == "0" ~ "Otro",
                           q0011 == "1" ~ "Hombre",
                           q0011 == "2" ~ "Mujer",
                           q0011 == "3" ~ "Prefiero no decirlo",
                           q0011 == "4" ~ "Otro",
                           TRUE ~ q0011),
         q0011 = factor(q0011)) %>%
  select(q0011) %>%
  grafico(tipo = "cualitativo2", xlab = "Género", ylab = "frecuencia", title = "Por tu autoidentificación de género te consideras:")

5.9.1 Otro

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0011_other) %>%
  mutate(q0011_other = as.character(q0011_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents
## NULL

5.10 Por sus costumbres y sus antepasados usted se considera:

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0012, q0012_other) %>%
  sapply(as.character) %>%
  as_tibble() %>%
  mutate(q0012 = case_when(q0012 == "0" ~ "Otro",
                           q0012 == "1" ~ "Quechua",
                           q0012 == "2" ~ "Aimara",
                           q0012 == "3" ~ "Parte de otro pueblo indígena u originario",
                           q0012 == "4" ~ "Mestizo",
                           q0012 == "5" ~ "Blanco",
                           q0012 == "6" ~ "Negro, moreno, zambo, mulato / \n pueblo afroperuano o afrodescendiente",
                           q0012 == "7" ~ "Tusan",
                           q0012 == "8" ~ "Nikkei",
                           q0012 == "9" ~ "Otro",
                           TRUE ~ q0012),
         q0012 = factor(q0012)) %>%
  select(q0012) %>%
  filter(!is.na(q0012), q0012 != "") %>%
  grafico(tipo = "cualitativo1", xlab = "Costumbres", ylab = "frecuencia", title = "Por sus costumbres y sus antepasados \n usted se considera:")

5.10.1 Otro

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0012_other) %>%
  mutate(q0012_other = as.character(q0012_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents
## NULL

5.11 ¿Qué tan importante considera el aspecto cultural en su vida y en la de su familia?

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0013) %>%
  mutate(q0013 = factor(q0013),
         q0013 = recode_factor(q0013, "1" = "5", "2" = "4", "4" = "2", "5" = "1"),
         q0013 = factor(q0013, levels = c(1, 2, 3, 4, 5), labels = c("Nada importante", 2, 3, 4, "Muy importante"))) %>%
  filter(!is.na(q0013)) %>%
  rename(aspecto_cultural = q0013) %>%
  grafico_likert(titulo = "¿Qué tan importante considera el aspecto cultural \n en su vida y en la de su familia?")

5.12 ¿Alguna vez ha visitado un museo?

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0014) %>%
  mutate(q0014 = as.character(q0014),
         q0014 = case_when(q0014 == "1" ~ "Si",
                           q0014 == "2" ~ "No",
                           TRUE ~ q0014),
         q0014 = factor(q0014)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "frecuencia", title = "¿Alguna vez ha visitado un museo?")

5.13 ¿Le gusta visitar museos?

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0015) %>%
  mutate(q0015 = as.character(q0015),
         q0015 = case_when(q0015 == "1" ~ "Si",
                           q0015 == "2" ~ "No",
                           TRUE ~ q0015),
         q0015 = factor(q0015)) %>%
  filter(!is.na(q0015)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "frecuencia", title = "¿Le gusta visitar museos?")

5.14 ¿Qué te motiva a visitarlos?

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0016_0001:q0016_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0016_0001:q0016_other) %>%
  filter(!is.na(value), value != "", key != "q0016_0011") %>%
  mutate(key = case_when(key == "q0016_0001" ~ "enriquece mi conocimiento cultural",
                         key == "q0016_0002" ~ "buscar una nueva experiencia",
                         key == "q0016_0003" ~ "pasar un día con amigos/pareja",
                         key == "q0016_0004" ~ "visitar las exposiciones temporales",
                         key == "q0016_0005" ~ "para ver algo en específico que he oído hablar",
                         key == "q0016_0006" ~ "pasar un día en familia",
                         key == "q0016_0007" ~ "enseñar el museo a amigos, conocidos o familiares",
                         key == "q0016_0008" ~ "conocer las colecciones",
                         key == "q0016_0009" ~ "por una actividad organizada por \n el museo/centro expositivo (servicio complementario)",
                         key == "q0016_0010" ~ "esta incluido en una visita turística",
                         key == "q0016_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "Motivo", ylab = "frecuencia", title = "¿Qué te motiva a visitarlos?")

5.14.1 Otro

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0016_other) %>%
  mutate(q0016_other = as.character(q0016_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

5.15 ¿Qué no le gustó de ellos?

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0017_0001:q0017_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0017_0001:q0017_other) %>%
  filter(!is.na(value), value != "", key != "q0017_0007") %>%
  mutate(key = case_when(key == "q0017_0001" ~ "Que fue aburrido y monótono",
                         key == "q0017_0002" ~ "Que no se entienden",
                         key == "q0017_0003" ~ "Exponen cosas que no me interesan",
                         key == "q0017_0004" ~ "Mala calidad de los servicios del museo",
                         key == "q0017_0005" ~ "Guías de turismo no brindaron un buen servicio",
                         key == "q0017_0006" ~ "Nada me ha disgustado en mi visita",
                         key == "q0017_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Qué no le gustó de ellos?")

5.15.1 Otro

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0017_other) %>%
  mutate(q0017_other = as.character(q0017_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

5.16 ¿Qué no le gusta de ellos?

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0018_0001:q0018_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0018_0001:q0018_other) %>%
  filter(!is.na(value), value != "", key != "q0018_0006") %>%
  mutate(key = case_when(key == "q0018_0001" ~ "Que sean aburridos y monótonos",
                         key == "q0018_0002" ~ "Que no se entienden",
                         key == "q0018_0003" ~ "Exponen cosas que no me interesan",
                         key == "q0018_0004" ~ "Mala calidad de los servicios del museo",
                         key == "q0018_0005" ~ "Guías de turismo no brindan un buen servicio",
                         key == "q0018_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Qué no le gusta de ellos?")

5.16.1 Otro

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0018_other_X) %>%
  mutate(q0018_other_X = as.character(q0018_other_X)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

5.17 En el año 2019, ¿ha visitado museos de manera presencial?

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0019) %>%
  mutate(q0019 = as.character(q0019),
         q0019 = case_when(q0019 == "1" ~ "Si",
                           q0019 == "2" ~ "No",
                           TRUE ~ q0019),
         q0019 = factor(q0019)) %>%
  filter(!is.na(q0019)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "En el año 2019, ¿ha visitado museos \n de manera presencial?")

5.18 ¿Cuántas veces ha visitado un museo en el 2019?

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q00020_X_Rang) %>%
  mutate(q00020_X_Rang = factor(q00020_X_Rang, levels = c(1, 2), labels = c("De 1 a 3 veces", "Más de 4 veces"))) %>%
  filter(!is.na(q00020_X_Rang)) %>%
  grafico(tipo = "ordinal", xlab = "N° de Veces", ylab = "Encuestas recopiladas", title = "¿Cuántas veces ha visitado un museo en el 2019?")

5.19 Respecto a su última visita ¿usted realizo la visita solo o acompañado o formo parte de un grupo?

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0021) %>%
  mutate(q0021 = as.character(q0021),
         q0021 = case_when(q0021 == "1" ~ "He ido solo",
                           q0021 == "2" ~ "He ido acompañado de otras personas \n (pareja, amigos, familia)",
                           q0021 == "3" ~ "He ido en un grupo organizado \n (tours turísticos, grupos con algún fin u objetivo)",
                           TRUE ~ q0021),
         q0021 = factor(q0021)) %>%
  filter(!is.na(q0021)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "Respecto a su última visita \n ¿usted realizo la visita solo \n o acompañado o formo parte \n de un grupo?")

5.20 ¿Cuántas personas lo acompañaron en promedio?

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q00022_X_Rang) %>%
  mutate(q00022_X_Rang = factor(q00022_X_Rang, levels = c(1, 2, 3), labels = c("De 1 a 9 personas", "De 10 a 15 personas", "Más de 15 personas"))) %>%
  filter(!is.na(q00022_X_Rang)) %>%
  grafico(tipo = "ordinal", xlab = "N° de personas", ylab = "Encuestas recopiladas", title = "¿Cuántas personas lo acompañaron en promedio?")

5.21 Cuéntenos, ¿con quién fue al museo? (Puede marcar varias de las siguientes opciones):

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0023_0001:q0023_0005) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0023_0001:q0023_0005) %>%
  filter(!is.na(value), value != "") %>%
  mutate(key = case_when(key == "q0023_0001" ~ "Solo con mi pareja",
                         key == "q0023_0002" ~ "Mi familia (hijos(as), esposa (o))",
                         key == "q0023_0003" ~ "Mis padres",
                         key == "q0023_0004" ~ "Otros parientes",
                         key == "q0023_0005" ~ "Colegas o amigos",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿con quién fue al museo?")  

5.22 ¿Cuántas personas lo acompañaron en promedio?

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q00024_X_Rang) %>%
  mutate(q00024_X_Rang = factor(q00024_X_Rang, levels = c(1, 2, 3), labels = c("De 1 a 9 personas", "De 10 a 15 personas", "Más de 15 personas"))) %>%
  filter(!is.na(q00024_X_Rang)) %>%
  grafico(tipo = "ordinal", xlab = "N° de personas", ylab = "Encuestas recopiladas", title = "¿Cuántas personas lo acompañaron en promedio?")

5.23 ¿Qué tipo de grupo fue? (Puede marcar varias de las siguientes opciones):

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0025_0001:q0025_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0025_0001:q0025_other) %>%
  filter(!is.na(value), value != "", key != "q0025_0004") %>%
  mutate(key = case_when(key == "q0025_0001" ~ "Un grupo de personas \n organizado en visitas turísticas",
                         key == "q0025_0002" ~ "Un grupo escolar/educativo",
                         key == "q0025_0003" ~ "Un grupo organizado \n en visita cultural",
                         key == "q0025_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "frecuencia", title = "¿Qué tipo de grupo fue?")

5.23.1 Otro

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0025_other) %>%
  mutate(q0025_other = as.character(q0025_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents
## NULL

5.24 En general ¿Cuáles son los tres (03) principales problemas que ha experimentado o que encuentra en la actualidad durante su visita a un museo?

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0026_0001:q0026_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0026_0001:q0026_other) %>%
  filter(!is.na(value), value != "", key != "q0026_0011") %>%
  mutate(key = case_when(key == "q0026_0001" ~ "Respecto a la ubicación del museo (entorno)",
                         key == "q0026_0002" ~ "Respecto a costo de tickets",
                         key == "q0026_0003" ~ "Respecto a distancias en el transporte",
                         key == "q0026_0004" ~ "Respecto a costo del transporte",
                         key == "q0026_0005" ~ "Respecto a disponibilidad de estacionamientos",
                         key == "q0026_0006" ~ "Respecto a espacios de investigación",
                         key == "q0026_0007" ~ "Respecto a espacios pedagógicos/didácticos",
                         key == "q0026_0008" ~ "Exposiciones no están acordes \n al curriculum nacional",
                         key == "q0026_0009" ~ "No hay guiado especializado para niños",
                         key == "q0026_0010" ~ "No he tenido problemas durante mi visita",
                         key == "q0026_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "En general ¿Cuáles son los tres (03) \n principales problemas que \n ha experimentado o que encuentra en la \n actualidad durante su visita a un museo?")

5.24.1 Otro

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0026_other) %>%
  mutate(q0026_other = as.character(q0026_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents
## NULL

5.25 ¿Ud. buscó información antes de realizar una visita?

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0027) %>%
  mutate(q0027 = as.character(q0027),
         q0027 = case_when(q0027 == "1" ~ "Si",
                           q0027 == "2" ~ "No",
                           TRUE ~ q0027),
         q0027 = factor(q0027)) %>%
  filter(!is.na(q0027)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "En el año 2019, ¿Ud. buscó información \n antes de realizar una visita?")

5.26 ¿Qué tipo de información buscó?

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0028_0001:q0028_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0028_0001:q0028_other) %>%
  filter(!is.na(value), value != "", key != "q0028_0008") %>%
  mutate(key = case_when(key == "q0028_0001" ~ "Precios de entrada",
                         key == "q0028_0002" ~ "Dirección exacta/referencias",
                         key == "q0028_0003" ~ "Actividades adicionales dentro del museo \n (concierto, teatro, cine, otros)",
                         key == "q0028_0004" ~ "Servicios adicionales (restaurantes, cafeterías)",
                         key == "q0028_0005" ~ "Servicios para personas con habilidades especiales",
                         key == "q0028_0006" ~ "Si el lugar cuenta con personal capacitado \n e instalaciones adecuadas para acoger a \n personas con habilidades especiales.",
                         key == "q0028_0007" ~ "Tipo de contenido",
                         key == "q0028_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Qué tipo de información buscó?")

5.26.1 Otro

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0028_other) %>%
  mutate(q0028_other = as.character(q0028_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents
## NULL

5.27 ¿Por qué no?

Proviene de la respuesta “no” de la pregunta: ¿alguna vez ha visitado un museo?

Data_Hogar_Ica_Pisco_Chincha %>%
select(q0029_0001:q0029_0004) %>%
mutate_all(as.character) %>%
gather(key = "key", value = "value", q0029_0001:q0029_0004) %>%
filter(!is.na(value), value != "") %>%
mutate(key = case_when(key == "q0029_0001" ~ "Falta de tiempo",
                       key == "q0029_0002" ~ "Lejanía/ poca accesibilidad al museo",
                       key == "q0029_0003" ~ "Falta de información sobre los museos",
                       key == "q0029_0004" ~ "No me resulta interesante/no me gusta",
                       TRUE ~ key),
       key = factor(key)) %>%
select(key) %>%
grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Por qué no?")  

5.28 ¿Qué redes sociales utiliza frecuentemente?

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0030_0001:q0030_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0030_0001:q0030_other) %>%
  filter(!is.na(value), value != "", key != "q0030_0006") %>%
  mutate(key = case_when(key == "q0030_0001" ~ "Facebook",
                         key == "q0030_0002" ~ "Instagram",
                         key == "q0030_0003" ~ "YouTube",
                         key == "q0030_0004" ~ "Tik Tok",
                         key == "q0030_0005" ~ "No utilizo ninguna red social",
                         key == "q0030_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Qué redes sociales utiliza frecuentemente?")

5.28.1 otros

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0030_other) %>%
  mutate(q0030_other = as.character(q0030_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

5.29 ¿Sigue a museos (nacionales/extranjeros) en sus redes sociales?

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0031) %>%
  mutate(q0031 = as.character(q0031),
         q0031 = case_when(q0031 == "1" ~ "Si",
                           q0031 == "2" ~ "No",
                           TRUE ~ q0031),
         q0031 = factor(q0031)) %>%
  filter(!is.na(q0031)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Sigue a museos (nacionales/extranjeros) \n en sus redes sociales?")

5.30 ¿Se siente identificado(a) con sus contenidos?

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0032) %>%
  mutate(q0032 = factor(q0032),
         q0032 = recode_factor(q0032, "1" = "5", "2" = "4", "4" = "2", "5" = "1"),
         q0032 = factor(q0032, levels = c(1, 2, 3, 4, 5), labels = c("Nada identificado", 2, 3, 4, "Muy identificado"))) %>%
  filter(!is.na(q0032)) %>%
  rename(contenidos = q0032) %>%
  grafico_likert(titulo = "¿Se siente identificado(a) con sus contenidos?")

5.31 ¿Ha considerado ir a un museo actualmente?

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0033) %>%
  mutate(q0033 = as.character(q0033),
         q0033 = case_when(q0033 == "1" ~ "Si",
                           q0033 == "2" ~ "No",
                           TRUE ~ q0033),
         q0033 = factor(q0033)) %>%
  filter(!is.na(q0033)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Ha considerado ir a un museo actualmente?")

5.32 ¿Por que no iría a un museo actualmente?

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0034) %>%
  mutate(q0034 = as.character(q0034)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

5.33 ¿Alguna vez ha visitado un museo de manera virtual?

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0035) %>%
  mutate(q0035 = as.character(q0035),
         q0035 = case_when(q0035 == "1" ~ "Si",
                           q0035 == "2" ~ "No",
                           TRUE ~ q0035),
         q0035 = factor(q0035)) %>%
  filter(!is.na(q0035)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Alguna vez ha visitado un museo de manera virtual?")

5.34 ¿Qué museo visitaste virtualmente?

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0036) %>%
  mutate(q0036 = as.character(q0036),
         q0036 = str_remove_all(q0036, "MUSEO"),
         q0036 = str_remove_all(q0036, "Museo"),
         q0036 = str_remove_all(q0036, "museo")) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

5.35 ¿Qué otros espacios culturales visita o ha visitado con frecuencia?

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0037_0001:q0037_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0037_0001:q0037_other) %>%
  filter(!is.na(value), value != "", key != "q0037_0006") %>%
  mutate(key = case_when(key == "q0037_0001" ~ "Teatro",
                         key == "q0037_0002" ~ "Cine",
                         key == "q0037_0003" ~ "Conciertos",
                         key == "q0037_0004" ~ "Parques",
                         key == "q0037_0005" ~ "Ferias y circos",
                         key == "q0037_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Qué otros espacios culturales visita \n o ha visitado con frecuencia?")

5.35.1 otros

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0037_other) %>%
  mutate(q0037_other = as.character(q0037_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

5.36 ¿Dónde realiza o ha realizado estas actividades culturales?

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0038_0001:q0038_0003) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0038_0001:q0038_0003) %>%
  filter(!is.na(value), value != "") %>%
  mutate(key = case_when(key == "q0038_0001" ~ "En mi distrito",
                         key == "q0038_0002" ~ "En otro distrito",
                         key == "q0038_0003" ~ "Virtualmente",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Dónde realiza o ha realizado estas \n actividades culturales?")  

5.37 ¿Alguna vez ha visto o recuerda alguna publicidad de algún museo?

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0039) %>%
  mutate(q0039 = as.character(q0039),
         q0039 = case_when(q0039 == "1" ~ "Si",
                           q0039 == "2" ~ "No",
                           TRUE ~ q0039),
         q0039 = factor(q0039)) %>%
  filter(!is.na(q0039)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Alguna vez ha visto o recuerda \n alguna publicidad de algún museo?")

5.38 ¿Por cual de los siguientes medios la vio?

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0040_0001:q0040_other) %>%
  sapply(as.character) %>%
  as_tibble() %>%
  gather(key = "key", value = "value", q0040_0001:q0040_other) %>%
  filter(!is.na(value), value != "", key != "q0040_0010") %>%
  mutate(key = case_when(key == "q0040_0001" ~ "Páginas web",
                         key == "q0040_0002" ~ "Redes sociales",
                         key == "q0040_0003" ~ "Radio",
                         key == "q0040_0004" ~ "Televisión",
                         key == "q0040_0005" ~ "Folletos o volantes",
                         key == "q0040_0006" ~ "En la calle (carteles, vallas)",
                         key == "q0040_0007" ~ "Periódicos",
                         key == "q0040_0008" ~ "Revistas",
                         key == "q0040_0009" ~ "Correo electrónico o llamadas",
                         key == "q0040_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Por cual de los siguientes medios la vio?")

5.38.1 otros

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0040_other) %>%
  mutate(q0040_other = as.character(q0040_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

5.39 ¿A que museo pertenecía dicha publicidad?

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0041) %>%
  mutate(q0041 = as.character(q0041),
         q0041 = str_remove(q0041, "Museo"),
         q0041 = str_remove(q0041, "museo")) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

5.40 ¿Te gustaría ver o escuchar alguna publicidad/información del Museo Nacional del Perú (MUNA)?

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0042) %>%
  mutate(q0042 = as.character(q0042),
         q0042 = case_when(q0042 == "1" ~ "Si",
                           q0042 == "2" ~ "No",
                           TRUE ~ q0042),
         q0042 = factor(q0042)) %>%
  filter(!is.na(q0042)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Te gustaría ver o escuchar alguna \n publicidad/información del Museo Nacional \n del Perú (MUNA)?")

5.41 ¿Por cuales de los siguientes medios te gustaría hacerlo?

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0043_0001:q0043_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0043_0001:q0043_other) %>%
  filter(!is.na(value), value != "", key != "q0043_0010") %>%
  mutate(key = case_when(key == "q0043_0001" ~ "Páginas web",
                         key == "q0043_0002" ~ "Redes sociales",
                         key == "q0043_0003" ~ "Radio",
                         key == "q0043_0004" ~ "Televisión",
                         key == "q0043_0005" ~ "Folletos o volantes",
                         key == "q0043_0006" ~ "En la calle (carteles, vallas)",
                         key == "q0043_0007" ~ "Periódicos",
                         key == "q0043_0008" ~ "Revistas",
                         key == "q0043_0009" ~ "Correo electrónico o llamadas",
                         key == "q0043_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Por cuales de los siguientes medios  \n te gustaría hacerlo?")

5.41.1 otros

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0043_other) %>%
  mutate(q0043_other = as.character(q0043_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

5.42 ¿A usted le gustaría visitar el MUNA con tu familia de manera presencial?

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0044) %>%
  mutate(q0044 = as.character(q0044),
         q0044 = case_when(q0044 == "1" ~ "Si",
                           q0044 == "2" ~ "No",
                           TRUE ~ q0044),
         q0044 = factor(q0044)) %>%
  filter(!is.na(q0044)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿A usted le gustaría visitar el MUNA con tu familia \n de manera presencial?")

5.43 ¿Cuáles son las 3 razones principales por las que Sí visitaría el MUNA?

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0045_0001:q0045_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0045_0001:q0045_other) %>%
  filter(!is.na(value), value != "", key != "q0045_0013") %>%
  mutate(key = case_when(key == "q0045_0001" ~ "Enriquece mi conocimiento cultural",
                         key == "q0045_0002" ~ "Buscar una nueva experiencia",
                         key == "q0045_0003" ~ "Para investigación académica",
                         key == "q0045_0004" ~ "Por curiosidad",
                         key == "q0045_0005" ~ "Pasar un día con amigos/pareja",
                         key == "q0045_0006" ~ "Visitar las exposiciones temporales",
                         key == "q0045_0007" ~ "Para ver algo en específico que he oído hablar",
                         key == "q0045_0008" ~ "Para pasar un día en familia",
                         key == "q0045_0009" ~ "Enseñar el museo a amigos, conocidos o familiares",
                         key == "q0045_0010" ~ "Conocer las colecciones",
                         key == "q0045_0011" ~ "Por una actividad organizada por el museo/centro \n expositivo (servicio complementario)",
                         key == "q0045_0012" ~ "Estar incluido en una visita turística",
                         key == "q0045_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Cuáles son las 3 razones \n principales por las que \n Sí visitaría el MUNA?")

5.43.1 otros

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0045_other) %>%
  mutate(q0045_other = as.character(q0045_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

5.44 Considerando el tiempo de traslado hacia el MUNA (distrito de Lurín en Lima) ¿Cuánto tiempo aproximadamente destinaria para visitar el MUNA ?

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0046) %>%
  mutate(q0046 = as.character(q0046),
         q0046 = case_when(q0046 == "1" ~ "1 hora",
                           q0046 == "2" ~ "De 1 a 3 horas",
                           q0046 == "3" ~ "De 3 a 4 horas",
                           q0046 == "4" ~ "De 5 a 6 horas",
                           q0046 == "5" ~ "Más de 6 horas",
                           TRUE ~ q0046),
         q0046 = factor(q0046, levels = c("1 hora", "De 1 a 3 horas", "De 3 a 4 horas", "De 5 a 6 horas", "Más de 6 horas"))) %>%
  filter(!is.na(q0046)) %>%
  grafico(tipo = "ordinal", xlab = "", ylab = "Encuestas recopiladas", title = "Considerando el tiempo de traslado hacia el MUNA \n (distrito de Lurín en Lima) ¿Cuánto tiempo \n aproximadamente destinaria para visitar el MUNA ?")

5.45 ¿Cuánto estaría dispuesto a pagar por el ticket de entrada al MUNA ?

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0047) %>%
  mutate(q0047 = as.character(q0047),
         q0047 = case_when(q0047 == "1" ~ "Entre 0 y 5 Soles",
                           q0047 == "2" ~ "Entre 6 y 10 Soles",
                           q0047 == "3" ~ "Entre 11 y 20 Soles",
                           q0047 == "4" ~ "Entre 21 y 50 Soles",
                           q0047 == "5" ~ "Más de 50 Soles",
                           TRUE ~ q0047),
         q0047 = factor(q0047, levels = c("Entre 0 y 5 Soles", "Entre 6 y 10 Soles", "Entre 11 y 20 Soles", "Entre 21 y 50 Soles", "Más de 50 Soles"))) %>%
  filter(!is.na(q0047)) %>%
  grafico(tipo = "ordinal", xlab = "", ylab = "Encuestas recopiladas", title = "¿Cuánto estaría dispuesto a pagar por el ticket \n de entrada al MUNA ?")

5.46 ¿Cuáles son las 3 razones principales por las que NO visitaría el MUNA?

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0048_0001:q0048_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0048_0001:q0048_other) %>%
  filter(!is.na(value), value != "", key != "q0048_0007") %>%
  mutate(key = case_when(key == "q0048_0001" ~ "Falta de tiempo",
                         key == "q0048_0002" ~ "Desinterés",
                         key == "q0048_0003" ~ "El costo asociado a la visita \n (movilidad, alimentación, entre otros)",
                         key == "q0048_0004" ~ "El costo del ticket de entrada al MUNA",
                         key == "q0048_0005" ~ "Falta de información",
                         key == "q0048_0006" ~ "Por lejanía y poca accesibilidad",
                         key == "q0048_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Cuáles son las 3 razones principales \n por las que NO visitaría el MUNA?")

5.46.1 otros

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0048_other) %>%
  mutate(q0048_other = as.character(q0048_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

5.47 ¿Te gustaría realizar visitas virtuales al MUNA?

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0049) %>%
  mutate(q0049 = as.character(q0049),
         q0049 = case_when(q0049 == "1" ~ "Si",
                           q0049 == "2" ~ "No",
                           TRUE ~ q0049),
         q0049 = factor(q0049)) %>%
  filter(!is.na(q0049)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Te gustaría realizar visitas virtuales al MUNA?")

5.48 ¿Por qué no lo haria?

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0050) %>%
  mutate(q0050 = as.character(q0050)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

5.49 ¿Cuáles son los 3 servicios más importantes que esperaría encontrar en su visita a un museo?

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0051_0001:q0051_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0051_0001:q0051_other) %>%
  filter(!is.na(value), value != "") %>%
  mutate(key = case_when(key == "q0051_0001" ~ "Información en boletería o en sala",
                         key == "q0051_0002" ~ "Folletos de información entregados",
                         key == "q0051_0003" ~ "Espacios de encuentro, \n lugares sin carga expositiva, \n espacios no intervenidos",
                         key == "q0051_0004" ~ "Actividades guiadas por el museo",
                         key == "q0051_0005" ~ "Cafetería/restaurantes",
                         key == "q0051_0006" ~ "Tienda de souvenir",
                         key == "q0051_0007" ~ "Estacionamiento",
                         key == "q0051_0008" ~ "Traducciones",
                         key == "q0051_0009" ~ "Otro",
                         key == "q0051_other" ~ "",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  filter(!is.na(key), key != "") %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Cuáles son los 3 servicios más importantes \n que esperaría encontrar en su \n visita a un museo?")

5.49.1 Otros

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0051_other) %>%
  mutate(q0051_other = as.character(q0051_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

5.50 ¿Qué tipo de actividades culturales le gustaría encontrar al llegar al MUNA?

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0052_0001:q0052_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0052_0001:q0052_other) %>%
  filter(!is.na(value), value != "", key != "q0052_0006") %>%
  mutate(key = case_when(key == "q0052_0001" ~ "Exposiciones",
                         key == "q0052_0002" ~ "Conciertos",
                         key == "q0052_0003" ~ "Obras de teatro",
                         key == "q0052_0004" ~ "Danzas",
                         key == "q0052_0005" ~ "Ferias (de artesanía, \n de comida, musicales, etc.)",
                         key == "q0052_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Qué tipo de actividades culturales \n le gustaría encontrar al llegar al MUNA?")

5.50.1 Otros

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0052_other) %>%
  mutate(q0052_other = as.character(q0052_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

5.51 En base a lo que conoces de los museos ¿Estás de acuerdo con tener un museo nacional?

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0053) %>%
  mutate(q0053 = factor(q0053),
         q0053 = recode_factor(q0053, "1" = "5", "2" = "4", "4" = "2", "5" = "1"),
         q0053 = factor(q0053, levels = c(1, 2, 3, 4, 5), labels = c("Muy desacuerdo", 2, 3, 4, "Muy de acuerdo"))) %>%
  filter(!is.na(q0053)) %>%
  rename(estas_de_acuerdo = q0053) %>%
  grafico_likert(titulo = "En base a lo que conoces de los museos ¿Estás de acuerdo \n con tener un museo nacional?")

5.52 ¿Qué tipo de contenidos debe mostrar el museo en sus exposiciones?

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0054_0001:q0054_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0054_0001:q0054_other) %>%
  filter(!is.na(value), value != "", key != "q0054_0010") %>%
  mutate(key = case_when(key == "q0054_0001" ~ "Temas históricos",
                         key == "q0054_0002" ~ "Identidad Cultural",
                         key == "q0054_0003" ~ "Diversidades",
                         key == "q0054_0004" ~ "Temas Coyunturales",
                         key == "q0054_0005" ~ "Realidades Regionales",
                         key == "q0054_0006" ~ "Temas educativos",
                         key == "q0054_0007" ~ "Temas innovadores",
                         key == "q0054_0008" ~ "Temas científicos tecnológicos",
                         key == "q0054_0009" ~ "No sabe, no opina",
                         key == "q0054_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Qué tipo de contenidos debe mostrar el museo \n en sus exposiciones?")

5.52.1 Otros

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0054_other) %>%
  mutate(q0054_other = as.character(q0054_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents
## NULL

5.53 Según toda la información que hayas podido percibir sobre los museos ¿Me siento representado por ellos?

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0055) %>%
  mutate(q0055 = factor(q0055),
         q0055 = recode_factor(q0055, "1" = "5", "2" = "4", "4" = "2", "5" = "1"),
         q0055 = factor(q0055, levels = c(1, 2, 3, 4, 5), labels = c("Nada representado", 2, 3, 4, "Muy representado"))) %>%
  filter(!is.na(q0055)) %>%
  rename(representado = q0055) %>%
  grafico_likert(titulo = "Según toda la información que hayas podido percibir sobre los museos \n ¿Me siento representado por ellos?")

5.54 Según lo que los museos pueda aportar en experiencia e información. ¿Qué tan importante consideras a los museos para tu familia?

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0056) %>%
  mutate(q0056 = factor(q0056),
         q0056 = recode_factor(q0056, "1" = "5", "2" = "4", "4" = "2", "5" = "1"),
         q0056 = factor(q0056, levels = c(1, 2, 3, 4, 5), labels = c("Nada importante", 2, 3, 4, "Muy importante"))) %>%
  filter(!is.na(q0056)) %>%
  grafico_likert("Según lo que los museos pueda aportar en experiencia e información. \n ¿Qué tan importante consideras a los museos para tu familia?")

5.55 LIKERT

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0057_0001:q0057_0005) %>%
  mutate(q0057_0001 = factor(q0057_0001, levels = c(1, 2, 3, 4, 5), labels = c("Muy en desacuerdo.", 2, 3, 4, "Muy de acuerdo.")),
         q0057_0002 = factor(q0057_0002, levels = c(1, 2, 3, 4, 5), labels = c("Muy en desacuerdo.", 2, 3, 4, "Muy de acuerdo.")),
         q0057_0003 = factor(q0057_0003, levels = c(1, 2, 3, 4, 5), labels = c("Muy en desacuerdo.", 2, 3, 4, "Muy de acuerdo.")),
         q0057_0004 = factor(q0057_0004, levels = c(1, 2, 3, 4, 5), labels = c("Muy en desacuerdo.", 2, 3, 4, "Muy de acuerdo.")),
         q0057_0005 = factor(q0057_0005, levels = c(1, 2, 3, 4, 5), labels = c("Muy en desacuerdo.", 2, 3, 4, "Muy de acuerdo."))) %>%
  rename(educacion = q0057_0001,
         turismo = q0057_0002,
         recreacion = q0057_0003,
         aprendizaje = q0057_0004,
         diversidad = q0057_0005) %>%
  grafico_likert(titulo = "Los museos contribuyen a la 'educación' de todas las personas. \n El museo es un lugar para hacer 'turismo'. \n El museo es un lugar de 'recreación'. \n El museo es un lugar de 'aprendizaje'. \n Los museos contribuyen a valorar la 'diversidad' cultural.")

5.56 Para usted, el museo significa:

Data_Hogar_Ica_Pisco_Chincha %>%
  select(q0058_0001:q0058_0003) %>%
  gather(key = "key", value = "value", q0058_0001:q0058_0003) %>%
  select(value) %>%
  filter(!is.na(value), value != "") %>%
  mutate(value = as.character(value)) %>%
  cloud()
## Warning: attributes are not identical across measure variables;
## they will be dropped
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

6 Data Docentes

6.1 ¿En que distrito vive actualmente?

6.1.1 Distritos de Lima Metropolitana

Data_Docentes %>%
  mutate(Lugar_X = factor(Lugar_X)) %>%
  filter(Lugar_X == 1) %>%
  select(q0002_0003) %>%
  mutate(q0002_0003 = str_to_title(q0002_0003),
         q0002_0003 = str_replace(q0002_0003, "Smp", "San Martín De Porres"),
         q0002_0003 = str_replace(q0002_0003, "Villa Maria Del Triunfo", "Villa María Del Triunfo"),
         q0002_0003 = str_replace(q0002_0003, "Chorrilos", "Chorrillos"),
         q0002_0003 = str_replace(q0002_0003, "San Juan De Lurignacho", "San Juan De Lurigancho"),
         q0002_0003 = factor(q0002_0003),
         q0002_0003 = str_replace(q0002_0003, "San Martin De Porres", "San Martín De Porres")) %>%
  grafico(tipo = "cualitativo1", xlab = "Distritos", ylab = "Encuestas recopiladas", title = "Cantidad de encuestas recopiladas por Distrito")

6.1.2 Distritos de Ica

Data_Docentes %>%
  mutate(Lugar_X = factor(Lugar_X)) %>%
  filter(Lugar_X == 2) %>%
  select(q0002_0003) %>%
  mutate(q0002_0003 = str_to_title(q0002_0003),
         q0002_0003 = str_replace(q0002_0003, "Smp", "San Martín De Porres"),
         q0002_0003 = str_replace(q0002_0003, "Villa Maria Del Triunfo", "Villa María Del Triunfo"),
         q0002_0003 = str_replace(q0002_0003, "Chorrilos", "Chorrillos"),
         q0002_0003 = str_replace(q0002_0003, "San Juan De Lurignacho", "San Juan De Lurigancho"),
         q0002_0003 = factor(q0002_0003),
         q0002_0003 = str_replace(q0002_0003, "San Martin De Porres", "San Martín De Porres")) %>%
  grafico(tipo = "cualitativo1", xlab = "Distritos", ylab = "Encuestas recopiladas", title = "Cantidad de encuestas recopiladas por Distrito")

6.2 ¿Cuál es el nivel educativo en el que usted enseña?

Data_Docentes %>%
  select(q0003) %>%
  mutate(q0003 = as.character(q0003),
         q0003 = case_when(q0003 == "1" ~ "Inicial",
                           q0003 == "2" ~ "Primaria",
                           q0003 == "3" ~ "Secundaria",
                           TRUE ~ q0003),
         q0003 = factor(q0003)) %>%
  filter(!is.na(q0003)) %>%
  grafico(tipo = "cualitativo2", xlab = "Nivel educativo", ylab = "frecuencia", title = "¿Cuál es el nivel educativo \n en el que usted enseña?")

6.3 ¿Cuál es el tipo de gestión de la institución educativa en la que trabaja?

Data_Docentes %>%
  select(q0004) %>%
  mutate(q0004 = as.character(q0004),
         q0004 = case_when(q0004 == "1" ~ "Pública",
                           q0004 == "2" ~ "Privada",
                           TRUE ~ q0004),
         q0004 = factor(q0004)) %>%
  filter(!is.na(q0004)) %>%
  grafico(tipo = "cualitativo2", xlab = "Tipo de gestión", ylab = "frecuencia", title = "¿Cuál es el tipo de gestión \n de la institución educativa \n en la que trabaja?")

6.4 ¿Cuál es el ámbito geográfico al que pertenece su institución en la que trabaja?

Data_Docentes %>%
  select(q0005) %>%
  mutate(q0005 = as.character(q0005),
         q0005 = case_when(q0005 == "1" ~ "Urbano",
                           q0005 == "2" ~ "Rural",
                           TRUE ~ q0005),
         q0005 = factor(q0005)) %>%
  filter(!is.na(q0005)) %>%
  grafico(tipo = "cualitativo2", xlab = "Ámbito geográfico", ylab = "frecuencia", title = "¿Cuál es el ámbito geográfico \n al que pertenece su institución \n en la que trabaja?")

6.5 ¿Que edad tiene usted ?

Data_Docentes %>%
  select(q0006_X_Rang) %>%
  mutate(q0006_X_Rang = factor(q0006_X_Rang, levels = c(1, 2, 3, 4), labels = c("Menos a 30 años", "De 30 a 44 Años", "De 45 a 59 años", "De 60 a más años"))) %>%
  grafico(tipo = "ordinal", xlab = "Edad", ylab = "Encuestas recopiladas", title = "Cantidad de encuestas recopiladas \n por Edad")

6.6 ¿Cuál es su lengua materna?

Data_Docentes %>%
  select(q0007, q0007_other) %>%
  mutate_all(as.character) %>%
  mutate(q0007_other = str_to_title(q0007_other),
         q0007 = case_when(q0007 == "0" ~ "Otro",
                           q0007 == "1" ~ "Quechua",
                           q0007 == "2" ~ "Asháninca",
                           q0007 == "3" ~ "Aimara",
                           q0007 == "4" ~ "Español",
                           TRUE ~ q0007)) %>%
  select(q0007) %>%
  mutate(q0007 = factor(q0007)) %>%
  filter(!is.na(q0007)) %>%
  grafico(tipo = "cualitativo2", xlab = "Lengua materna", ylab = "Encuestas recopiladas", title = "Cantidad de encuestas recopiladas \n por Lengua materna")

6.6.1 Otros

Data_Docentes %>%
  select(q0007_other) %>%
  mutate(q0007_other = as.character(q0007_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

6.7 ¿Domina alguna lengua además de la materna?

Data_Docentes %>%
  select(q0008) %>%
  mutate(q0008 = as.character(q0008),
         q0008 = case_when(q0008 == "1" ~ "Si",
                           q0008 == "2" ~ "No",
                           TRUE ~ q0008),
         q0008 = factor(q0008)) %>%
  filter(!is.na(q0008)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Domina alguna lengua además \n de la materna?")

6.8 ¿Qué otra lengua domina?

Data_Docentes %>%
  select(q0009_0001:q0009_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0009_0001:q0009_other) %>%
  filter(!is.na(value), value != "", key != "q0009_0008") %>%
  mutate(key = case_when(key == "q0009_0001" ~ "Quechua",
                         key == "q0009_0002" ~ "Aimara",
                         key == "q0009_0003" ~ "Asháninca",
                         key == "q0009_0004" ~ "Español",
                         key == "q0009_0005" ~ "Ingles",
                         key == "q0009_0006" ~ "Portugués",
                         key == "q0009_0007" ~ "Francés",
                         key == "q0009_other" ~ "Otro",
                         TRUE ~ key),
         key = str_to_title(key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "Idioma", ylab = "frecuencia", title = "¿Qué otra lengua domina?")

6.8.1 Otros

Data_Docentes %>%
  select(q0009_other) %>%
  mutate(q0009_other = as.character(q0009_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

6.9 ¿Cuál es su nivel de instrucción?

Data_Docentes %>%
  select(q0010, q0010_other) %>%
  mutate_all(as.character) %>%
  mutate(q0010_other = str_to_title(q0010_other),
         q0010 = case_when(q0010 == "0" ~ "Otro",
                           q0010 == "1" ~ "Superior Técnico",
                           q0010 == "2" ~ "Superior Pedagógico",
                           q0010 == "3" ~ "Superior Universitario",
                           q0010 == "4" ~ "Postgrado",
                           TRUE ~ q0010)) %>%
  select(q0010) %>%
  mutate(q0010 = factor(q0010, levels = c("Otro", "Superior Técnico", "Superior Pedagógico", "Superior Universitario", "Postgrado"))) %>%
  filter(!is.na(q0010)) %>%
  grafico(tipo = "ordinal", xlab = "Nivel", ylab = "Encuestas recopiladas", title = "¿Cuál es su nivel de instrucción?")

6.9.1 Otros

Data_Docentes %>%
  select(q0010_other) %>%
  mutate(q0010_other = as.character(q0010_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

6.10 Por tu autoidentificación de género te consideras:

Data_Docentes %>%
  select(q0011, q0011_other) %>%
  mutate_all(as.character) %>%
  mutate(q0011 = case_when(q0011 == "0" ~ "Otro",
                           q0011 == "1" ~ "Hombre",
                           q0011 == "2" ~ "Mujer",
                           q0011 == "3" ~ "Prefiero no decirlo",
                           q0011 == "4" ~ "Otro",
                           TRUE ~ q0011),
         q0011 = factor(q0011)) %>%
  select(q0011) %>%
  filter(!is.na(q0011)) %>%
  grafico(tipo = "cualitativo1", xlab = "Género", ylab = "frecuencia", title = "Por tu autoidentificación de género te consideras:")

6.10.1 Otros

Data_Docentes %>%
  select(q0011_other) %>%
  mutate(q0011_other = as.character(q0011_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents
## NULL

6.11 Por sus costumbres y sus antepasados usted se considera:

Data_Docentes %>%
  select(q0012, q0012_other) %>%
  mutate_all(as.character) %>%
  mutate(q0012 = case_when(q0012 == "0" ~ "Otro",
                           q0012 == "1" ~ "Quechua",
                           q0012 == "2" ~ "Aimara",
                           q0012 == "3" ~ "Parte de otro pueblo indígena u originario",
                           q0012 == "4" ~ "Mestizo",
                           q0012 == "5" ~ "Blanco",
                           q0012 == "6" ~ "Negro, moreno, zambo, mulato / \n pueblo afroperuano o afrodescendiente",
                           q0012 == "7" ~ "Tusan",
                           q0012 == "8" ~ "Nikkei",
                           q0012 == "9" ~ "Otro",
                           TRUE ~ q0012),
         q0012 = factor(q0012)) %>%
  select(q0012) %>%
  filter(!is.na(q0012), q0012 != "") %>%
  grafico(tipo = "cualitativo1", xlab = "Costumbres", ylab = "frecuencia", title = "Por sus costumbres y sus antepasados usted se considera:")

6.11.1 Otros

Data_Docentes %>%
  select(q0012_other) %>%
  mutate(q0012_other = as.character(q0012_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents
## NULL

6.12 ¿Alguna vez ha visitado un museo?

Data_Docentes %>%
  select(q0013) %>%
  mutate(q0013 = as.character(q0013),
         q0013 = case_when(q0013 == "1" ~ "Si",
                           q0013 == "2" ~ "No",
                           TRUE ~ q0013),
         q0013 = factor(q0013)) %>%
  filter(!is.na(q0013)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Alguna vez ha visitado un museo?")

6.13 ¿Le gusta visitar museos?

Data_Docentes %>%
  select(q0014) %>%
  mutate(q0014 = as.character(q0014),
         q0014 = case_when(q0014 == "1" ~ "Si",
                           q0014 == "2" ~ "No",
                           TRUE ~ q0014),
         q0014 = factor(q0014)) %>%
  filter(!is.na(q0014)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Le gusta visitar museos?")

6.14 ¿Qué te motiva a visitarlos?

Data_Docentes %>%
  select(q0015_0001:q0015_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0015_0001:q0015_other) %>%
  filter(!is.na(value), value != "", key != "q0015_0011") %>%
  mutate(key = case_when(key == "q0015_0001" ~ "enriquece mi conocimiento cultural",
                         key == "q0015_0002" ~ "buscar una nueva experiencia",
                         key == "q0015_0003" ~ "pasar un día con amigos/pareja",
                         key == "q0015_0004" ~ "visitar las exposiciones temporales",
                         key == "q0015_0005" ~ "para ver algo en específico que he oído hablar",
                         key == "q0015_0006" ~ "pasar un día en familia",
                         key == "q0015_0007" ~ "enseñar el museo a amigos, conocidos o familiares",
                         key == "q0015_0008" ~ "conocer las colecciones",
                         key == "q0015_0009" ~ "por una actividad organizada por el \n museo/centro expositivo (servicio complementario)",
                         key == "q0015_0010" ~ "esta incluido en una visita turística",
                         key == "q0015_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "Motivo", ylab = "frecuencia", title = "¿Qué te motiva a visitarlos?")

6.14.1 Otros

Data_Docentes %>%
  select(q0015_other) %>%
  mutate(q0015_other = as.character(q0015_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

6.15 ¿Qué no le gustó de ellos?

Data_Docentes %>%
  select(q0016_0001:q0016_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0016_0001:q0016_other) %>%
  filter(!is.na(value), value != "", key != "q0016_0007") %>%
  mutate(key = case_when(key == "q0016_0001" ~ "Que fue aburrido y monótono",
                         key == "q0016_0002" ~ "Que no se entienden",
                         key == "q0016_0003" ~ "Exponen cosas que no me interesan",
                         key == "q0016_0004" ~ "Mala calidad de los servicios del museo",
                         key == "q0016_0005" ~ "Guías de turismo no brindaron un buen servicio",
                         key == "q0016_0006" ~ "Nada me ha disgustado en mi visita",
                         key == "q0016_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Qué no le gustó de ellos?")

6.15.1 Otros

Data_Docentes %>%
  select(q0016_other) %>%
  mutate(q0016_other = as.character(q0016_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

6.16 ¿Qué no le gusta de ellos?

Data_Docentes %>%
  select(q0017_0001:q0017_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0017_0001:q0017_other) %>%
  filter(!is.na(value), value != "", key != "q0017_0006") %>%
  mutate(key = case_when(key == "q0017_0001" ~ "Que sean aburridos y monótonos",
                         key == "q0017_0002" ~ "Que no se entienden",
                         key == "q0017_0003" ~ "Exponen cosas que no me interesan",
                         key == "q0017_0004" ~ "Mala calidad de los servicios del museo",
                         key == "q0017_0005" ~ "Guías de turismo no brindan un buen servicio",
                         key == "q0017_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Qué no le gusta de ellos?")

6.16.1 Otros

Data_Docentes %>%
  select(q0017_other_X) %>%
  mutate(q0017_other_X = as.character(q0017_other_X)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

6.17 En el año 2019, ¿ha visitado museos de manera presencial?

Data_Docentes %>%
  select(q0018) %>%
  mutate(q0018 = as.character(q0018),
         q0018 = case_when(q0018 == "1" ~ "Si",
                           q0018 == "2" ~ "No",
                           TRUE ~ q0018),
         q0018 = factor(q0018)) %>%
  filter(!is.na(q0018)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "En el año 2019, ¿ha visitado \n museos de manera presencial?")

6.18 ¿Qué museos ha visitado en el 2019?

Data_Docentes %>%
  select(q0019) %>%
  mutate(q0019 = as.character(q0019),
         q0019 = str_remove_all(q0019, "MUSEO"),
         q0019 = str_remove_all(q0019, "Museo"),
         q0019 = str_remove_all(q0019, "museo")) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

6.19 ¿Cuántas veces los ha visitado en el 2019?

Data_Docentes %>%
  select(q0020_X_Rang) %>%
  mutate(q0020_X_Rang = factor(q0020_X_Rang, levels = c(1, 2), labels = c("De 1 a 3 veces", "Más de 4 veces"))) %>%
  filter(!is.na(q0020_X_Rang)) %>%
  grafico(tipo = "ordinal", xlab = "N° de Veces", ylab = "Encuestas recopiladas", title = "¿Cuántas veces los ha visitado \n en el 2019?")

6.20 Respecto a esa última visita ¿usted realizo la visita solo o acompañado o formo parte de un grupo?

Data_Docentes %>%
  select(q0021) %>%
  mutate(q0021 = as.character(q0021),
         q0021 = case_when(q0021 == "1" ~ "He ido solo",
                           q0021 == "2" ~ "He ido acompañado de otras personas \n (pareja, amigos, familia)",
                           q0021 == "3" ~ "He ido en un grupo organizado \n (tours turísticos, grupos con algún fin u objetivo)",
                           TRUE ~ q0021),
         q0021 = factor(q0021)) %>%
  filter(!is.na(q0021)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "Respecto a su última visita \n ¿usted realizo la visita solo \n o acompañado o formo parte \n de un grupo?")

6.21 ¿Cuántas personas lo acompañaron en promedio?

Data_Docentes %>%
  select(q0022_X_Rang) %>%
  mutate(q0022_X_Rang = factor(q0022_X_Rang, levels = c(1, 2, 3), labels = c("De 1 a 9 personas", "De 10 a 15 personas", "Más de 15 personas"))) %>%
  filter(!is.na(q0022_X_Rang)) %>%
  grafico(tipo = "ordinal", xlab = "N° de personas", ylab = "Encuestas recopiladas", title = "¿Cuántas personas lo acompañaron en promedio?")

6.22 Cuéntenos, ¿con quién fue al museo? (Puede marcar varias de las siguientes opciones):

Data_Docentes %>%
  select(q0023_0001:q0023_0005) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0023_0001:q0023_0005) %>%
  filter(!is.na(value), value != "") %>%
  mutate(key = case_when(key == "q0023_0001" ~ "Solo con mi pareja",
                         key == "q0023_0002" ~ "Mi familia (hijos(as), esposa (o))",
                         key == "q0023_0003" ~ "Mis padres",
                         key == "q0023_0004" ~ "Otros parientes",
                         key == "q0023_0005" ~ "Colegas o amigos",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "Encuestas recopiladas", title = "¿con quién fue al museo?")  

6.23 ¿Cuántas personas lo acompañaron en promedio?

Data_Docentes %>%
  select(q0024_X_Rang) %>%
  mutate(q0024_X_Rang = factor(q0024_X_Rang, levels = c(1, 2, 3), labels = c("De 1 a 9 personas", "De 10 a 15 personas", "Más de 15 personas"))) %>%
  filter(!is.na(q0024_X_Rang)) %>%
  grafico(tipo = "ordinal", xlab = "N° de personas", ylab = "Encuestas recopiladas", title = "¿Cuántas personas lo acompañaron en promedio?")

6.24 ¿Qué tipo de grupo fue? (Puede marcar varias de las siguientes opciones):

Data_Docentes %>%
  select(q0025_0001:q0025_other) %>%
  sapply(as.character) %>%
  as_tibble() %>%
  gather(key = "key", value = "value", q0025_0001:q0025_other) %>%
  filter(!is.na(value), value != "", key != "q0025_0004") %>%
  mutate(key = case_when(key == "q0025_0001" ~ "Un grupo de personas \n organizado en visitas turísticas",
                         key == "q0025_0002" ~ "Un grupo escolar/educativo",
                         key == "q0025_0003" ~ "Un grupo organizado \n en visita cultural",
                         key == "q0025_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "frecuencia", title = "¿Qué tipo de grupo fue?")

6.24.1 Otros

Data_Docentes %>%
  select(q0025_other) %>%
  mutate(q0025_other = as.character(q0025_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

6.25 ¿Por qué no?

Data_Docentes %>%
  select(q0026_0001:q0026_other) %>%
  sapply(as.character) %>%
  as_tibble() %>%
  gather(key = "key", value = "value", q0026_0001:q0026_other) %>%
  filter(!is.na(value), value != "", key != "q0026_0005") %>%
  mutate(key = case_when(key == "q0026_0001" ~ "Falta de tiempo",
                         key == "q0026_0002" ~ "Lejanía/ poca accesibilidad al museo",
                         key == "q0026_0003" ~ "Falta de información sobre los museos",
                         key == "q0026_0004" ~ "No me resulta interesante/no me gusta",
                         key == "q0026_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "Encuestas recopiladas", title = "¿Por qué no?")  

6.25.1 Otros

Data_Docentes %>%
  select(q0026_other) %>%
  mutate(q0026_other = as.character(q0026_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

6.26 ¿Por cual de los siguientes medios consume contenido cultural?

Data_Docentes %>%
  select(q0027_0001:q0027_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0027_0001:q0027_other) %>%
  filter(!is.na(value), value != "", key != "q0027_0006") %>%
  mutate(key = case_when(key == "q0027_0001" ~ "Redes sociales",
                         key == "q0027_0002" ~ "Radio",
                         key == "q0027_0003" ~ "Televisión",
                         key == "q0027_0004" ~ "Periódicos",
                         key == "q0027_0005" ~ "Revistas",
                         key == "q0027_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Por cual de los siguientes medios consume contenido cultural?")

6.26.1 Otros

Data_Docentes %>%
  select(q0027_other) %>%
  mutate(q0027_other = as.character(q0027_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

6.27 ¿Qué redes sociales utiliza frecuentemente?

Data_Docentes %>%
  select(q0028_0001:q0028_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0028_0001:q0028_other) %>%
  filter(!is.na(value), value != "", key != "q0028_0006") %>%
  mutate(key = case_when(key == "q0028_0001" ~ "Facebook",
                         key == "q0028_0002" ~ "Instagram",
                         key == "q0028_0003" ~ "YouTube",
                         key == "q0028_0004" ~ "Tik Tok",
                         key == "q0028_0005" ~ "No utilizo ninguna red social",
                         key == "q0028_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Qué redes sociales utiliza frecuentemente?")

6.27.1 Otros

Data_Docentes %>%
  select(q0028_other) %>%
  mutate(q0028_other = as.character(q0028_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

6.28 ¿Sigue a museos (nacionales/extranjeros) en sus redes sociales?

Data_Docentes %>%
  select(q0029) %>%
  mutate(q0029 = as.character(q0029),
         q0029 = case_when(q0029 == "1" ~ "Si",
                           q0029 == "2" ~ "No",
                           TRUE ~ q0029),
         q0029 = factor(q0029)) %>%
  filter(!is.na(q0029)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Sigue a museos (nacionales/extranjeros) \n en sus redes sociales?")

6.29 ¿Se siente identificado(a) con sus contenidos?

Data_Docentes %>%
  select(q0030) %>%
  mutate(q0030 = factor(q0030),
         q0030 = recode_factor(q0030, "1" = "5", "2" = "4", "4" = "2", "5" = "1"),
         q0030 = factor(q0030, levels = c(1, 2, 3, 4, 5), labels = c("Nada identificado", 2, 3, 4, "Muy identificado"))) %>%
  filter(!is.na(q0030)) %>%
  rename(identificado = q0030) %>%
  grafico_likert(titulo = "¿Se siente identificado(a) con sus contenidos?")

6.30 ¿Ha realizado recorridos escolares a algún museo?

Data_Docentes %>%
  select(q0031) %>%
  mutate(q0031 = as.character(q0031),
         q0031 = case_when(q0031 == "1" ~ "Si",
                           q0031 == "2" ~ "No",
                           TRUE ~ q0031),
         q0031 = factor(q0031)) %>%
  filter(!is.na(q0031)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Ha realizado recorridos escolares a algún museo?")

6.31 ¿En qué museos realizo recorridos escolares?

Data_Docentes %>%
  select(q0032_X) %>%
  mutate(q0032_X = as.character(q0032_X),
         q0032_X = str_remove_all(q0032_X, "Museo"),
         q0032_X = str_remove_all(q0032_X, "museo"),
         q0032_X = str_remove_all(q0032_X, "MUSEO")) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

6.32 ¿Cuántos recorridos escolares ha realizado por año?

Data_Docentes %>%
  select(q0033_X_Rang) %>%
  mutate(q0033_X_Rang = factor(q0033_X_Rang, levels = c(1, 2), labels = c("De 1 a 3 recorridos", "Más de 4 veces"))) %>%
  filter(!is.na(q0033_X_Rang)) %>%
  grafico(tipo = "cualitativo2", xlab = "N° de personas", ylab = "Encuestas recopiladas", title = "¿Cuántos recorridos escolares ha \n realizado por año?")

6.33 Ud. buscó información antes de realizar una visita

Data_Docentes %>%
  select(q0034) %>%
  mutate(q0034 = as.character(q0034),
         q0034 = case_when(q0034 == "1" ~ "Si",
                           q0034 == "2" ~ "No",
                           TRUE ~ q0034),
         q0034 = factor(q0034)) %>%
  filter(!is.na(q0034)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "Ud. buscó información antes de \n realizar una visita")

6.34 ¿Qué tipo de información buscó?

Data_Docentes %>%
  select(q0035_0001:q0035_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0035_0001:q0035_other) %>%
  filter(!is.na(value), value != "", key != "q0035_0011") %>%
  mutate(key = case_when(key == "q0035_0001" ~ "Precios de entrada/Medios de pago",
                         key == "q0035_0002" ~ "Dirección exacta/referencias",
                         key == "q0035_0003" ~ "Actividades adicionales dentro del museo \n (concierto, teatro, cine, otros)",
                         key == "q0035_0004" ~ "Servicios adicionales (restaurantes, cafeterías)",
                         key == "q0035_0005" ~ "Servicios para personas con habilidades especiales",
                         key == "q0035_0006" ~ "Si el lugar cuenta con personal capacitado \n e instalaciones adecuadas para acoger a personas \n con habilidades especiales.",
                         key == "q0035_0007" ~ "Tipo de contenido",
                         key == "q0035_0008" ~ "Disponibilidad de Material pedagógico",
                         key == "q0035_0009" ~ "Disponibilidad de Material complementario",
                         key == "q0035_0010" ~ "Disponibilidad de Herramienta complementaria",
                         key == "q0035_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Qué tipo de información buscó?")

6.34.1 Otros

Data_Docentes %>%
  select(q0035_other) %>%
  mutate(q0035_other = as.character(q0035_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

6.35 ¿Cómo planifica sus visitas al museo con sus estudiantes?

Data_Docentes %>%
  select(q0036_X) %>%
  mutate(q0036_X = as.character(q0036_X)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

6.36 ¿Cuántas horas invierte para hacerlo?

Data_Docentes %>%
  select(q0037_X_Rang) %>%
  mutate(q0037_X_Rang = factor(q0037_X_Rang, levels = c(0, 1, 2, 3, 4, 5, 6), labels = c("No precisa", "De 1 a 4 horas", "De 5 a 8 horas", "De 9 a 24 horas", "De 1 a 7 días", "De 1 a menos de 2 semanas", "De 2 a más semanas"))) %>%
  filter(!is.na(q0037_X_Rang), q0037_X_Rang != "") %>%
  grafico(tipo = "ordinal", xlab = "", ylab = "frecuencia", title = "¿Cuántas horas invierte para hacerlo?")

6.37 ¿Lo planifica con otros docentes?

Data_Docentes %>%
  select(q0038) %>%
  mutate(q0038 = as.character(q0038),
         q0038 = case_when(q0038 == "1" ~ "Si",
                           q0038 == "2" ~ "No",
                           TRUE ~ q0038),
         q0038 = factor(q0038)) %>%
  filter(!is.na(q0038)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Lo planifica con otros docentes?")

6.38 ¿Qué tendría que ofrecer el MUNA para que usted lleve a sus estudiantes?

Data_Docentes %>%
  select(q0039_0001:q0039_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0039_0001:q0039_other) %>%
  filter(!is.na(value), value != "", key != "q0039_0007") %>%
  mutate(key = case_when(key == "q0039_0001" ~ "Seguridad",
                         key == "q0039_0002" ~ "Estacionamiento",
                         key == "q0039_0003" ~ "Recorridos guiados para estudiantes",
                         key == "q0039_0004" ~ "Exposiciones de acuerdo al curriculum nacional",
                         key == "q0039_0005" ~ "Acceso a áreas de investigación/ \n conservación por ejemplo laboratorios \n y depósitos de colecciones",
                         key == "q0039_0006" ~ "Lenguaje inclusivo",
                         key == "q0039_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Qué tendría que ofrecer el MUNA \n para que usted lleve \n a sus estudiantes?")

6.38.1 Otros

Data_Docentes %>%
  select(q0039_other) %>%
  mutate(q0039_other = as.character(q0039_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

6.39 ¿Cuál es el rol del museo en relación con la labor educativa como docente?

Data_Docentes %>%
  select(q0040, q0040_other) %>%
  mutate_all(as.character) %>%
  mutate(q0040 = case_when(q0040 == "0" ~ "Otro",
                           q0040 == "1" ~ "Espacio de nuevos aprendizajes",
                           q0040 == "2" ~ "Espacio para complementar el trabajo en el aula",
                           q0040 == "3" ~ "Aliado en la generación de contenidos",
                           q0040 == "4" ~ "Espacio de entretenimiento",
                           q0040 == "5" ~ "Todas las anteriores",
                           TRUE ~ q0040),
         q0040 = factor(q0040)) %>%
  select(q0040) %>%
  filter(!is.na(q0040)) %>%
  grafico(tipo = "cualitativo1", xlab = "Ocupacion", ylab = "frecuencia", title = "¿Cuál es el rol del museo \n en relación con la labor \n educativa como docente?")

6.39.1 Otro

Data_Docentes %>%
  select(q0040_other) %>%
  mutate(q0040_other = as.character(q0040_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

6.40 Considerando que el Museo Nacional del Perú queda en el distrito de Lurín ¿Realizaría una visita presencial con sus estudiantes?

Data_Docentes %>%
  select(q0041) %>%
  mutate(q0041 = as.character(q0041),
         q0041 = case_when(q0041 == "1" ~ "Si",
                           q0041 == "2" ~ "No",
                           TRUE ~ q0041),
         q0041 = factor(q0041)) %>%
  filter(!is.na(q0041)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "Considerando que el Museo Nacional \n del Perú queda en el distrito \n de Lurín ¿Realizaría una visita \n presencial con sus estudiantes?")

6.41 ¿Cuáles son las 3 razones principales por las que NO visitaría el MUNA con sus alumnos?

Data_Docentes %>%
  select(q0042_0001:q0042_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0042_0001:q0042_other) %>%
  filter(!is.na(value), value != "", key != "q0042_0009") %>%
  mutate(key = case_when(key == "q0042_0001" ~ "Falta de tiempo",
                         key == "q0042_0002" ~ "Desinterés de mis alumnos",
                         key == "q0042_0003" ~ "Falta de apoyo de los padres \n de familia o institucional",
                         key == "q0042_0004" ~ "El costo asociado a la visita \n (movilidad, alimentación, entre otros)",
                         key == "q0042_0005" ~ "El costo del ticket de entrada al MUNA",
                         key == "q0042_0006" ~ "Falta de información",
                         key == "q0042_0007" ~ "Por lejanía y poca accesibilidad",
                         key == "q0042_0008" ~ "Desarticulación con el curriculum \n nacional/Programación anual",
                         key == "q0042_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Cuáles son las 3 razones principales \n por las que NO visitaría el MUNA \n con sus alumnos?")

6.41.1 Otro

Data_Docentes %>%
  select(q0042_other) %>%
  mutate(q0042_other = as.character(q0042_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

6.42 Considerando el tiempo de traslado hacia el MUNA (distrito de Lurín en Lima) ¿Cuánto tiempo aproximadamente destinaria para visitar el MUNA ?

Data_Docentes %>%
  select(q0043) %>%
  mutate(q0043 = as.character(q0043),
         q0043 = case_when(q0043 == "1" ~ "1 hora",
                           q0043 == "2" ~ "De 1 a 3 horas",
                           q0043 == "3" ~ "De 3 a 4 horas",
                           q0043 == "4" ~ "De 5 a 6 horas",
                           q0043 == "5" ~ "Más de 6 horas",
                           TRUE ~ q0043),
         q0043 = factor(q0043, levels = c("1 hora", "De 1 a 3 horas", "De 3 a 4 horas", "De 5 a 6 horas", "Más de 6 horas"))) %>%
  filter(!is.na(q0043)) %>%
  grafico(tipo = "ordinal", xlab = "", ylab = "Encuestas recopiladas", title = "Considerando el tiempo de traslado hacia el MUNA \n (distrito de Lurín en Lima) ¿Cuánto tiempo \n aproximadamente destinaria para visitar el MUNA ?")

6.43 ¿Cuánto estaría dispuesto a pagar por el ticket de entrada al MUNA ?

Data_Docentes %>%
  select(q0044) %>%
  mutate(q0044 = as.character(q0044),
         q0044 = case_when(q0044 == "1" ~ "Entre 0 y 5 Soles",
                           q0044 == "2" ~ "Entre 6 y 10 Soles",
                           q0044 == "3" ~ "Entre 11 y 20 Soles",
                           q0044 == "4" ~ "Entre 21 y 50 Soles",
                           q0044 == "5" ~ "Más de 50 Soles",
                           TRUE ~ q0044),
         q0044 = factor(q0044, levels = c("Entre 0 y 5 Soles", "Entre 6 y 10 Soles", "Entre 11 y 20 Soles", "Entre 21 y 50 Soles", "Más de 50 Soles"))) %>%
  filter(!is.na(q0044)) %>%
  grafico(tipo = "ordinal", xlab = "", ylab = "Encuestas recopiladas", title = "¿Cuánto estaría dispuesto a pagar por el ticket \n de entrada al MUNA ?")

6.44 ¿Te gustaría realizar visitas virtuales al MUNA?

Data_Docentes %>%
  select(q0045) %>%
  mutate(q0045 = as.character(q0045),
         q0045 = case_when(q0045 == "1" ~ "Si",
                           q0045 == "2" ~ "No",
                           TRUE ~ q0045),
         q0045 = factor(q0045)) %>%
  filter(!is.na(q0045)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Te gustaría realizar visitas virtuales \n al MUNA?")

6.45 Esta informado sobre el MUNA y sus exposiciones

Data_Docentes %>%
  select(q0046) %>%
  mutate(q0046 = as.character(q0046),
         q0046 = case_when(q0046 == "1" ~ "No estoy informado",
                           q0046 == "2" ~ "No he necesitado informarme porque \n ya tenía conocimiento",
                           q0046 == "3" ~ "Por información de otras personas \n se de su existencia",
                           q0046 == "4" ~ "Lo he visto en una guía turística",
                           q0046 == "5" ~ "He buscado información en la pagina web \n del museo y/o en otras páginas de internet",
                           q0046 == "6" ~ "Me he informado a través \n de redes sociales",
                           q0046 == "7" ~ "He visto publicidad del MUNA \n y sus exposiciones",
                           TRUE ~ q0046),
         q0046 = factor(q0046)) %>%
  filter(!is.na(q0046)) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "Encuestas recopiladas", title = "Esta informado sobre el MUNA \n y sus exposiciones")

6.46 ¿Cuáles son los (03) servicios más importantes que esperaría encontrar en su visita a un museo?

Data_Docentes %>%
  select(q0047_0001:q0047_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0047_0001:q0047_other) %>%
  filter(!is.na(value), value != "", key != "q0047_0009") %>%
  mutate(key = case_when(key == "q0047_0001" ~ "Información en boletería o en sala",
                         key == "q0047_0002" ~ "Folletos de información entregados",
                         key == "q0047_0003" ~ "Espacios de encuentro, lugares sin \n carga expositiva, espacios no intervenidos",
                         key == "q0047_0004" ~ "Actividades guiadas por el museo",
                         key == "q0047_0005" ~ "Cafetería/restaurantes",
                         key == "q0047_0006" ~ "Tienda de souvenir",
                         key == "q0047_0007" ~ "Estacionamiento",
                         key == "q0047_0008" ~ "Traducciones",
                         key == "q0047_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  filter(!is.na(key), key != "") %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Cuáles son los 3 servicios \n más importantes que esperaría encontrar \n en su visita a un museo?")

6.46.1 Otros

Data_Docentes %>%
  select(q0047_other) %>%
  mutate(q0047_other = as.character(q0047_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

6.47 En general ¿Cuáles son los tres (03) principales problemas que ha experimentado o que encuentra en la actualidad durante su visita a un museo?

Data_Docentes %>%
  select(q0048_0001:q0048_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0048_0001:q0048_other) %>%
  filter(!is.na(value), value != "", key != "q0048_0010") %>%
  mutate(key = case_when(key == "q0048_0001" ~ "Respecto a la ubicación del \n museo (entorno)",
                         key == "q0048_0002" ~ "Respecto a costo de tickets",
                         key == "q0048_0003" ~ "Respecto a distancias en el transporte",
                         key == "q0048_0004" ~ "Respecto a costo del transporte",
                         key == "q0048_0005" ~ "Respecto a disponibilidad de estacionamientos",
                         key == "q0048_0006" ~ "Respecto a espacios de investigación",
                         key == "q0048_0007" ~ "Respecto a espacios pedagógicos/didácticos",
                         key == "q0048_0008" ~ "Exposiciones no están acordes \n al curriculum nacional",
                         key == "q0048_0009" ~ "No hay guiado especializado \n para niños",
                         key == "q0048_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  filter(!is.na(key), key != "") %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "En general ¿Cuáles son los tres (03) \n principales problemas que \n ha experimentado o que encuentra en la \n actualidad durante su visita a un museo?")

6.47.1 Otros

Data_Docentes %>%
  select(q0048_other) %>%
  mutate(q0048_other = as.character(q0048_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

6.48 ¿Qué tipo de actividades culturales le gustaría encontrar al llegar al MUNA?

Data_Docentes %>%
  select(q0049_0001:q0049_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0049_0001:q0049_other) %>%
  filter(!is.na(value), value != "", key != "q0049_0006") %>%
  mutate(key = case_when(key == "q0049_0001" ~ "Exposiciones",
                         key == "q0049_0002" ~ "Conciertos",
                         key == "q0049_0003" ~ "Obras de teatro",
                         key == "q0049_0004" ~ "Danzas",
                         key == "q0049_0005" ~ "Ferias (de artesanía, de comida, \n musicales, etc.)",
                         key == "q0049_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Qué tipo de actividades culturales \n le gustaría encontrar al llegar al MUNA?")

6.48.1 Otros

Data_Docentes %>%
  select(q0049_other) %>%
  mutate(q0049_other = as.character(q0049_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

6.49 ¿Alguna vez ha visto o recuerda alguna publicidad de algún museo?

Data_Docentes %>%
  select(q0050) %>%
  mutate(q0050 = as.character(q0050),
         q0050 = case_when(q0050 == "1" ~ "Si",
                           q0050 == "2" ~ "No",
                           TRUE ~ q0050),
         q0050 = factor(q0050)) %>%
  filter(!is.na(q0050)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Alguna vez ha visto o recuerda \n alguna publicidad de algún museo?")

6.50 ¿Por cual de los siguientes medios la vio?

Data_Docentes %>%
  select(q0051_0001:q0051_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0051_0001:q0051_other) %>%
  filter(!is.na(value), value != "", key != "q0051_0010") %>%
  mutate(key = case_when(key == "q0051_0001" ~ "Páginas web",
                         key == "q0051_0002" ~ "Redes sociales",
                         key == "q0051_0003" ~ "Radio",
                         key == "q0051_0004" ~ "Televisión",
                         key == "q0051_0005" ~ "Folletos o volantes",
                         key == "q0051_0006" ~ "En la calle (carteles, vallas)",
                         key == "q0051_0007" ~ "Periódicos",
                         key == "q0051_0008" ~ "Revistas",
                         key == "q0051_0009" ~ "Correo electrónico o llamadas",
                         key == "q0051_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Por cual de los siguientes \n medios la vio?")

6.50.1 Otros

Data_Docentes %>%
  select(q0051_other) %>%
  mutate(q0051_other = as.character(q0051_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents
## Warning in wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words
## = 500, : carretera could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words
## = 500, : museo could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words
## = 500, : publicitan could not be fit on page. It will not be plotted.

6.51 ¿A que museo pertenecía dicha publicidad?

Data_Docentes %>%
  select(q0052) %>%
  mutate(q0052 = as.character(q0052),
         q0052 = str_remove_all(q0052, "Museo"),
         q0052 = str_remove_all(q0052, "MUSEO"),
         q0052 = str_remove_all(q0052, "museo")) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

6.52 ¿Te gustaría ver o escuchar alguna publicidad/información del Museo Nacional del Perú (MUNA)?

Data_Docentes %>%
  select(q0053) %>%
  mutate(q0053 = as.character(q0053),
         q0053 = case_when(q0053 == "1" ~ "Si",
                           q0053 == "2" ~ "No",
                           TRUE ~ q0053),
         q0053 = factor(q0053)) %>%
  filter(!is.na(q0053)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Te gustaría ver o escuchar alguna \n publicidad/información del Museo \n Nacional del Perú (MUNA)?")

6.53 ¿Por cuales de los siguientes medios te gustaría hacerlo?

Data_Docentes %>%
  select(q0054_0001:q0054_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0054_0001:q0054_other) %>%
  filter(!is.na(value), value != "", key != "q0054_0010") %>%
  mutate(key = case_when(key == "q0054_0001" ~ "Páginas web",
                         key == "q0054_0002" ~ "Redes sociales",
                         key == "q0054_0003" ~ "Radio",
                         key == "q0054_0004" ~ "Televisión",
                         key == "q0054_0005" ~ "Folletos o volantes",
                         key == "q0054_0006" ~ "En la calle (carteles, vallas)",
                         key == "q0054_0007" ~ "Periódicos",
                         key == "q0054_0008" ~ "Revistas",
                         key == "q0054_0009" ~ "Correo electrónico o llamadas",
                         key == "q0054_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Por cuales de los siguientes medios \n te gustaría hacerlo?")

6.53.1 Otros

Data_Docentes %>%
  select(q0054_other) %>%
  mutate(q0054_other = as.character(q0054_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

6.54 ¿Qué es un museo nacional para usted?

Data_Docentes %>%
  select(q0055) %>%
  mutate(q0055 = as.character(q0055)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

6.55 Para usted, el museo significa:

Data_Docentes %>%
  select(q0056_0001:q0056_0003) %>%
  gather(key = "key", value = "value", q0056_0001:q0056_0003) %>%
  select(value) %>%
  filter(!is.na(value), value != "") %>%
  mutate(value = as.character(value)) %>%
  cloud()
## Warning: attributes are not identical across measure variables;
## they will be dropped
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

6.56 LIKERT

Data_Docentes %>%
  select(q0057_0001:q0057_0004) %>%
  mutate(q0057_0001 = factor(q0057_0001, levels = c(1, 2, 3, 4, 5), labels = c("Nada importante", 2, 3, 4, "Muy importante")),
         q0057_0002 = factor(q0057_0002, levels = c(1, 2, 3, 4, 5), labels = c("Nada importante", 2, 3, 4, "Muy importante")),
         q0057_0003 = factor(q0057_0003, levels = c(1, 2, 3, 4, 5), labels = c("Nada importante", 2, 3, 4, "Muy importante")),
         q0057_0004 = factor(q0057_0004, levels = c(1, 2, 3, 4, 5), labels = c("Nada importante", 2, 3, 4, "Muy importante"))) %>%
  filter(!is.na(q0057_0001)) %>%
  rename(cultural = q0057_0001,
         identidad = q0057_0002,
         patrimonio = q0057_0003,
         museos = q0057_0004) %>%
  grafico_likert(titulo = "La valoración 'cultural'. \n La valoración de la 'identidad'. \n La valoración del 'patrimonio'. \n Los 'museos'.")

7 Data Estudiantes

7.1 ¿En que distrito vive actualmente?

Data_Estudiantes %>%
  select(q0002_0003) %>%
  mutate(q0002_0003 = str_to_title(q0002_0003),
         q0002_0003 = str_replace(q0002_0003, "Smp", "San Martín De Porres"),
         q0002_0003 = str_replace(q0002_0003, "Villa Maria Del Triunfo", "Villa María Del Triunfo"),
         q0002_0003 = str_replace(q0002_0003, "Chorrilos", "Chorrillos"),
         q0002_0003 = str_replace(q0002_0003, "San Juan De Lurignacho", "San Juan De Lurigancho"),
         q0002_0003 = factor(q0002_0003),
         q0002_0003 = str_replace(q0002_0003, "San Martin De Porres", "San Martín De Porres"),
         q0002_0003 = str_replace(q0002_0003, "Vmt", "Villa María Del Triunfo"),
         q0002_0003 = str_replace(q0002_0003, "Ves", "Villa El Salvador"),
         q0002_0003 = str_replace(q0002_0003, "Venyanilla", "Ventanilla"),
         q0002_0003 = str_replace(q0002_0003, "Lurín", "Lurin"),
         q0002_0003 = str_replace(q0002_0003, "Sjl", "San Juan De Lurigancho"),
         q0002_0003 = str_replace(q0002_0003, "Carmen De La Legua-Reynoso", "Carmen De La Legua"),
         q0002_0003 = str_replace(q0002_0003, "Rimac", "Rímac")) %>%
  grafico(tipo = "cualitativo1", xlab = "Distritos", ylab = "Encuestas recopiladas", title = "Cantidad de encuestas recopiladas por Distrito")

7.2 ¿Que edad tiene usted ?

Data_Estudiantes %>%
  select(q0003_X_Rang) %>%
  mutate(q0003_X_Rang = factor(q0003_X_Rang, levels = c(1, 2, 3), labels = c("De 17 a 20 años", "De 21 a 25 años", "Más 25 años"))) %>%
  filter(!is.na(q0003_X_Rang)) %>%
  grafico(tipo = "ordinal", xlab = "Edad", ylab = "Encuestas recopiladas", title = "Cantidad de encuestas recopiladas \n por Edad")

7.3 ¿Cuál es su lengua materna?

Data_Estudiantes %>%
  select(q0004, q0004_other) %>%
  mutate(q0004 = as.character(q0004),
         q0004_other = as.character(q0004_other),
         q0004 = case_when(q0004 == "0" ~ "Otro",
                           q0004 == "1" ~ "Quechua",
                           q0004 == "2" ~ "Asháninca",
                           q0004 == "3" ~ "Aimara",
                           q0004 == "4" ~ "Español",
                           TRUE ~ q0004)) %>%
  select(q0004) %>%
  mutate(q0004 = factor(q0004)) %>%
  filter(!is.na(q0004)) %>%
  grafico(tipo = "cualitativo1", xlab = "Lengua materna", ylab = "Encuestas recopiladas", title = "Cantidad de encuestas recopiladas por Lengua materna")

7.3.1 Otros

Data_Estudiantes %>%
  select(q0004_other) %>%
  mutate(q0004_other = as.character(q0004_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

7.4 ¿Domina alguna lengua además de la materna?

Data_Estudiantes %>%
  select(q0005) %>%
  mutate(q0005 = as.character(q0005),
         q0005 = case_when(q0005 == "1" ~ "Si",
                           q0005 == "2" ~ "No",
                           TRUE ~ q0005),
         q0005 = factor(q0005)) %>%
  filter(!is.na(q0005)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Domina alguna lengua además \n de la materna?")

7.5 ¿Qué otra lengua domina?

Data_Estudiantes %>%
  select(q0006_0001:q0006_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0006_0001:q0006_other) %>%
  filter(!is.na(value), value != "", key != "q0006_0008") %>%
  mutate(key = case_when(key == "q0006_0001" ~ "Quechua",
                         key == "q0006_0002" ~ "Aimara",
                         key == "q0006_0003" ~ "Asháninca",
                         key == "q0006_0004" ~ "Español",
                         key == "q0006_0005" ~ "Ingles",
                         key == "q0006_0006" ~ "Portugués",
                         key == "q0006_0007" ~ "Francés",
                         key == "q0006_other" ~ "Otro",
                         TRUE ~ key),
         key = str_to_title(key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "Idioma", ylab = "frecuencia", title = "¿Qué otra lengua domina?")

7.5.1 Otros

Data_Estudiantes %>%
  select(q0006_other) %>%
  mutate(q0006_other = as.character(q0006_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

7.6 Adicionalmente a su labor académica ¿Tiene otra ocupación?

Data_Estudiantes %>%
  select(q0007, q0007_other) %>%
  mutate_all(as.character) %>%
  mutate(q0007 = case_when(q0007 == "0" ~ "Otro",
                           q0007 == "1" ~ "Trabajador dependiente",
                           q0007 == "2" ~ "Trabajador independiente",
                           q0007 == "3" ~ "Ama (o) de casa",
                           q0007 == "4" ~ "Estudiante técnico o universitario",
                           q0007 == "5" ~ "Sin ocupación",
                           TRUE ~ q0007),
         q0007 = factor(q0007)) %>%
  select(q0007) %>%
  filter(!is.na(q0007)) %>%
  grafico(tipo = "cualitativo1", xlab = "Ocupacion", ylab = "frecuencia", title = "¿Tiene otra ocupación?")

7.6.1 Otros

Data_Estudiantes %>%
  select(q0007_other) %>%
  mutate(q0007_other = as.character(q0007_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

7.7 Por el tiempo que destina semanalmente a su trabajo ¿Cuál de las siguientes opciones lo define mejor?

Data_Estudiantes %>%
  select(q0008) %>%
  mutate(q0008 = as.character(q0008),
         q0008 = case_when(q0008 == "1" ~ "Trabajador Full-Time \n (8 Horas x 6 dias o 48 horas semanales)",
                           q0008 == "2" ~ "Trabajador Middle- Time \n (6 Horas x 6 Dias o 36 horas semanales)",
                           q0008 == "3" ~ "Trabajador Part- Time \n (4 Horas x 6 dias o 24 horas semanales)",
                           q0008 == "4" ~ "Tengo más de un trabajo a la vez",
                           TRUE ~ q0008),
         q0008 = factor(q0008, levels = c("Tengo más de un trabajo a la vez", "Trabajador Part- Time \n (4 Horas x 6 dias o 24 horas semanales)", "Trabajador Middle- Time \n (6 Horas x 6 Dias o 36 horas semanales)", "Trabajador Full-Time \n (8 Horas x 6 dias o 48 horas semanales)"))) %>%
  filter(!is.na(q0008)) %>%
  grafico(tipo = "ordinal", xlab = "Tiempos de trabajo", ylab = "frecuencia", title = "¿Cuál de las siguientes opciones \n lo define mejor?")

7.8 ¿Cuál es su nivel de instrucción?

Data_Estudiantes %>%
  select(q0009, q0009_other) %>%
  mutate_all(as.character) %>%
  mutate(q0009 = case_when(q0009 == "0" ~ "Otro",
                           q0009 == "1" ~ "Superior Pedagógico",
                           q0009 == "2" ~ "Superior Técnico",
                           q0009 == "3" ~ "Superior Universitario",
                           TRUE ~ q0009),
         q0009 = factor(q0009, levels = c("Otro", "Superior Pedagógico", "Superior Técnico", "Superior Universitario"))) %>%
  select(q0009) %>%
  filter(!is.na(q0009)) %>%
  grafico(tipo = "ordinal", xlab = "Nivel", ylab = "frecuencia", title = "¿Cuál es su nivel de instrucción?")

7.9 ¿Cuál es el tipo de gestión de su entidad educativa?

Data_Estudiantes %>%
  select(q0010) %>%
  mutate(q0010 = as.character(q0010),
         q0010 = case_when(q0010 == "1" ~ "Público",
                           q0010 == "2" ~ "Privado",
                           TRUE ~ q0010),
         q0010 = factor(q0010)) %>%
  filter(!is.na(q0010)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Cuál es el tipo de gestión \n de su entidad educativa?")

7.10 ¿Que carrera estudia?

Data_Estudiantes %>%
  select(q0011) %>%
  mutate(q0011 = as.character(q0011)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

7.11 Por tu autoidentificación de género te consideras:

Data_Estudiantes %>%
  select(q0012, q0012_other) %>%
  mutate_all(as.character) %>%
  mutate(q0012 = case_when(q0012 == "0" ~ "Otro",
                           q0012 == "1" ~ "Hombre",
                           q0012 == "2" ~ "Mujer",
                           q0012 == "3" ~ "Prefiero no decirlo",
                           q0012 == "4" ~ "Otro",
                           TRUE ~ q0012),
         q0012 = factor(q0012)) %>%
  select(q0012) %>%
  filter(!is.na(q0012)) %>%
  grafico(tipo = "cualitativo2", xlab = "Género", ylab = "frecuencia", title = "Por tu autoidentificación de género \n te consideras:")

7.11.1 Otros

Data_Estudiantes %>%
  select(q0012_other) %>%
  mutate(q0012_other = as.character(q0012_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents
## NULL

7.12 Por sus costumbres y sus antepasados usted se considera:

Data_Estudiantes %>%
  select(q0013, q0013_other) %>%
  mutate_all(as.character) %>%
  mutate(q0013 = case_when(q0013 == "0" ~ "Otro",
                           q0013 == "1" ~ "Quechua",
                           q0013 == "2" ~ "Aimara",
                           q0013 == "3" ~ "Parte de otro pueblo \n indígena u originario",
                           q0013 == "4" ~ "Mestizo",
                           q0013 == "5" ~ "Blanco",
                           q0013 == "6" ~ "Negro, moreno, zambo, mulato / \n pueblo afroperuano o afrodescendiente",
                           q0013 == "7" ~ "Tusan",
                           q0013 == "8" ~ "Nikkei",
                           q0013 == "9" ~ "Otro",
                           TRUE ~ q0013),
         q0013 = factor(q0013)) %>%
  select(q0013) %>%
  filter(!is.na(q0013), q0013 != "") %>%
  grafico(tipo = "cualitativo1", xlab = "Costumbres", ylab = "frecuencia", title = "Por sus costumbres y sus \n antepasados usted se considera:")

7.13 ¿Qué tan importante considera el aspecto cultural en su vida?

Data_Estudiantes %>%
  select(q0014) %>%
  mutate(q0014 = factor(q0014),
         q0014 = recode_factor(q0014, "1" = "5", "2" = "4", "4" = "2", "5" = "1"),
         q0014 = factor(q0014, levels = c(1, 2, 3, 4, 5), labels = c("Nada importante", 2, 3, 4, "Muy importante"))) %>%
  filter(!is.na(q0014)) %>%
  rename(aspecto_cultural = q0014) %>%
  grafico_likert(titulo = "¿Qué tan importante considera el aspecto \n cultural en su vida?")

7.14 ¿Alguna vez ha visitado un museo?

Data_Estudiantes %>%
  select(q0015) %>%
  mutate(q0015 = as.character(q0015),
         q0015 = case_when(q0015 == "1" ~ "Si",
                           q0015 == "2" ~ "No",
                           TRUE ~ q0015),
         q0015 = factor(q0015)) %>%
  filter(!is.na(q0015)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Alguna vez ha visitado un museo?")

7.15 ¿Le gusta visitar museos?

Data_Estudiantes %>%
  select(q0016) %>%
  mutate(q0016 = as.character(q0016),
         q0016 = case_when(q0016 == "1" ~ "Si",
                           q0016 == "2" ~ "No",
                           TRUE ~ q0016),
         q0016 = factor(q0016)) %>%
  filter(!is.na(q0016)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Le gusta visitar museos?")

7.16 ¿Qué te motiva a visitarlos?

Data_Estudiantes %>%
  select(q0017_0001:q0017_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0017_0001:q0017_other) %>%
  filter(!is.na(value), value != "", key != "q0017_0012") %>%
  mutate(key = case_when(key == "q0017_0001" ~ "enriquece mi conocimiento cultural",
                         key == "q0017_0002" ~ "buscar una nueva experiencia",
                         key == "q0017_0003" ~ "pasar un día con amigos/pareja",
                         key == "q0017_0004" ~ "visitar las exposiciones temporales",
                         key == "q0017_0005" ~ "para ver algo en específico \n que he oído hablar",
                         key == "q0017_0006" ~ "pasar un día en familia",
                         key == "q0017_0007" ~ "enseñar el museo a amigos, conocidos o familiares",
                         key == "q0017_0008" ~ "conocer las colecciones",
                         key == "q0017_0009" ~ "por una actividad organizada por \n el museo/centro expositivo (servicio complementario)",
                         key == "q0017_0010" ~ "esta incluido en una visita turística",
                         key == "q0017_0011" ~ "Para ver algo en especifico \n que he oído hablar o me he enterado",
                         key == "q0017_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "Motivo", ylab = "frecuencia", title = "¿Qué te motiva a visitarlos?")

7.16.1 Otros

Data_Estudiantes %>%
  select(q0017_other) %>%
  mutate(q0017_other = as.character(q0017_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents
## Warning in wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words
## = 500, : patrimonio could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words
## = 500, : variedad could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words
## = 500, : artística could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words
## = 500, : expresion could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words
## = 500, : interesa could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words
## = 500, : pasado could not be fit on page. It will not be plotted.

7.17 ¿Qué no le gustó de ellos?

Data_Estudiantes %>%
  select(q0018_0001:q0018_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0018_0001:q0018_other) %>%
  filter(!is.na(value), value != "", key != "q0018_0007") %>%
  mutate(key = case_when(key == "q0018_0001" ~ "Que fue aburrido y monótono",
                         key == "q0018_0002" ~ "Que no se entienden",
                         key == "q0018_0003" ~ "Exponen cosas que no me interesan",
                         key == "q0018_0004" ~ "Mala calidad de los servicios \n del museo",
                         key == "q0018_0005" ~ "Guías de turismo no brindaron \n un buen servicio",
                         key == "q0018_0006" ~ "Nada me ha disgustado \n en mi visita",
                         key == "q0018_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Qué no le gustó de ellos?")

7.17.1 Otros

Data_Estudiantes %>%
  select(q0018_other) %>%
  mutate(q0018_other = as.character(q0018_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

7.18 ¿Qué no le gusta de ellos?

Data_Estudiantes %>%
  select(q0019_0001:q0019_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0019_0001:q0019_other) %>%
  filter(!is.na(value), value != "", key != "q0019_0006") %>%
  mutate(key = case_when(key == "q0019_0001" ~ "Que sean aburridos y monótonos",
                         key == "q0019_0002" ~ "Que no se entienden",
                         key == "q0019_0003" ~ "Exponen cosas que no me interesan",
                         key == "q0019_0004" ~ "Mala calidad de los servicios del museo",
                         key == "q0019_0005" ~ "Guías de turismo no brindan un buen servicio",
                         key == "q0019_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Qué no le gusta de ellos?")

7.18.1 Otros

Data_Estudiantes %>%
  select(q0019_other) %>%
  mutate(q0019_other = as.character(q0019_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents
## NULL

7.19 En el año 2019, ¿ha visitado museos de manera presencial?

Data_Estudiantes %>%
  select(q0020) %>%
  mutate(q0020 = as.character(q0020),
         q0020 = case_when(q0020 == "1" ~ "Si",
                           q0020 == "2" ~ "No",
                           TRUE ~ q0020),
         q0020 = factor(q0020)) %>%
  filter(!is.na(q0020)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "En el año 2019, ¿ha visitado \n museos de manera presencial?")

7.20 ¿Cuántas veces ha visitado un museo en el 2019?

Data_Estudiantes %>%
  select(q0021_X_Rang) %>%
  mutate(q0021_X_Rang = factor(q0021_X_Rang, levels = c(1, 2, 3, 4), labels = c("De 1 a 3 veces", "De 4 a 6 veces", "De 7 a 10 veces", "Más de 10 veces"))) %>%
  filter(!is.na(q0021_X_Rang)) %>%
  grafico(tipo = "ordinal", xlab = "N° de Veces", ylab = "Encuestas recopiladas", title = "¿Cuántas veces ha visitado \n un museo en el 2019?")

7.21 Respecto a su última visita ¿usted realizo la visita solo o acompañado o formo parte de un grupo?

Data_Estudiantes %>%
  select(q0022) %>%
  mutate(q0022 = as.character(q0022),
         q0022 = case_when(q0022 == "1" ~ "He ido solo",
                           q0022 == "2" ~ "He ido acompañado de otras personas \n (pareja, amigos, familia)",
                           q0022 == "3" ~ "He ido en un grupo organizado \n (tours turísticos, grupos con algún fin u objetivo)",
                           TRUE ~ q0022),
         q0022 = factor(q0022)) %>%
  filter(!is.na(q0022)) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "Encuestas recopiladas", title = "Respecto a su última visita \n ¿usted realizo la visita solo \n o acompañado o formo parte \n de un grupo?")

7.22 ¿Cuántas personas lo acompañaron en promedio?

Data_Estudiantes %>%
  select(q0023_X_Rang) %>%
  mutate(q0023_X_Rang = factor(q0023_X_Rang, levels = c(1, 2, 3), labels = c("De 1 a 3 personas", "De 4 a 9 personas", "Más de 10 personas"))) %>%
  filter(!is.na(q0023_X_Rang)) %>%
  grafico(tipo = "ordinal", xlab = "N° de personas", ylab = "Encuestas recopiladas", title = "¿Cuántas personas lo acompañaron en promedio?")

7.23 Cuéntenos, ¿con quién fue al museo? (Puede marcar varias de las siguientes opciones):

Data_Estudiantes %>%
  select(q0024_0001:q0024_0005) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0024_0001:q0024_0005) %>%
  filter(!is.na(value), value != "") %>%
  mutate(key = case_when(key == "q0024_0001" ~ "Con mi pareja",
                         key == "q0024_0002" ~ "Mi familia (hijos(as), esposa (o))",
                         key == "q0024_0003" ~ "Mis padres",
                         key == "q0024_0004" ~ "Otros parientes",
                         key == "q0024_0005" ~ "Colegas, amigos de la universidad \n o instituto",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "Encuestas recopiladas", title = "¿con quién fue al museo?")  

7.24 ¿Cuántas personas lo acompañaron en promedio?

Data_Estudiantes %>%
  select(q0025_X_Rang) %>%
  mutate(q0025_X_Rang = factor(q0025_X_Rang, levels = c(1, 2, 3), labels = c("De 1 a 3 personas", "De 4 a 9 personas", "Más de 10 personas"))) %>%
  filter(!is.na(q0025_X_Rang)) %>%
  grafico(tipo = "ordinal", xlab = "N° de personas", ylab = "Encuestas recopiladas", title = "¿Cuántas personas lo acompañaron en promedio?")

7.25 ¿Qué tipo de grupo fue? (Puede marcar varias de las siguientes opciones):

Data_Estudiantes %>%
  select(q0026_0001:q0026_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0026_0001:q0026_other) %>%
  filter(!is.na(value), value != "", key != "q0026_0004") %>%
  mutate(key = case_when(key == "q0026_0001" ~ "Un grupo de personas organizado \n en visitas turísticas",
                         key == "q0026_0002" ~ "Un grupo escolar/educativo",
                         key == "q0026_0003" ~ "Un grupo organizado en \n visita cultural",
                         key == "q0026_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "frecuencia", title = "¿Qué tipo de grupo fue?")

7.25.1 Otros

Data_Estudiantes %>%
  select(q0026_other) %>%
  mutate(q0026_other = as.character(q0026_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

7.26 ¿Cuál fue el principal motivo de su visita al museo?

Data_Estudiantes %>%
  select(q0027, q0027_other) %>%
  mutate_all(as.character) %>%
  mutate(q0027 = case_when(q0027 == "0" ~ "Otro",
                           q0027 == "1" ~ "Paseo familiar",
                           q0027 == "2" ~ "Requerido u organizado por la \n Universidad/Instituto",
                           q0027 == "3" ~ "Requerido u organizado por el trabajo",
                           q0027 == "4" ~ "Cuenta propia o con amigos",
                           TRUE ~ q0027),
         q0027 = factor(q0027)) %>%
  select(q0027) %>%
  filter(!is.na(q0027), q0027 != "") %>%
  grafico(tipo = "cualitativo1", xlab = "Costumbres", ylab = "frecuencia", title = "¿Cuál fue el principal motivo \n de su visita al museo?")

7.26.1 Otros

Data_Estudiantes %>%
  select(q0027_other) %>%
  mutate(q0027_other = as.character(q0027_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

7.27 En general ¿Cuáles son los tres (03) principales problemas que ha experimentado o que encuentra en la actualidad durante su visita a un museo?

Data_Estudiantes %>%
  select(q0028_0001:q0028_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0028_0001:q0028_other) %>%
  filter(!is.na(value), value != "", key != "q0028_0010") %>%
  mutate(key = case_when(key == "q0028_0001" ~ "Respecto a la ubicación \n del museo (entorno)",
                         key == "q0028_0002" ~ "Respecto a costo de tickets",
                         key == "q0028_0003" ~ "Respecto a distancias en el transporte",
                         key == "q0028_0004" ~ "Respecto a costo del transporte",
                         key == "q0028_0005" ~ "Respecto a disponibilidad de estacionamientos",
                         key == "q0028_0006" ~ "Respecto a espacios de investigación",
                         key == "q0028_0007" ~ "Respecto a espacios pedagógicos/didácticos",
                         key == "q0028_0008" ~ "Exposiciones no están acordes \n al curriculum nacional",
                         key == "q0028_0009" ~ "No hay guiado especializado para niños",
                         key == "q0028_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "En general ¿Cuáles son los \n tres (03) principales problemas que \n ha experimentado o que encuentra \n en la actualidad durante su \n visita a un museo?")

7.27.1 Otros

Data_Estudiantes %>%
  select(q0028_other) %>%
  mutate(q0028_other = as.character(q0028_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

7.28 ¿Ud. buscó información antes de realizar una visita?

Data_Estudiantes %>%
  select(q0029) %>%
  mutate(q0029 = as.character(q0029),
         q0029 = case_when(q0029 == "1" ~ "Si",
                           q0029 == "2" ~ "No",
                           TRUE ~ q0029),
         q0029 = factor(q0029)) %>%
  filter(!is.na(q0029)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Ud. buscó información antes de \n realizar una visita?")

7.29 ¿Qué tipo de información buscó?

Data_Estudiantes %>%
  select(q0030_0001:q0030_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0030_0001:q0030_other) %>%
  filter(!is.na(value), value != "", key != "q0030_0008") %>%
  mutate(key = case_when(key == "q0030_0001" ~ "Precios de entrada",
                         key == "q0030_0002" ~ "Dirección exacta/referencias",
                         key == "q0030_0003" ~ "Actividades adicionales dentro del museo \n (concierto, teatro, cine, otros)",
                         key == "q0030_0004" ~ "Servicios adicionales (restaurantes, cafeterías)",
                         key == "q0030_0005" ~ "Servicios para personas \n con habilidades especiales",
                         key == "q0030_0006" ~ "Si el lugar cuenta con personal capacitado \n e instalaciones adecuadas para acoger a \n personas con habilidades especiales.",
                         key == "q0030_0007" ~ "Tipo de contenido",
                         key == "q0030_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Qué tipo de información buscó?")

7.29.1 Otros

Data_Estudiantes %>%
  select(q0030_other) %>%
  mutate(q0030_other = as.character(q0030_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents
## Warning in wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words
## = 500, : dirección could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words
## = 500, : entreda could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words
## = 500, : infraestructura could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words
## = 500, : ninguna could not be fit on page. It will not be plotted.

7.30 ¿Por qué no?

Data_Estudiantes %>%
  select(q0031_0001:q0031_0004) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0031_0001:q0031_0004) %>%
  filter(!is.na(value), value != "") %>%
  mutate(key = case_when(key == "q0031_0001" ~ "Falta de tiempo",
                         key == "q0031_0002" ~ "Lejanía/ poca accesibilidad al museo",
                         key == "q0031_0003" ~ "Falta de información sobre los museos",
                         key == "q0031_0004" ~ "No me resulta interesante/no me gusta",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Por qué no?")  

7.31 ¿Ha considerado ir a un museo actualmente?

Data_Estudiantes %>%
  select(q0032) %>%
  mutate(q0032 = as.character(q0032),
         q0032 = case_when(q0032 == "1" ~ "Si",
                           q0032 == "2" ~ "No",
                           TRUE ~ q0032),
         q0032 = factor(q0032)) %>%
  filter(!is.na(q0032)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Ha considerado ir \n a un museo actualmente?")

7.32 ¿Por que no iría a un museo actualmente?

Data_Estudiantes %>%
  select(q0033_X) %>%
  mutate(q0033_X = as.character(q0033_X)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

7.33 ¿Alguna vez ha visitado un museo de manera virtual?

Data_Estudiantes %>%
  select(q0034) %>%
  mutate(q0034 = as.character(q0034),
         q0034 = case_when(q0034 == "1" ~ "Si",
                           q0034 == "2" ~ "No",
                           TRUE ~ q0034),
         q0034 = factor(q0034)) %>%
  filter(!is.na(q0034)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Alguna vez ha visitado \n un museo de manera virtual?")

7.34 ¿Qué museo visitaste virtualmente?

Data_Estudiantes %>%
  select(q0035) %>%
  mutate(q0035 = as.character(q0035),
         q0035 = str_remove_all(q0035, "Museo"),
         q0035 = str_remove_all(q0035, "MUSEO"),
         q0035 = str_remove_all(q0035, "museo")) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

7.35 ¿Qué otros espacios culturales visita o ha visitado con frecuencia?

Data_Estudiantes %>%
  select(q0036_0001:q0036_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0036_0001:q0036_other) %>%
  filter(!is.na(value), value != "", key != "q0036_0006") %>%
  mutate(key = case_when(key == "q0036_0001" ~ "Teatro",
                         key == "q0036_0002" ~ "Cine",
                         key == "q0036_0003" ~ "Conciertos",
                         key == "q0036_0004" ~ "Parques",
                         key == "q0036_0005" ~ "Ferias y circos",
                         key == "q0036_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Qué otros espacios culturales visita \n o ha visitado con frecuencia?")

7.35.1 otros

Data_Estudiantes %>%
  select(q0036_other) %>%
  mutate(q0036_other = as.character(q0036_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

7.36 ¿Dónde realiza o ha realizado estas actividades culturales?

Data_Estudiantes %>%
  select(q0037_0001:q0037_0003) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0037_0001:q0037_0003) %>%
  filter(!is.na(value), value != "") %>%
  mutate(key = case_when(key == "q0037_0001" ~ "En mi distrito",
                         key == "q0037_0002" ~ "En otro distrito",
                         key == "q0037_0003" ~ "Virtualmente",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Dónde realiza o ha realizado \n estas actividades culturales?")

7.37 ¿Cómo parte de sus estudios ha realizado visitas académicas a museos?

Data_Estudiantes %>%
  select(q0038) %>%
  mutate(q0038 = as.character(q0038),
         q0038 = case_when(q0038 == "1" ~ "Si",
                           q0038 == "2" ~ "No",
                           TRUE ~ q0038),
         q0038 = factor(q0038)) %>%
  filter(!is.na(q0038)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "Cómo parte de sus estudios \n ha realizado visitas académicas a museos?")

7.38 Respecto a la ultima visita académica realizada a museos ¿Quién lo organizó?

Data_Estudiantes %>%
  select(q0039) %>%
  mutate(q0039 = as.character(q0039),
         q0039 = case_when(q0039 == "1" ~ "Por iniciativa del docente \n y/o la institución educativa",
                           q0039 == "2" ~ "Por iniciativa propia",
                           q0039 == "3" ~ "Organización conjunta con compañeros de curso",
                           TRUE ~ q0039),
         q0039 = factor(q0039)) %>%
  filter(!is.na(q0039)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "Respecto a la ultima visita \n académica realizada a museos \n ¿Quién lo organizó?")

7.39 ¿Cuál fue el motivo de la visita?

Data_Estudiantes %>%
  select(q0040_0001:q0040_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0040_0001:q0040_other) %>%
  filter(!is.na(value), value != "", key != "q0040_0005") %>%
  mutate(key = case_when(key == "q0040_0001" ~ "Investigaciones y tesis",
                         key == "q0040_0002" ~ "Trabajos de cursos",
                         key == "q0040_0003" ~ "Con fines de ocio",
                         key == "q0040_0004" ~ "Motivos personales",
                         key == "q0040_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "frecuencia", title = "¿Cuál fue el motivo de la visita?")

7.39.1 otros

Data_Estudiantes %>%
  select(q0040_other) %>%
  mutate(q0040_other = as.character(q0040_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

7.40 Indique el numero de personas que conformaron el grupo:

Data_Estudiantes %>%
  select(q0041_X_Rang) %>%
  mutate(q0041_X_Rang = factor(q0041_X_Rang, levels = c(1, 2, 3, 4), labels = c("De 1 a 5 personas", "De 6 a 15 personas", "De 15 a 30 personas", "Más de 30 personas"))) %>%
  filter(!is.na(q0041_X_Rang)) %>%
  grafico(tipo = "ordinal", xlab = "", ylab = "frecuencia", title = "Indique el numero de personas \n que conformaron el grupo:")

7.41 ¿Ud. buscó información antes de realizar su visita académica?

Data_Estudiantes %>%
  select(q0042) %>%
  mutate(q0042 = as.character(q0042),
         q0042 = case_when(q0042 == "1" ~ "Si",
                           q0042 == "2" ~ "No",
                           TRUE ~ q0042),
         q0042 = factor(q0042)) %>%
  filter(!is.na(q0042)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Ud. buscó información antes \n de realizar su visita académica?")

7.42 ¿Qué tipo de información buscó para concretar sus visita académica?

Data_Hogar %>%
  select(q0043_0001:q0043_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0043_0001:q0043_other) %>%
  filter(!is.na(value), value != "", key != "q0043_0008") %>%
  mutate(key = case_when(key == "q0043_0001" ~ "Precios de entrada",
                         key == "q0043_0002" ~ "Dirección exacta/referencias",
                         key == "q0043_0003" ~ "Actividades adicionales dentro del museo \n (concierto, teatro, cine, otros)",
                         key == "q0043_0004" ~ "Servicios adicionales (restaurantes, cafeterías)",
                         key == "q0043_0005" ~ "Servicios para personas \n con habilidades especiales",
                         key == "q0043_0006" ~ "Si el lugar cuenta con personal capacitado \n e instalaciones adecuadas para acoger a \n personas con habilidades especiales.",
                         key == "q0043_0007" ~ "Tipo de contenido",
                         key == "q0043_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Qué tipo de información buscó \n para concretar sus visita académica?")

7.43 ¿Alguna vez ha visto o recuerda alguna publicidad de algún museo?

Data_Estudiantes %>%
  select(q0044) %>%
  mutate(q0044 = as.character(q0044),
         q0044 = case_when(q0044 == "1" ~ "Si",
                           q0044 == "2" ~ "No",
                           TRUE ~ q0044),
         q0044 = factor(q0044)) %>%
  filter(!is.na(q0044)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Alguna vez ha visto o recuerda \n  alguna publicidad de algún museo?")

7.44 ¿Por cual de los siguientes medios la vio?

Data_Estudiantes %>%
  select(q0045_0001:q0045_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0045_0001:q0045_other) %>%
  filter(!is.na(value), value != "", key != "q0045_0010") %>%
  mutate(key = case_when(key == "q0045_0001" ~ "Páginas web",
                         key == "q0045_0002" ~ "Redes sociales",
                         key == "q0045_0003" ~ "Radio",
                         key == "q0045_0004" ~ "Televisión",
                         key == "q0045_0005" ~ "Folletos o volantes",
                         key == "q0045_0006" ~ "En la calle (carteles, vallas)",
                         key == "q0045_0007" ~ "Periódicos",
                         key == "q0045_0008" ~ "Revistas",
                         key == "q0045_0009" ~ "Correo electrónico o llamadas",
                         key == "q0045_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Por cual de los siguientes \n medios la vio?")

7.44.1 otros

Data_Estudiantes %>%
  select(q0045_other) %>%
  mutate(q0045_other = as.character(q0045_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

7.45 ¿A que museo pertenecía dicha publicidad?

Data_Estudiantes %>%
  select(q0046) %>%
  mutate(q0046 = as.character(q0046),
         q0046 = str_remove_all(q0046, "Museo"),
         q0046 = str_remove_all(q0046, "MUSEO"),
         q0046 = str_remove_all(q0046, "museo")) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

7.46 ¿Te gustaría ver o escuchar alguna publicidad/información del Museo Nacional del Perú (MUNA)?

Data_Estudiantes %>%
  select(q0047) %>%
  mutate(q0047 = as.character(q0047),
         q0047 = case_when(q0047 == "1" ~ "Si",
                           q0047 == "2" ~ "No",
                           TRUE ~ q0047),
         q0047 = factor(q0047)) %>%
  filter(!is.na(q0047)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Alguna vez ha visto o recuerda \n  alguna publicidad de algún museo?")

7.47 ¿Por cuales de los siguientes medios te gustaría hacerlo?

Data_Estudiantes %>%
  select(q0048_0001:q0048_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0048_0001:q0048_other) %>%
  filter(!is.na(value), value != "", key != "q0048_0010") %>%
  mutate(key = case_when(key == "q0048_0001" ~ "Páginas web",
                         key == "q0048_0002" ~ "Redes sociales",
                         key == "q0048_0003" ~ "Radio",
                         key == "q0048_0004" ~ "Televisión",
                         key == "q0048_0005" ~ "Folletos o volantes",
                         key == "q0048_0006" ~ "En la calle (carteles, vallas)",
                         key == "q0048_0007" ~ "Periódicos",
                         key == "q0048_0008" ~ "Revistas",
                         key == "q0048_0009" ~ "Correo electrónico o llamadas",
                         key == "q0048_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Por cuales de los siguientes medios  \n te gustaría hacerlo?")

7.47.1 otros

Data_Estudiantes %>%
  select(q0048_other) %>%
  mutate(q0048_other = as.character(q0048_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

7.48 ¿Qué redes sociales utiliza frecuentemente?

Data_Estudiantes %>%
  select(q0049_0001:q0049_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0049_0001:q0049_other) %>%
  filter(!is.na(value), value != "", key != "q0049_0006") %>%
  mutate(key = case_when(key == "q0049_0001" ~ "Facebook",
                         key == "q0049_0002" ~ "Instagram",
                         key == "q0049_0003" ~ "YouTube",
                         key == "q0049_0004" ~ "Tik Tok",
                         key == "q0049_0005" ~ "No utilizo ninguna red social",
                         key == "q0049_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Qué redes sociales \n utiliza frecuentemente?")

7.48.1 otros

Data_Estudiantes %>%
  select(q0049_other) %>%
  mutate(q0049_other = as.character(q0049_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

7.49 ¿Sigue a museos (nacionales/extranjeros) en sus redes sociales?

Data_Estudiantes %>%
  select(q0050) %>%
  mutate(q0050 = as.character(q0050),
         q0050 = case_when(q0050 == "1" ~ "Si",
                           q0050 == "2" ~ "No",
                           TRUE ~ q0050),
         q0050 = factor(q0050)) %>%
  filter(!is.na(q0050)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Sigue a museos (nacionales/extranjeros) \n en sus redes sociales?")

7.50 ¿Se siente identificado(a) con los contenidos que los museos muestran en sus redes sociales?

Data_Estudiantes %>%
  select(q0051) %>%
  mutate(q0051 = factor(q0051),
         q0051 = recode_factor(q0051, "1" = "5", "2" = "4", "4" = "2", "5" = "1"),
         q0051 = factor(q0051, levels = c(1, 2, 3, 4, 5), labels = c("Nada identificado", 2, 3, 4, "Muy identificado"))) %>%
  filter(!is.na(q0051)) %>%
  rename(contenidos = q0051) %>%
  grafico_likert(titulo = "¿Se siente identificado(a) con los contenidos \n que los museos muestran en \n sus redes sociales?")

7.51 ¿Te gustaría visitar el MUNA con tu familia de manera presencial?

Data_Estudiantes %>%
  select(q0052) %>%
  mutate(q0052 = as.character(q0052),
         q0052 = case_when(q0052 == "1" ~ "Si",
                           q0052 == "2" ~ "No",
                           TRUE ~ q0052),
         q0052 = factor(q0052)) %>%
  filter(!is.na(q0052)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Te gustaría visitar el MUNA \n con tu familia de manera presencial?")

7.52 ¿Cuáles son las 3 razones principales por las que Sí visitaría el MUNA?

Data_Estudiantes %>%
  select(q0053_0001:q0053_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0053_0001:q0053_other) %>%
  filter(!is.na(value), value != "", key != "q0053_0013") %>%
  mutate(key = case_when(key == "q0053_0001" ~ "Enriquece mi conocimiento cultural",
                         key == "q0053_0002" ~ "Buscar una nueva experiencia",
                         key == "q0053_0003" ~ "Para investigación académica",
                         key == "q0053_0004" ~ "Por curiosidad",
                         key == "q0053_0005" ~ "Pasar un día con amigos/pareja",
                         key == "q0053_0006" ~ "Visitar las exposiciones temporales",
                         key == "q0053_0007" ~ "Para ver algo en específico que he oído hablar",
                         key == "q0053_0008" ~ "Para pasar un día en familia",
                         key == "q0053_0009" ~ "Enseñar el museo a amigos, \n conocidos o familiares",
                         key == "q0053_0010" ~ "Conocer las colecciones",
                         key == "q0053_0011" ~ "Por una actividad organizada por el museo/centro \n expositivo (servicio complementario)",
                         key == "q0053_0012" ~ "Estar incluido en una visita turística",
                         key == "q0045_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Cuáles son las 3 razones \n principales por las que \n Sí visitaría el MUNA?")

7.53 Considerando el tiempo de traslado hacia el MUNA (distrito de Lurín en Lima) ¿Cuánto tiempo aproximadamente destinaria para visitar el MUNA ?

Data_Estudiantes %>%
  select(q0054) %>%
  mutate(q0054 = as.character(q0054),
         q0054 = case_when(q0054 == "1" ~ "1 hora",
                           q0054 == "2" ~ "De 1 a 3 horas",
                           q0054 == "3" ~ "De 3 a 4 horas",
                           q0054 == "4" ~ "De 5 a 6 horas",
                           q0054 == "5" ~ "Más de 6 horas",
                           TRUE ~ q0054),
         q0054 = factor(q0054, levels = c("1 hora", "De 1 a 3 horas", "De 3 a 4 horas", "De 5 a 6 horas", "Más de 6 horas"))) %>%
  filter(!is.na(q0054)) %>%
  grafico(tipo = "ordinal", xlab = "", ylab = "Encuestas recopiladas", title = "Considerando el tiempo de traslado hacia el MUNA \n (distrito de Lurín en Lima) ¿Cuánto tiempo \n aproximadamente destinaria para visitar el MUNA ?")

7.54 ¿Cuánto estaría dispuesto a pagar por el ticket de entrada al MUNA ?

Data_Estudiantes %>%
  select(q0055) %>%
  mutate(q0055 = as.character(q0055),
         q0055 = case_when(q0055 == "1" ~ "Entre 0 y 5 Soles",
                           q0055 == "2" ~ "Entre 6 y 10 Soles",
                           q0055 == "3" ~ "Entre 11 y 20 Soles",
                           q0055 == "4" ~ "Entre 21 y 50 Soles",
                           q0055 == "5" ~ "Más de 50 Soles",
                           TRUE ~ q0055),
         q0055 = factor(q0055, levels = c("Entre 0 y 5 Soles", "Entre 6 y 10 Soles", "Entre 11 y 20 Soles", "Entre 21 y 50 Soles", "Más de 50 Soles"))) %>%
  filter(!is.na(q0055)) %>%
  grafico(tipo = "ordinal", xlab = "", ylab = "Encuestas recopiladas", title = "¿Cuánto estaría dispuesto a pagar por el ticket \n de entrada al MUNA ?")

7.55 ¿Cuáles son las 3 razones principales por las que NO visitaría el MUNA?

Data_Estudiantes %>%
  select(q0056_0001:q0056_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0056_0001:q0056_other) %>%
  filter(!is.na(value), value != "", key != "q0056_0007") %>%
  mutate(key = case_when(key == "q0056_0001" ~ "Falta de tiempo",
                         key == "q0056_0002" ~ "Desinterés",
                         key == "q0056_0003" ~ "El costo asociado a la visita \n (movilidad, alimentación, entre otros)",
                         key == "q0056_0004" ~ "El costo del ticket de entrada al MUNA",
                         key == "q0056_0005" ~ "Falta de información",
                         key == "q0056_0006" ~ "Por lejanía y poca accesibilidad",
                         key == "q0056_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Cuáles son las 3 razones principales \n por las que NO visitaría el MUNA?")

7.56 ¿Te gustaría realizar visitas virtuales al MUNA?

Data_Estudiantes %>%
  select(q0057) %>%
  mutate(q0057 = as.character(q0057),
         q0057 = case_when(q0057 == "1" ~ "Si",
                           q0057 == "2" ~ "No",
                           TRUE ~ q0057),
         q0057 = factor(q0057)) %>%
  filter(!is.na(q0057)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Te gustaría realizar visitas virtuales al MUNA?")

7.57 ¿Por qué no lo haria?

Data_Estudiantes %>%
  select(q0058) %>%
  mutate(q0058 = as.character(q0058)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

7.58 ¿Cuáles son los 3 servicios más importantes que esperaría encontrar en su visita a un museo?

Data_Estudiantes %>%
  select(q0059_0001:q0059_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0059_0001:q0059_other) %>%
  filter(!is.na(value), value != "") %>%
  mutate(key = case_when(key == "q0059_0001" ~ "Información en boletería o en sala",
                         key == "q0059_0002" ~ "Folletos de información entregados",
                         key == "q0059_0003" ~ "Espacios de encuentro, \n lugares sin carga expositiva, \n espacios no intervenidos",
                         key == "q0059_0004" ~ "Actividades guiadas por el museo",
                         key == "q0059_0005" ~ "Cafetería/restaurantes",
                         key == "q0059_0006" ~ "Tienda de souvenir",
                         key == "q0059_0007" ~ "Estacionamiento",
                         key == "q0059_0008" ~ "Traducciones",
                         key == "q0059_0009" ~ "Otro",
                         key == "q0059_other" ~ "",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  filter(!is.na(key), key != "") %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Cuáles son los 3 servicios más importantes \n que esperaría encontrar en su \n visita a un museo?")

7.58.1 otros

Data_Estudiantes %>%
  select(q0059_other) %>%
  mutate(q0059_other = as.character(q0059_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

7.59 ¿Qué tipo de actividades culturales le gustaría encontrar al llegar al MUNA?

Data_Estudiantes %>%
  select(q0060_0001:q0060_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0060_0001:q0060_other) %>%
  filter(!is.na(value), value != "", key != "q0060_0006") %>%
  mutate(key = case_when(key == "q0060_0001" ~ "Exposiciones",
                         key == "q0060_0002" ~ "Conciertos",
                         key == "q0060_0003" ~ "Obras de teatro",
                         key == "q0060_0004" ~ "Danzas",
                         key == "q0060_0005" ~ "Ferias (de artesanía, \n de comida, musicales, etc.)",
                         key == "q0060_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Qué tipo de actividades culturales \n le gustaría encontrar al llegar al MUNA?")

7.59.1 otros

Data_Estudiantes %>%
  select(q0060_other) %>%
  mutate(q0060_other = as.character(q0060_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents
## Warning in wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words
## = 500, : pequeña could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words
## = 500, : persona could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words
## = 500, : histórica could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words
## = 500, : karaok could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words
## = 500, : musica could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words
## = 500, : nacional could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words
## = 500, : pelicula could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words
## = 500, : transcendencia could not be fit on page. It will not be plotted.

7.60 En base a lo que conoces de los museos ¿Estás de acuerdo con tener un museo nacional?

Data_Estudiantes %>%
  select(q0061) %>%
  mutate(q0061 = factor(q0061),
         q0061 = recode_factor(q0061, "1" = "5", "2" = "4", "4" = "2", "5" = "1"),
         q0061 = factor(q0061, levels = c(1, 2, 3, 4, 5), labels = c("Muy desacuerdo", 2, 3, 4, "Muy de acuerdo"))) %>%
  filter(!is.na(q0061)) %>%
  rename(estas_de_acuerdo = q0061) %>%
  grafico_likert(titulo = "En base a lo que conoces de los museos ¿Estás de acuerdo \n con tener un museo nacional?")

7.61 ¿Qué tipo de contenidos debe mostrar el museo en sus exposiciones?

Data_Estudiantes %>%
  select(q0062_0001:q0062_0009) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0062_0001:q0062_0009) %>%
  filter(!is.na(value), value != "") %>%
  mutate(key = case_when(key == "q0062_0001" ~ "Temas históricos",
                         key == "q0062_0002" ~ "Identidad Cultural",
                         key == "q0062_0003" ~ "Diversidades",
                         key == "q0062_0004" ~ "Temas Coyunturales",
                         key == "q0062_0005" ~ "Realidades Regionales",
                         key == "q0062_0006" ~ "Temas educativos",
                         key == "q0062_0007" ~ "Temas innovadores",
                         key == "q0062_0008" ~ "Temas científicos tecnológicos",
                         key == "q0062_0009" ~ "No sabe, no opina",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Qué tipo de contenidos debe mostrar el museo \n en sus exposiciones?")

7.62 Según toda la información que hayas podido percibir sobre los museos ¿Me siento representado por ellos?

Data_Estudiantes %>%
  select(q0063) %>%
  mutate(q0063 = factor(q0063),
         q0063 = recode_factor(q0063, "1" = "5", "2" = "4", "4" = "2", "5" = "1"),
         q0063 = factor(q0063, levels = c(1, 2, 3, 4, 5), labels = c("Nada representado", 2, 3, 4, "Muy representado"))) %>%
  filter(!is.na(q0063)) %>%
  rename(representado = q0063) %>%
  grafico_likert(titulo = "Según toda la información que \n hayas podido percibir sobre los museos \n ¿Me siento representado por ellos?")

7.63 Según lo que los museos pueda aportar en experiencia e información. ¿Qué tan importante consideras a los museos para tu familia?

Data_Estudiantes %>%
  select(q0064) %>%
  mutate(q0064 = factor(q0064),
         q0064 = recode_factor(q0064, "1" = "5", "2" = "4", "4" = "2", "5" = "1"),
         q0064 = factor(q0064, levels = c(1, 2, 3, 4, 5), labels = c("Nada importante", 2, 3, 4, "Muy importante"))) %>%
  filter(!is.na(q0064)) %>%
  rename(importancia = q0064) %>%
  grafico_likert(titulo = "Según lo que los museos pueda \n aportar en experiencia e información. \n ¿Qué tan importante consideras \n a los museos para tu familia?")

7.64 LIKERT

Data_Estudiantes %>%
  select(q0065_0001:q0065_0005) %>%
  mutate(q0065_0001 = factor(q0065_0001, levels = c(1, 2, 3, 4, 5), labels = c("Muy en desacuerdo", 2, 3, 4, "Muy de acuerdo")),
         q0065_0002 = factor(q0065_0002, levels = c(1, 2, 3, 4, 5), labels = c("Muy en desacuerdo", 2, 3, 4, "Muy de acuerdo")),
         q0065_0003 = factor(q0065_0003, levels = c(1, 2, 3, 4, 5), labels = c("Muy en desacuerdo", 2, 3, 4, "Muy de acuerdo")),
         q0065_0004 = factor(q0065_0004, levels = c(1, 2, 3, 4, 5), labels = c("Muy en desacuerdo", 2, 3, 4, "Muy de acuerdo")),
         q0065_0005 = factor(q0065_0005, levels = c(1, 2, 3, 4, 5), labels = c("Muy en desacuerdo", 2, 3, 4, "Muy de acuerdo"))) %>%
  filter(!is.na(q0065_0001)) %>%
  rename(educacion = q0065_0001,
         turismo = q0065_0002,
         recreacion = q0065_0003,
         aprendizaje = q0065_0004,
         diversidad = q0065_0005) %>%
  grafico_likert(titulo = "Los museos contribuyen a la 'educación' de todas las personas. \n El museo es un lugar para hacer 'turismo'. \n El museo es un lugar de 'recreación'. \n El museo es un lugar de 'aprendizaje'. \n Los museos contribuyen a valorar la 'diversidad' cultural")

7.65 Para usted, el museo significa:

Data_Estudiantes %>%
  select(q0066_0001:q0066_0003) %>%
  gather(key = "key", value = "value", q0066_0001:q0066_0003) %>%
  select(value) %>%
  filter(!is.na(value), value != "") %>%
  mutate(value = as.character(value)) %>%
  cloud()
## Warning: attributes are not identical across measure variables;
## they will be dropped
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

8 Data Operadores

8.1 ¿Qué tipo de especialista de turismo es usted?

Data_Operadores %>%
  select(q0002) %>%
  mutate(q0002 = as.character(q0002),
         q0002 = case_when(q0002 == "1" ~ "Mayorista",
                           q0002 == "2" ~ "Minorista",
                           q0002 == "3" ~ "Lujo",
                           TRUE ~ q0002),
         q0002 = factor(q0002)) %>%
  filter(!is.na(q0002)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Qué tipo de especialista \n de turismo es usted?")

8.2 ¿Trabaja con una empresa o de manera independiente?

Data_Operadores %>%
  select(q0003) %>%
  mutate(q0003 = as.character(q0003),
         q0003 = case_when(q0003 == "1" ~ "Independiente",
                           q0003 == "2" ~ "Empresa",
                           q0003 == "3" ~ "Ambas",
                           TRUE ~ q0003),
         q0003 = factor(q0003)) %>%
  filter(!is.na(q0003)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Trabaja con una empresa \n o de manera independiente?")

8.3 Porcentaje de paquetes/recorridos/ventas que involucra la visita a algún museo al año (No considerar Iglesias, casonas, monumentos, colecciones privadas, etc.)

Data_Operadores %>%
  select(q0004) %>%
  mutate(q0004 = as.character(q0004),
         q0004 = case_when(q0004 == "1" ~ "0% - 10%",
                           q0004 == "2" ~ "11% - 30%",
                           q0004 == "3" ~ "31% - 50%",
                           q0004 == "4" ~ "51% - 70%",
                           q0004 == "5" ~ "71% - 90%",
                           q0004 == "6" ~ "91% - 100%",
                           TRUE ~ q0004),
         q0004 = factor(q0004, levels = c("0% - 10%", "11% - 30%", "31% - 50%", "51% - 70%", "71% - 90%", "91% - 100%"))) %>%
  filter(!is.na(q0004)) %>%
  grafico(tipo = "ordinal", xlab = "", ylab = "Encuestas recopiladas", title = "Porcentaje de paquetes/recorridos/ventas \n que involucra la visita a algún museo \n al año (No considerar Iglesias, casonas, \n monumentos, colecciones privadas, etc.)")

8.4 Al momento de incluir un museo a su catálogo de destinos turísticos ¿Cuáles son los tres (03) principales servicios que considera para la toma de esta decisión?

Data_Operadores %>%
  select(q0005_0001:q0005_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0005_0001:q0005_other) %>%
  filter(!is.na(value), value != "", key != "q0005_0011") %>%
  mutate(key = case_when(key == "q0005_0001" ~ "Precios accesibles o gratuidad",
                         key == "q0005_0002" ~ "Infraestructura",
                         key == "q0005_0003" ~ "Zonas sociales para eventos",
                         key == "q0005_0004" ~ "Visitas guiadas en \n distintos idiomas / lenguas",
                         key == "q0005_0005" ~ "Recorridos exclusivos",
                         key == "q0005_0006" ~ "Cafetería / restaurante",
                         key == "q0005_0007" ~ "Tienda de Souvenir",
                         key == "q0005_0008" ~ "Estacionamiento",
                         key == "q0005_0009" ~ "Ubicación / acceso",
                         key == "q0005_0010" ~ "Colecciones / exhibiciones",
                         key == "q0005_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "Al momento de incluir un museo \n a su catálogo de destinos turísticos \n ¿Cuáles son los tres (03) principales \n servicios que considera para la \n toma de esta decisión?")

8.4.1 otros

Data_Operadores %>%
  select(q0005_other) %>%
  mutate(q0005_other = as.character(q0005_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

8.5 En general ¿Cuáles son los tres (03) principales problemas que ha experimentado o que encuentra en la actualidad durante su visita a un museo?

Data_Operadores %>%
  select(q0006_0001:q0006_0010) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0006_0001:q0006_0010) %>%
  filter(!is.na(value), value != "") %>%
  mutate(key = case_when(key == "q0006_0001" ~ "Costo de los tickets",
                         key == "q0006_0002" ~ "Mala infraestructura",
                         key == "q0006_0003" ~ "No ofrece guía en distintos \n idiomas / lenguas",
                         key == "q0006_0004" ~ "No ofrece recorridos exclusivos",
                         key == "q0006_0005" ~ "No tiene cafetería / restaurante",
                         key == "q0006_0006" ~ "No tiene tienda de souvenir",
                         key == "q0006_0007" ~ "Poca o no disponibilidad \n de estacionamientos",
                         key == "q0006_0008" ~ "Ubicación y acceso restringido \n o poco eficiente del museo",
                         key == "q0006_0009" ~ "Poca cantidad / baja calidad \n de exhibiciones y colecciones",
                         key == "q0006_0010" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "En general ¿Cuáles son los tres (03) \n principales problemas que ha experimentado \n o que encuentra en la actualidad \n durante su visita a un museo?")

8.6 Museos q0007

Data_Operadores %>%
  select(q0007_0001:q0007_0003) %>%
  gather(key = "key", value = "value", q0007_0001:q0007_0003) %>%
  select(value) %>%
  filter(!is.na(value), value != "") %>%
  mutate(value = as.character(value),
         value = str_remove_all(value, "MUSEO"),
         value = str_remove_all(value, "Museo"),
         value = str_remove_all(value, "museo")) %>%
  cloud()
## Warning: attributes are not identical across measure variables;
## they will be dropped
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

8.7 Tomando en consideración los servicios antes mencionados, señale el servicio que destaca positivamente en el Museo.

Data_Operadores %>%
  select(q0008) %>%
  mutate(q0008 = as.character(q0008),
         q0008 = case_when(q0008 == "0" ~ "Otro (especifique)",
                           q0008 == "1" ~ "Precios accesibles o gratuidad",
                           q0008 == "2" ~ "Infraestructura",
                           q0008 == "3" ~ "Zonas sociales para eventos",
                           q0008 == "4" ~ "Visitas guiadas en distintos \n idiomas / lenguas",
                           q0008 == "5" ~ "Recorridos exclusivos",
                           q0008 == "6" ~ "Cafetería / restaurante",
                           q0008 == "7" ~ "Tienda de Souvenir",
                           q0008 == "8" ~ "Estacionamiento",
                           q0008 == "9" ~ "Ubicación / acceso",
                           q0008 == "10" ~ "Colecciones / exhibiciones",
                           q0008 == "11" ~ "Ninguno",
                           TRUE ~ q0008),
         q0008 = factor(q0008)) %>%
  filter(!is.na(q0008)) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "Encuestas recopiladas", title = "Tomando en consideración los servicios \n antes mencionados, señale el servicio \n que destaca positivamente en el Museo")

8.7.1 otros

Data_Operadores %>%
  select(q0008_other) %>%
  mutate(q0008_other = as.character(q0008_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

8.8 Tomando en consideración los servicios antes mencionados, señale el servicio que destaca negativamente en el Museo.

Data_Operadores %>%
  select(q0009) %>%
  mutate(q0009 = as.character(q0009),
         q0009 = case_when(q0009 == "0" ~ "Otro (especifique)",
                           q0009 == "1" ~ "Costo de los tickets",
                           q0009 == "2" ~ "Mala infraestructura",
                           q0009 == "3" ~ "No ofrece guía en distintos \n idiomas / lenguas",
                           q0009 == "4" ~ "No ofrece recorridos exclusivos",
                           q0009 == "5" ~ "No tiene cafetería / restaurante",
                           q0009 == "6" ~ "No tiene tienda de souvenir",
                           q0009 == "7" ~ "Poca o no disponibilidad \n de estacionamientos",
                           q0009 == "8" ~ "Ubicación y acceso restringido \n o poco eficiente del museo",
                           q0009 == "9" ~ "Poca cantidad / baja calidad \n de exhibiciones y colecciones",
                           q0009 == "10" ~ "Ninguno",
                           TRUE ~ q0009),
         q0009 = factor(q0009)) %>%
  filter(!is.na(q0009)) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "Encuestas recopiladas", title = "Tomando en consideración los servicios \n antes mencionados, señale el servicio \n que destaca negativamente en el Museo")

8.8.1 otros

Data_Operadores %>%
  select(q0009_other) %>%
  mutate(q0009_other = as.character(q0009_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

8.9 Tomando en consideración los servicios antes mencionados, señale el servicio que destaca positivamente en el Museo.

Data_Operadores %>%
  select(q0010) %>%
  mutate(q0010 = as.character(q0010),
         q0010 = case_when(q0010 == "0" ~ "Otro (especifique)",
                           q0010 == "1" ~ "Precios accesibles o gratuidad",
                           q0010 == "2" ~ "Infraestructura",
                           q0010 == "3" ~ "Zonas sociales para eventos",
                           q0010 == "4" ~ "Visitas guiadas en distintos \n idiomas / lenguas",
                           q0010 == "5" ~ "Recorridos exclusivos",
                           q0010 == "6" ~ "Cafetería / restaurante",
                           q0010 == "7" ~ "Tienda de Souvenir",
                           q0010 == "8" ~ "Estacionamiento",
                           q0010 == "9" ~ "Ubicación / acceso",
                           q0010 == "10" ~ "Colecciones / exhibiciones",
                           q0010 == "11" ~ "Ninguno",
                           TRUE ~ q0010),
         q0010 = factor(q0010)) %>%
  filter(!is.na(q0010)) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "Encuestas recopiladas", title = "Tomando en consideración los servicios \n antes mencionados, señale el servicio \n que destaca positivamente en el Museo")

8.9.1 otros

Data_Operadores %>%
  select(q0010_other) %>%
  mutate(q0010_other = as.character(q0010_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents
## Warning in wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words
## = 500, : dan could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words
## = 500, : folleto could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words
## = 500, : mostrar could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words
## = 500, : museo could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words
## = 500, : museografía could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words
## = 500, : buen could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words
## = 500, : trato could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words
## = 500, : bueno could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words
## = 500, : guia could not be fit on page. It will not be plotted.

8.10 Tomando en consideración los servicios antes mencionados, señale el servicio que destaca negativamente en el Museo.

Data_Operadores %>%
  select(q0011) %>%
  mutate(q0011 = as.character(q0011),
         q0011 = case_when(q0011 == "0" ~ "Otro (especifique)",
                           q0011 == "1" ~ "Costo de los tickets",
                           q0011 == "2" ~ "Mala infraestructura",
                           q0011 == "3" ~ "No ofrece guía en distintos \n idiomas / lenguas",
                           q0011 == "4" ~ "No ofrece recorridos exclusivos",
                           q0011 == "5" ~ "No tiene cafetería / restaurante",
                           q0011 == "6" ~ "No tiene tienda de souvenir",
                           q0011 == "7" ~ "Poca o no disponibilidad \n de estacionamientos",
                           q0011 == "8" ~ "Ubicación y acceso restringido \n o poco eficiente del museo",
                           q0011 == "9" ~ "Poca cantidad / baja calidad \n de exhibiciones y colecciones",
                           q0011 == "10" ~ "Ninguno",
                           TRUE ~ q0011),
         q0011 = factor(q0011)) %>%
  filter(!is.na(q0011)) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "Encuestas recopiladas", title = "Tomando en consideración los servicios \n antes mencionados, señale el servicio \n que destaca negativamente en el Museo")

8.10.1 otros

Data_Operadores %>%
  select(q0011_other) %>%
  mutate(q0011_other = as.character(q0011_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

8.11 Tomando en consideración los servicios antes mencionados, señale el servicio que destaca positivamente en el Museo.

Data_Operadores %>%
  select(q0012) %>%
  mutate(q0012 = as.character(q0012),
         q0012 = case_when(q0012 == "0" ~ "Otro (especifique)",
                           q0012 == "1" ~ "Precios accesibles o gratuidad",
                           q0012 == "2" ~ "Infraestructura",
                           q0012 == "3" ~ "Zonas sociales para eventos",
                           q0012 == "4" ~ "Visitas guiadas en distintos \n idiomas / lenguas",
                           q0012 == "5" ~ "Recorridos exclusivos",
                           q0012 == "6" ~ "Cafetería / restaurante",
                           q0012 == "7" ~ "Tienda de Souvenir",
                           q0012 == "8" ~ "Estacionamiento",
                           q0012 == "9" ~ "Ubicación / acceso",
                           q0012 == "10" ~ "Colecciones / exhibiciones",
                           q0012 == "11" ~ "Ninguno",
                           TRUE ~ q0012),
         q0012 = factor(q0012)) %>%
  filter(!is.na(q0012)) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "Encuestas recopiladas", title = "Tomando en consideración los servicios \n antes mencionados, señale el servicio \n que destaca positivamente en el Museo")

8.11.1 otros

Data_Operadores %>%
  select(q0012_other) %>%
  mutate(q0012_other = as.character(q0012_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents
## Warning in wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words
## = 500, : didactico could not be fit on page. It will not be plotted.

8.12 Tomando en consideración los servicios antes mencionados, señale el servicio que destaca negativamente en el Museo.

Data_Operadores %>%
  select(q0013) %>%
  mutate(q0013 = as.character(q0013),
         q0013 = case_when(q0013 == "0" ~ "Otro (especifique)",
                           q0013 == "1" ~ "Costo de los tickets",
                           q0013 == "2" ~ "Mala infraestructura",
                           q0013 == "3" ~ "No ofrece guía en distintos \n idiomas / lenguas",
                           q0013 == "4" ~ "No ofrece recorridos exclusivos",
                           q0013 == "5" ~ "No tiene cafetería / restaurante",
                           q0013 == "6" ~ "No tiene tienda de souvenir",
                           q0013 == "7" ~ "Poca o no disponibilidad \n de estacionamientos",
                           q0013 == "8" ~ "Ubicación y acceso restringido \n o poco eficiente del museo",
                           q0013 == "9" ~ "Poca cantidad / baja calidad \n de exhibiciones y colecciones",
                           q0013 == "10" ~ "Ninguno",
                           TRUE ~ q0013),
         q0013 = factor(q0013)) %>%
  filter(!is.na(q0013)) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "Encuestas recopiladas", title = "Tomando en consideración los servicios \n antes mencionados, señale el servicio \n que destaca negativamente en el Museo")

8.12.1 otros

Data_Operadores %>%
  select(q0013_other) %>%
  mutate(q0013_other = as.character(q0013_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

8.13 LIKERT

Data_Operadores %>%
  select(q0014_0001:q0014_0008) %>%
  mutate(q0014_0001 = factor(q0014_0001, levels = c(1, 2, 3, 4, 5), labels = c("Nada importante", 2, 3, 4, "Muy Importante")),
         q0014_0002 = factor(q0014_0002, levels = c(1, 2, 3, 4, 5), labels = c("Nada importante", 2, 3, 4, "Muy Importante")),
         q0014_0003 = factor(q0014_0003, levels = c(1, 2, 3, 4, 5), labels = c("Nada importante", 2, 3, 4, "Muy Importante")),
         q0014_0004 = factor(q0014_0004, levels = c(1, 2, 3, 4, 5), labels = c("Nada importante", 2, 3, 4, "Muy Importante")),
         q0014_0005 = factor(q0014_0005, levels = c(1, 2, 3, 4, 5), labels = c("Nada importante", 2, 3, 4, "Muy Importante")),
         q0014_0006 = factor(q0014_0006, levels = c(1, 2, 3, 4, 5), labels = c("Nada importante", 2, 3, 4, "Muy Importante")),
         q0014_0007 = factor(q0014_0007, levels = c(1, 2, 3, 4, 5), labels = c("Nada importante", 2, 3, 4, "Muy Importante")),
         q0014_0008 = factor(q0014_0008, levels = c(1, 2, 3, 4, 5), labels = c("Nada importante", 2, 3, 4, "Muy Importante"))) %>%
  filter(!is.na(q0014_0001)) %>%
  rename(economico = q0014_0001,
         estacionamiento = q0014_0002,
         exclusivo = q0014_0003,
         accesibilidad = q0014_0004,
         idiomas = q0014_0005,
         restaurantes = q0014_0006,
         souvenir = q0014_0007,
         turistico = q0014_0008) %>%
  grafico_likert(titulo = "- Precios 'económicos' o gratuidad. \n - Playas de 'estacionamiento'. \n - Recorrido 'exclusivo'. \n - Ubicación y 'accesibilidad'. \n - Mediación en otros 'idiomas': Guías Bilingües \n (Ingles, Frances, Chino, Italiano, Otros). \n - Servicios de 'restaurantes'. \n - Servicio de 'Souvenir'. \n - Que el MUNA sea parte \n de una ruta 'turistica'.")

8.14 En su opinión, señale el servicio que considera destacaría positivamente en el MUNA.

Data_Operadores %>%
  select(q0015) %>%
  mutate(q0015 = as.character(q0015),
         q0015 = case_when(q0015 == "0" ~ "Otro (especifique)",
                           q0015 == "1" ~ "Precios accesibles o gratuidad",
                           q0015 == "2" ~ "Infraestructura",
                           q0015 == "3" ~ "Zonas sociales para eventos",
                           q0015 == "4" ~ "Visitas guiadas en distintos \n idiomas / lenguas",
                           q0015 == "5" ~ "Recorridos exclusivos",
                           q0015 == "6" ~ "Cafetería / restaurante",
                           q0015 == "7" ~ "Tienda de Souvenir",
                           q0015 == "8" ~ "Estacionamiento",
                           q0015 == "9" ~ "Ubicación / acceso",
                           q0015 == "10" ~ "Colecciones / exhibiciones",
                           q0015 == "11" ~ "Ninguno",
                           TRUE ~ q0015),
         q0015 = factor(q0015)) %>%
  filter(!is.na(q0015)) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "Encuestas recopiladas", title = "En su opinión, señale el servicio \n que considera destacaría positivamente \n en el MUNA")

8.14.1 otros

Data_Operadores %>%
  select(q0015_other) %>%
  mutate(q0015_other = as.character(q0015_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

8.15 En su opinión, señale el servicio que considera destacaría negativamente en el MUNA.

Data_Operadores %>%
  select(q0016) %>%
  mutate(q0016 = as.character(q0016),
         q0016 = case_when(q0016 == "0" ~ "Otro (especifique)",
                           q0016 == "1" ~ "Costo de los tickets",
                           q0016 == "2" ~ "Mala infraestructura",
                           q0016 == "3" ~ "No ofrece guía en distintos \n idiomas / lenguas",
                           q0016 == "4" ~ "No ofrece recorridos exclusivos",
                           q0016 == "5" ~ "No tiene cafetería / restaurante",
                           q0016 == "6" ~ "No tiene tienda de souvenir",
                           q0016 == "7" ~ "Poca o no disponibilidad \n de estacionamientos",
                           q0016 == "8" ~ "Ubicación y acceso restringido \n o poco eficiente del museo",
                           q0016 == "9" ~ "Poca cantidad / baja calidad \n de exhibiciones y colecciones",
                           q0016 == "10" ~ "Ninguno",
                           TRUE ~ q0016),
         q0016 = factor(q0016)) %>%
  filter(!is.na(q0016)) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "Encuestas recopiladas", title = "En su opinión, señale el \n servicio que considera destacaría \n negativamente en el MUNA.")

8.15.1 otros

Data_Operadores %>%
  select(q0016_other) %>%
  mutate(q0016_other = as.character(q0016_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents
## Warning in wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words
## = 500, : recibimiento could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words
## = 500, : exposicion could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = dat$word, freq = dat$freq, min.freq = 3, max.words
## = 500, : momento could not be fit on page. It will not be plotted.

8.16 Considerando el tiempo de traslado hacia el MUNA (distrito de Lurín en Lima)¿Cuánto tiempo que destinaria para que sus clientes visiten al MUNA?

Data_Operadores %>%
  select(q0017) %>%
  mutate(q0017 = as.character(q0017),
         q0017 = case_when(q0017 == "1" ~ "1 hora",
                           q0017 == "2" ~ "De 1 a 3 horas",
                           q0017 == "3" ~ "De 3 a 4 horas",
                           q0017 == "4" ~ "De 5 a 6 horas",
                           q0017 == "5" ~ "Más de 6 horas",
                           TRUE ~ q0017),
         q0017 = factor(q0017, levels = c("1 hora", "De 1 a 3 horas", "De 3 a 4 horas", "De 5 a 6 horas", "Más de 6 horas"))) %>%
  filter(!is.na(q0017)) %>%
  grafico(tipo = "ordinal", xlab = "", ylab = "Encuestas recopiladas", title = "Considerando el tiempo de traslado hacia el MUNA \n (distrito de Lurín en Lima) ¿Cuánto tiempo \n aproximadamente destinaria para visitar el MUNA ?")

8.17 ¿Cuánto estima que debería pagar en promedio por persona la visita al MUNA?

Data_Operadores %>%
  select(q0018) %>%
  mutate(q0018 = as.character(q0018),
         q0018 = case_when(q0018 == "1" ~ "Gratis",
                           q0018 == "2" ~ "Hasta 5 soles",
                           q0018 == "3" ~ "De 6 a 10 soles",
                           q0018 == "4" ~ "De 11 a 25 soles",
                           q0018 == "5" ~ "De 26 a 50 soles",
                           q0018 == "6" ~ "Más de 50 soles",
                           TRUE ~ q0018),
         q0018 = factor(q0018, levels = c("Gratis", "Hasta 5 soles", "De 6 a 10 soles", "De 11 a 25 soles", "De 26 a 50 soles", "Más de 50 soles"))) %>%
  filter(!is.na(q0018)) %>%
  grafico(tipo = "ordinal", xlab = "", ylab = "Encuestas recopiladas", title = "¿Cuánto estaría dispuesto a pagar por el ticket \n de entrada al MUNA ?")

8.18 Señale los 3 Servicios/recursos más importantes que debería tener una plataforma digital que sea útil a la oferta turística y/o servicios que brinda su empresa.

Data_Operadores %>%
  select(q0019_0001:q0019_0008) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0019_0001:q0019_0008) %>%
  filter(!is.na(value), value != "") %>%
  mutate(key = case_when(key == "q0019_0001" ~ "Videos didácticos para utilizar \n en presentaciones",
                         key == "q0019_0002" ~ "Recorridos virtuales de exhibiciones \n y colecciones",
                         key == "q0019_0003" ~ "Guía para turistas para \n planificar sus visitas",
                         key == "q0019_0004" ~ "Programas de membresía",
                         key == "q0019_0005" ~ "Tarifas especiales",
                         key == "q0019_0006" ~ "Talleres virtuales y/o \n capacitaciones para guías",
                         key == "q0019_0007" ~ "Material bibliográfico para \n turistas y visitantes",
                         key == "q0019_0008" ~ "Imágenes en alta definición \n de las colecciones",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "Señale los 3 Servicios/recursos \n más importantes que debería tener \n una plataforma digital que sea útil \n a la oferta turística y/o servicios \n que brinda su empresa")

8.19 ¿Ha escuchado o se encuentra informado sobre el MUNA y sus servicios?

Data_Operadores %>%
  select(q0020) %>%
  mutate(q0020 = as.character(q0020),
         q0020 = case_when(q0020 == "0" ~ "Otro (especifique)",
                           q0020 == "1" ~ "No estoy informado",
                           q0020 == "2" ~ "No he necesitado informarme \n porque ya tenía conocimiento",
                           q0020 == "3" ~ "Lo he escuchado por \n información de otras personas",
                           q0020 == "4" ~ "Lo he visto en una \n guía o capacitación turística",
                           q0020 == "5" ~ "He buscado información en la pagina web \n del museo y/o en otras páginas de internet",
                           q0020 == "6" ~ "Me he informado a través de redes sociales",
                           q0020 == "7" ~ "He visto publicidad del MUNA \n y sus exposiciones",
                           TRUE ~ q0020),
         q0020 = factor(q0020)) %>%
  filter(!is.na(q0020)) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "Encuestas recopiladas", title = "¿Ha escuchado o se encuentra informado \n sobre el MUNA y sus servicios?")

8.20 ¿Le parece relevante que un museo cuente con un recorrido virtual como parte de sus servicios?

Data_Operadores %>%
  select(q0021) %>%
  mutate(q0021 = as.character(q0021),
         q0021 = case_when(q0021 == "1" ~ "Si",
                           q0021 == "2" ~ "No",
                           TRUE ~ q0021),
         q0021 = factor(q0021)) %>%
  filter(!is.na(q0021)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Le parece relevante que un museo \n cuente con un recorrido virtual \n como parte de sus servicios?")

8.21 ¿Por cuál de los siguientes medios consume contenidos culturales o se mantiene informado de las actividades culturales?

Data_Operadores %>%
  select(q0022_0001:q0022_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0022_0001:q0022_other) %>%
  filter(!is.na(value), value != "", key != "q0022_0009") %>%
  mutate(key = case_when(key == "q0022_0001" ~ "Televisión",
                         key == "q0022_0002" ~ "Radio",
                         key == "q0022_0003" ~ "Redes Sociales",
                         key == "q0022_0004" ~ "Prensa escrita y digital",
                         key == "q0022_0005" ~ "Revistas",
                         key == "q0022_0006" ~ "Blogs",
                         key == "q0022_0007" ~ "Seminarios, capacitaciones, \n webinars, etc.",
                         key == "q0022_0008" ~ "Newsletters",
                         key == "q0022_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo1", xlab = "", ylab = "frecuencia", title = "¿Por cuál de los siguientes \n medios consume contenidos culturales o se \n mantiene informado de las actividades culturales?")

8.21.1 Otros

Data_Operadores %>%
  select(q0022_other) %>%
  mutate(q0022_other = as.character(q0022_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

8.22 ¿Sigue a museos (nacionales y/o extranjeros) en sus redes sociales?

Data_Operadores %>%
  select(q0023) %>%
  mutate(q0023 = as.character(q0023),
         q0023 = case_when(q0023 == "1" ~ "Si",
                           q0023 == "2" ~ "No",
                           TRUE ~ q0023),
         q0023 = factor(q0023)) %>%
  filter(!is.na(q0023)) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "Encuestas recopiladas", title = "¿Sigue a museos (nacionales y/o \n extranjeros) en sus redes sociales?")

8.23 Museos q0024

Data_Operadores %>%
  select(q0024_0001:q0024_0003) %>%
  gather(key = "key", value = "value", q0024_0001:q0024_0003) %>%
  select(value) %>%
  filter(!is.na(value), value != "") %>%
  mutate(value = as.character(value),
         value = str_remove_all(value, "MUSEO"),
         value = str_remove_all(value, "Museo"),
         value = str_remove_all(value, "museo")) %>%
  cloud()
## Warning: attributes are not identical across measure variables;
## they will be dropped
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

8.24 ¿Por cuál(es) de sus redes sociales?

Data_Operadores %>%
  select(q0025_0001:q0025_other) %>%
  mutate_all(as.character) %>%
  gather(key = "key", value = "value", q0025_0001:q0025_other) %>%
  filter(!is.na(value), value != "", key != "q0025_0005") %>%
  mutate(key = case_when(key == "q0025_0001" ~ "Facebook",
                         key == "q0025_0002" ~ "Instagram",
                         key == "q0025_0003" ~ "YouTube",
                         key == "q0025_0004" ~ "Tik Tok",
                         key == "q0025_other" ~ "Otro",
                         TRUE ~ key),
         key = factor(key)) %>%
  select(key) %>%
  grafico(tipo = "cualitativo2", xlab = "", ylab = "frecuencia", title = "¿Por cuál(es) de sus redes sociales?")

8.24.1 Otros

Data_Operadores %>%
  select(q0025_other) %>%
  mutate(q0025_other = as.character(q0025_other)) %>%
  cloud()
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents

8.25 q0026

Data_Operadores %>%
  select(q0026_0001, q0026_0002, q0026_0003) %>%
  gather(key = "key", value = "value", q0026_0001:q0026_0003) %>%
  select(value) %>%
  filter(!is.na(value), value != "") %>%
  mutate(value = as.character(value)) %>%
  cloud()
## Warning: attributes are not identical across measure variables;
## they will be dropped
## Warning in tm_map.SimpleCorpus(corpus, PlainTextDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, tolower): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, removePunctuation): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, removeWords, c("cloth",
## stopwords("spanish"))): transformation drops documents
## Warning in tm_map.SimpleCorpus(corpus, stemDocument): transformation drops
## documents
## Warning in tm_map.SimpleCorpus(corpus, stripWhitespace): transformation drops
## documents