Profesor del programa de Ingeniería Industrial, Universidad Sergio Arboleda. Candidato a doctor en Ingeniería de la Universidad de los Andes.

Minería de textos

En esta clase consideramos el problema de analizar datos de texto. El texto es quizás la forma de datos más ubicua. La cantidad de datos de texto disponibles es asombrosa: desde libros o artículos hasta páginas web y redes sociales. Todos ellos forman una rica fuente de datos que podemos explotar para obtener información valiosa. El análisis de datos de texto tiene muchas aplicaciones prácticas, incluida la recuperación de información, el análisis de redes sociales, el filtrado de correo no deseado y el análisis de sentimientos.

La minería de texto, o análisis de texto como se le conoce alternativamente, es la tarea de extraer información de los datos de texto. En las clases anteriores, analizamos el uso de R para realizar análisis de datos en varios entornos. Había un elemento común en todos los entornos: los datos de entrada que usamos casi siempre estaban estructurados, es decir, consistían en puntos de datos para un conjunto dado de variables, ya fueran numéricas o categóricas. Los datos de texto son desestructurados. Aunque el texto escrito en cualquier lenguaje humano se rige por las reglas de la gramática, carece de las variables claramente definidas que tenemos al analizar datos estructurados. Además de las reglas lingüísticas, el texto contiene información, como describir un objeto o presentar un punto de vista. A su vez, el objetivo de la minería de texto es extraer esta información latente de los datos de texto de la manera más objetiva posible.

La minería de texto es un término general para los diferentes tipos de análisis que realizamos sobre el texto. Las tareas de análisis van desde un simple análisis basado en la frecuencia de palabras hasta tareas más complejas como la clasificación. De hecho, podemos adaptar fácilmente las técnicas clásicas de análisis de datos, como el análisis y la clasificación de datos exploratorios, cuando trabajas con datos de texto. Solo necesitamos usar la representación adecuada del texto para que los datos de texto no estructurados se puedan codificar como datos estructurados o semiestructurados.

El día de hoy vamos a trabajar con datos de twitter. Twitter es actualmente una dinámica e ingente fuente de contenidos que, dada su popularidad e impacto, se ha convertido en la principal fuente de información para estudios de Social Media Analytics. Análisis de reputación de empresas, productos o personalidades, estudios de impacto relacionados con marketing, extracción de opiniones y predicción de tendencias son sólo algunos ejemplos de aplicaciones. Hoy trabajaremos con una muestra de los tweets de tres personalidades: Elon Musk, Bill Gates y el alcalde de San Francisco, Ed Lee.

data <- read.csv("tweets.csv", sep=";")
table(data$screen_name)
## 
##  BillGates   elonmusk mayoredlee 
##         53         48         40
colnames(data)
##  [1] "screen_name"                    "user_id"                       
##  [3] "created_at"                     "status_id"                     
##  [5] "text"                           "retweet_count"                 
##  [7] "favorite_count"                 "is_quote_status"               
##  [9] "quote_status_id"                "is_retweet"                    
## [11] "retweet_status_id"              "in_reply_to_status_status_id"  
## [13] "in_reply_to_status_user_id"     "in_reply_to_status_screen_name"
## [15] "lang"                           "source"                        
## [17] "media_id"                       "media_url"                     
## [19] "media_url_expanded"             "urls"                          
## [21] "urls_display"                   "urls_expanded"                 
## [23] "mentions_screen_name"           "mentions_user_id"              
## [25] "symbols"                        "hashtags"                      
## [27] "coordinates"                    "place_id"                      
## [29] "place_type"                     "place_name"                    
## [31] "place_full_name"                "country_code"                  
## [33] "country"                        "bounding_box_coordinates"      
## [35] "bounding_box_type"

De entre toda la información disponible, en esta clase solamente trabajaremos con: autor del tweet, fecha de publicación, identificador del tweet y contenido. Para realizar este arreglo de datos y la limpieza de los mismos usaremos el siguiente código:

library(tidyverse)
## Warning: package 'tidyverse' was built under R version 3.6.3
## -- 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.2
## v tidyr   1.1.2     v stringr 1.4.0
## v readr   1.3.1     v forcats 0.5.0
## Warning: package 'ggplot2' was built under R version 3.6.3
## Warning: package 'tibble' was built under R version 3.6.3
## Warning: package 'tidyr' was built under R version 3.6.3
## Warning: package 'readr' was built under R version 3.6.3
## Warning: package 'purrr' was built under R version 3.6.3
## Warning: package 'dplyr' was built under R version 3.6.3
## Warning: package 'stringr' was built under R version 3.6.3
## Warning: package 'forcats' was built under R version 3.6.3
## -- Conflicts ------------------------------------------------------------------ tidyverse_conflicts() --
## x dplyr::filter() masks stats::filter()
## x dplyr::lag()    masks stats::lag()
library(knitr)
## Warning: package 'knitr' was built under R version 3.6.3
tweets <- data %>% select(screen_name, created_at, status_id, text)
colnames(tweets) <- c("autor", "fecha", "ID", "texto")
head(tweets)

El proceso de limpieza de texto, dentro del ámbito de text mining, consiste en eliminar del texto todo aquello que no aporte información sobre su temática, estructura o contenido. No existe una única forma de hacerlo, depende en gran medida de la finalidad del análisis y de la fuente de la que proceda el texto. Por ejemplo, en las redes sociales los usuarios pueden escribir de la forma que quieran, lo que suele resultar en un uso elevado de abreviaturas y signos de puntuación.

limpiar_tokenizar <- function(texto){
  # El orden de la limpieza no es arbitrario
    # Se convierte todo el texto a minúsculas
    nuevo_texto <- tolower(texto)
    # Eliminación de páginas web (palabras que empiezan por "http." seguidas 
    # de cualquier cosa que no sea un espacio)
    nuevo_texto <- str_replace_all(nuevo_texto,"http\\S*", "")
    # Eliminación de signos de puntuación
    nuevo_texto <- str_replace_all(nuevo_texto,"[[:punct:]]", " ")
    # Eliminación de números
    nuevo_texto <- str_replace_all(nuevo_texto,"[[:digit:]]", " ")
    # Eliminación de espacios en blanco múltiples
    nuevo_texto <- str_replace_all(nuevo_texto,"[\\s]+", " ")
    # Tokenización por palabras individuales
    nuevo_texto <- str_split(nuevo_texto, " ")[[1]]
    # Eliminación de tokens con una longitud < 2
    nuevo_texto <- keep(.x = nuevo_texto, .p = function(x){str_length(x) > 1})
    return(nuevo_texto)
}

Puede observarse que la función limpiar_tokenizar() elimina el símbolo @ y # de las palabra a las que acompañan. En Twitter, los usuarios se identifican de esta forma, por lo que @ y # pertenecen al nombre. Aunque es importante tener en cuenta las eliminaciones del proceso de limpieza, el impacto en este caso no es demasiado alto, ya que, si un documento se caracteriza por tener la palabra #datascience, también será detectado fácilmente mediante la palabra datascience.

tweets <- tweets %>% mutate(texto_tokenizado = map(.x = texto, .f = limpiar_tokenizar))
tweets %>% select(texto_tokenizado) %>% head()
tweets_tidy <- tweets %>% select(-texto) %>% unnest()
## Warning: `cols` is now required when using unnest().
## Please use `cols = c(texto_tokenizado)`
tweets_tidy <- tweets_tidy %>% rename(token = texto_tokenizado)

Análisis exploratorio de los datos

Dado que cada usuario puede haber iniciado su actividad en Twitter en diferente momento, es interesante explorar si los tweets recuperados solapan en el tiempo.

library(lubridate)
## Warning: package 'lubridate' was built under R version 3.6.3
## 
## Attaching package: 'lubridate'
## The following objects are masked from 'package:base':
## 
##     date, intersect, setdiff, union
ggplot(tweets, aes(x = as.Date(fecha), fill = autor)) + geom_histogram(position = "identity", bins = 20, show.legend = FALSE) + labs(x = "fecha de publicación", y = "número de tweets") + facet_wrap(~ autor, ncol = 1)

Puede observarse un perfil de actividad distinto para cada usuario. Bill Gates ha mantenido una actividad constante de en torno a 5 tweets por mes durante todo el periodo estudiado. Elon Musk muestra una actividad inicial por encima de la de Bill Gates pero esta decae. Ed Lee tiene una actividad muy alta sobre todo entre octubre y noviembre.

Frecuencia de palabras

Total de palabras por usuario

tweets_tidy %>% group_by(autor) %>% summarise(n = n()) 
## `summarise()` ungrouping output (override with `.groups` argument)
tweets_tidy %>%  ggplot(aes(x = autor)) + geom_bar() + coord_flip() + theme_bw() 

Palabras distintas utilizadas por cada usuario

tweets_tidy %>% select(autor, token) %>% distinct() %>%  group_by(autor) %>% summarise(palabras_distintas = n()) 
## `summarise()` ungrouping output (override with `.groups` argument)
tweets_tidy %>% select(autor, token) %>% distinct() %>%
            ggplot(aes(x = autor)) + geom_bar() + coord_flip() + theme_bw()

Palabras utilizadas por usuario

tweets_tidy %>% group_by(autor, token) %>% count(token) %>% group_by(autor) %>% top_n(10, n) %>% arrange(autor, desc(n)) %>% print(n=30)
## # A tibble: 32 x 3
## # Groups:   autor [3]
##    autor      token         n
##    <fct>      <chr>     <int>
##  1 BillGates  the          41
##  2 BillGates  to           34
##  3 BillGates  of           25
##  4 BillGates  in           19
##  5 BillGates  and          16
##  6 BillGates  we           15
##  7 BillGates  can          11
##  8 BillGates  for          10
##  9 BillGates  is           10
## 10 BillGates  on           10
## 11 elonmusk   the          16
## 12 elonmusk   it           15
## 13 elonmusk   is           14
## 14 elonmusk   to           13
## 15 elonmusk   hyperloop    10
## 16 elonmusk   for           8
## 17 elonmusk   in            7
## 18 elonmusk   not           7
## 19 elonmusk   spacex        7
## 20 elonmusk   and           6
## 21 elonmusk   but           6
## 22 elonmusk   so            6
## 23 mayoredlee to           33
## 24 mayoredlee sf           25
## 25 mayoredlee the          25
## 26 mayoredlee our          20
## 27 mayoredlee we           18
## 28 mayoredlee amp          17
## 29 mayoredlee of           16
## 30 mayoredlee are          14
## # ... with 2 more rows

Stop words

En la tabla anterior puede observarse que los términos más frecuentes en todos los usuarios se corresponden con artículos, preposiciones, pronombres…, en general, palabras que no aportan información relevante sobre el texto. Ha estas palabras se les conoce como stopwords. Para cada idioma existen distintos listados de stopwords, además, dependiendo del contexto, puede ser necesario adaptar el listado. En la tabla anterior aparece el término amp que procede de la etiqueta html &amp. Con frecuencia, a medida que se realiza un análisis se encuentran palabras que deben incluirse en el listado de stopwords.

lista_stopwords <- c('me', 'my', 'myself', 'we', 'our', 'ours', 'ourselves',
               'you','your', 'yours', 'yourself', 'yourselves', 'he', 'him','his',
               'himself', 'she', 'her', 'hers', 'herself', 'it', 'its', 'itself',
               'they', 'them', 'their', 'theirs', 'themselves', 'what', 'which',
               'who', 'whom', 'this', 'that', 'these', 'those', 'am', 'is', 'are',
               'was', 'were', 'be', 'been', 'being', 'have', 'has', 'had',
               'having', 'do', 'does', 'did', 'doing', 'a', 'an', 'the', 'and',
               'but', 'if', 'or', 'because', 'as', 'until', 'while', 'of', 'at',
               'by', 'for', 'with', 'about', 'against', 'between', 'into',
               'through', 'during', 'before', 'after', 'above', 'below', 'to',
               'from', 'up', 'down', 'in', 'out', 'on', 'off', 'over', 'under',
               'again', 'further', 'then', 'once', 'here', 'there', 'when',
               'where', 'why', 'how', 'all', 'any', 'both', 'each', 'few', 'more',
               'most', 'other', 'some', 'such', 'no', 'nor', 'not', 'only', 'own',
               'same', 'so', 'than', 'too', 'very', 's', 't', 'can', 'will',
               'just', 'don', 'should', 'now', 'd', 'll', 'm', 'o', 're', 've',
               'y', 'ain', 'aren', 'couldn', 'didn', 'doesn', 'hadn', 'hasn',
               'haven', 'isn', 'ma', 'mightn', 'mustn', 'needn', 'shan',
               'shouldn', 'wasn', 'weren', 'won', 'wouldn','i')
# Se añade el término amp al listado de stopwords
lista_stopwords <- c(lista_stopwords, "amp")

# Se filtran las stopwords
tweets_tidy <- tweets_tidy %>% filter(!(token %in% lista_stopwords))

Representación gráfica de las frecuencias

tweets_tidy %>% group_by(autor, token) %>% count(token) %>% group_by(autor) %>%
                top_n(10, n) %>% arrange(autor, desc(n)) %>%
                ggplot(aes(x = reorder(token,n), y = n, fill = autor)) +
                geom_col() +
                theme_bw() +
                labs(y = "", x = "") +
                theme(legend.position = "none") +
                coord_flip() +
                facet_wrap(~autor,scales = "free", ncol = 1, drop = TRUE)

Los resultados obtenidos tienen sentido si ponemos en contexto la actividad profesional de los usuarios analizados. Mayor Ed Lee es alcalde de San Francisco (sf), por lo que sus tweets están relacionados con la ciudad, residentes, familias, casas… Elon Musk dirige varias empresas tecnológicas entre las que destacan Tesla y SpaceX, dedicadas a los coches y a la aeronáutica. Por último, Bill Gates, además de propietario de microsoft, dedica parte de su capital a fundaciones de ayuda, de ahí las palabras mundo, estudiantes, ayuda…

Nubes de palabras

library(wordcloud)
## Warning: package 'wordcloud' was built under R version 3.6.3
## Loading required package: RColorBrewer
library(RColorBrewer)

wordcloud_custom <- function(grupo, df){
  print(grupo)
  wordcloud(words = df$token, freq = df$frecuencia,
            max.words = 400, random.order = FALSE, rot.per = 0.35,
            colors = brewer.pal(8, "Dark2"))
}

df_grouped <- tweets_tidy %>% group_by(autor, token) %>% count(token) %>%
              group_by(autor) %>% mutate(frecuencia = n / n()) %>%
              arrange(autor, desc(frecuencia)) %>% nest() 

walk2(.x = df_grouped$autor, .y = df_grouped$data, .f = wordcloud_custom)
## [1] BillGates
## Levels: BillGates elonmusk mayoredlee
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## classroom could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## everything could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## global could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## goalkeepers could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## graduate could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## johngreen could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## known could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## many could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## met could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## poverty could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## reduce could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## remarkable could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## school could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## surprising could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## tanzania could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## work could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## achievements could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## agency could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## amazing could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## antibiotics could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## arpae could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## attentively could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## available could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## battleofthesexes could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## began could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## believed could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## benefits could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## biggest could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## bringing could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## camille could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## cards could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## catalyst could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## charlierose could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## college could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## coming could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## common could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## congrats could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## constantly could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## continue could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## conversation could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## correctly could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## countries could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## create could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## curious could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## daca could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## darpa could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## daughter could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## death could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## decided could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## decision could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## decisions could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## different could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## disappointed could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## discover could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## diseases could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## doctors could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## drive could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## education could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## eliminate could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## elisabeth could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## ellman could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## empower could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## engineers could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## eradicated could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## eradication could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## everyone could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## expert could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## exploration could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## fan could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## fans could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## fantasy could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## fascinating could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## favorite could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## fight could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## fighting could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## first could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## forward could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## fought could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## foundation could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## gather could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## gaviseth could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## gawande could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## georgiastateu could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## ghc could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## gladwell could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## goals could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## got could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## government could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## greatcityschls could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## greatest could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## groups could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## hard could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## head could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## health could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## heard could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## hitrefresh could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## hope could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## hopes could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## host could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## identify could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## imagines could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## impact could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## including could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## income could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## incredible could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## index could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## indulge could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## inequities could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## inform could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## innovations could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## inspire could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## inspiring could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## internet could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## investing could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## johncena could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## jones could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## kids could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## knew could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## know could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## knows could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## last could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## latest could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## launching could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## leaders could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## learned could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## led could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## left could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## leonardo could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## listen could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## living could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## lookout could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## loved could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## maalin could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## maow could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## mark could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## may could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## meals could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## measure could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## meeting could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## melindagates could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## message could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## microsoft could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## might could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## millions could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## mission could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## modern could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## move could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## mozambique could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## msf could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## much could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## must could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## mygivingstory could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## newborn could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## night could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## observe could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## old could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## painful could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## pathways could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## patients could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## peaceful could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## pennies could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## philanthropy could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## phoebe could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## photo could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## place could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## places could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## play could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## polio could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## possible could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## primary could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## principles could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## privilege could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## probiotic could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## profound could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## program could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## promising could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## prosperous could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## prove could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## public could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## race could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## rate could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## raydalio could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## readers could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## receiving could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## recently could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## recreate could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## reducing could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## refresh could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## regardless could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## remind could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## resistance could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## risk could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## role could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## safe could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## satyanadella could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## save could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## saw could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## sc could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## schools could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## science could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## seat could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## seattle could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## see could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## sepsis could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## september could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## showed could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## shue could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## slavery could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## slow could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## small could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## smallpox could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## solvable could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## sometimes could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## source could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## speaking could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## speaks could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## spread could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## started could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## state could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## statement could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## stop could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## study could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## succeed could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## superstar could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## support could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## surprised could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## survived could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## talents could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## talking could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## teaches could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## tech could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## technology could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## tennis could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## thankspaul could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## thedailyshow could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## thing could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## thinking could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## thoughtful could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## today could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## together could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## tom could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## tool could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## toward could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## traditional could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## trevornoah could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## trip could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## tuberculosis could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## turn could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## turns could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## two could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## type could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## un could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## university could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## unusual could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## urgent could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## use could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## using could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## vaccines could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## video could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## village could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## visible could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## vision could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## visited could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## walterisaacson could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## wants could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## week could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## wipe could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## women could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## working could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## workplace could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## year could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## years could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## york could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## young could not be fit on page. It will not be plotted.

## [1] elonmusk
## Levels: BillGates elonmusk mayoredlee
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## exactly could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## explosion could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## feature could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## finally could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## follow could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## footage could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## fundraising could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## funny could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## gary could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## gets could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## gigarothpack could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## graduatemonkey could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## hanging could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## hawthorne could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## highway could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## hope could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## hyperloopone could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## incentive could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## incentives could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## intense could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## interconnecting could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## investors could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## itchgrid could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## jmackin could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## jroque could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## kateconger could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## laboriously could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## landing could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## later could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## latter could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## laws could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## linked could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## literally could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## little could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## loved could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## makes could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## man could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## mars could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## maybe could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## messed could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## mexico could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## might could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## misinterpreted could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## months could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## munich could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## must could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## need could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## negative could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## nickg could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## northrop could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## officeofomar could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## open could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## openai could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## opm could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## owners could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## parallel could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## peak could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## piprefer could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## place could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## plus could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## possible could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## pressure could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## probably could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## raising could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## real could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## reel could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## remotely could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## returning could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## rolfe could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## room could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## rounds could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## running could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## runs could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## ryan could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## safety could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## sandbox could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## sealed could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## seeking could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## sense could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## short could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## show could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## sled could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## soon could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## sorry could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## space could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## speed could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## spilt could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## spin could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## spread could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## starting could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## strobe could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## student could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## succeed could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## suggest could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## sunday could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## supersonic could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## surprised could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## talent could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## teams could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## techmeme could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## technology could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## testing could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## think could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## thinking could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## though could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## tiny could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## together could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## token could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## took could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## trans could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## trouble could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## true could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## trying could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## ttunes could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## tunnel could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## tunnels could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## uncomfortable could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## univ could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## version could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## video could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## virtual could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## vita could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## walls could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## water could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## week could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## wendywednesday could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## whenever could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## winning could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## worked could not be fit on page. It will not be plotted.
## Warning in wordcloud(words = df$token, freq = df$frecuencia, max.words = 400, :
## zeroth could not be fit on page. It will not be plotted.

## [1] mayoredlee
## Levels: BillGates elonmusk mayoredlee

¿Quieres ser tan gomoso como el profesor? Los invito a aquellos que quieran hacer proyectos interesantes a unirse a los proyectos de los semilleros SITDIO y eficiencia, eficacia y sostenibilidad. Allá podrás explorar y aprender muchas herramientas de la mano de los profesores.