library(rtweet)
## Warning: package 'rtweet' was built under R version 3.6.1
library(tidyverse)
## Registered S3 method overwritten by 'rvest':
## method from
## read_xml.response xml2
## -- Attaching packages -------------------------------------------------------------------- tidyverse 1.2.1 --
## v ggplot2 3.2.0 v purrr 0.3.2
## v tibble 2.1.1 v dplyr 0.8.0.1
## v tidyr 0.8.3 v stringr 1.4.0
## v readr 1.3.1 v forcats 0.4.0
## -- Conflicts ----------------------------------------------------------------------- tidyverse_conflicts() --
## x dplyr::filter() masks stats::filter()
## x purrr::flatten() masks rtweet::flatten()
## x dplyr::lag() masks stats::lag()
library(ggmap)
## Warning: package 'ggmap' was built under R version 3.6.1
## Google's Terms of Service: https://cloud.google.com/maps-platform/terms/.
## Please cite ggmap if you use it! See citation("ggmap") for details.
tweets <- search_tweets(q = "Lousteau",geocode = "-34.603722,-58.381592,20mi", n = 100, include_rts = FALSE, enconding="UTF-8")
## Registered S3 method overwritten by 'openssl':
## method from
## print.bytes Rcpp
users_data(tweets) %>% head()
## # A tibble: 6 x 20
## user_id screen_name name location description url protected
## <chr> <chr> <chr> <chr> <chr> <chr> <lgl>
## 1 145370~ Horaciogen~ Hora~ SAN FER~ Divorciado~ <NA> FALSE
## 2 637216~ AnfitriteM~ Anfi~ Buenos ~ Sueño con ~ <NA> FALSE
## 3 179740~ DiegoRoGim~ Dieg~ Nordelta "" <NA> FALSE
## 4 929367~ viral_ar Es V~ Buenos ~ "" <NA> FALSE
## 5 259247~ Sacostarac~ Seba~ Avellan~ "\U0001f42~ http~ FALSE
## 6 204152~ DarioDiGul~ Darí~ Buenos ~ Analista e~ <NA> FALSE
## # ... with 13 more variables: followers_count <int>, friends_count <int>,
## # listed_count <int>, statuses_count <int>, favourites_count <int>,
## # account_created_at <dttm>, verified <lgl>, profile_url <chr>,
## # profile_expanded_url <chr>, account_lang <lgl>,
## # profile_banner_url <chr>, profile_background_url <chr>,
## # profile_image_url <chr>
options(scipen = 20)
ggplot(tweets) +
geom_histogram(aes(x = followers_count))
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.

- Los 5 usuarios con más seguidores que usaron la palabra Lousteau son: igonzalezprieto, SeccionCiudad, sergioranieri, parabuenosaires y hernanpablo
tweets %>%
top_n(40, followers_count) %>%
arrange(desc(followers_count)) %>%
select(screen_name, followers_count, location, text)
## # A tibble: 40 x 4
## screen_name followers_count location text
## <chr> <int> <chr> <chr>
## 1 igonzalezpri~ 73316 Buenos Aires, ~ El fiscal Larramendi pid~
## 2 SeccionCiudad 31786 Buenos Aires Horacio Rodríguez Larreta~
## 3 SeccionCiudad 31786 Buenos Aires Horacio Rodríguez Larreta~
## 4 sergioranieri 29366 Buenos Aires. @negrojoao Vida familiar,~
## 5 parabuenosai~ 27579 Buenos Aires, ~ Lousteau se desinfla y el~
## 6 hernanpablo 18395 Ciudad Buenos ~ @danyscht Isela Costantin~
## 7 dolomas 14088 "Buenos Aires ~ @espelliarmus Siempre lo ~
## 8 AndyJGladsto~ 13785 Quilmes, Argen~ "Larrata se confió. Se cr~
## 9 mmmoray 11856 Buenos Aires, ~ Horacio Rodríguez Larreta~
## 10 tuitalapatria 9073 Buenos Aires A~ #BuenLunes 2015, Larreta ~
## # ... with 30 more rows
ggplot(filter(tweets, !is_retweet))+
geom_histogram(aes(x = retweet_count))
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.

- El tweet con más rt dice lo siguiente: “El fiscal Larramendi pidió elevar a juicio la causa contra Dante Casermeiro (19), hijo de Federica Pais, y Octavio Laje (20), hijo de un ex diplomático y primo de Martin Lousteau, quienes están acusados de robos y amenazas con armas de fuego y de utilería en febrero pasado. https://t.co/mgSVxffove” El mismo tuvo 33 rt.
tweets %>%
filter(!is_retweet) %>%
filter(retweet_count == max(retweet_count)) %>%
select(screen_name, retweet_count, followers_count, location, text)
## # A tibble: 1 x 5
## screen_name retweet_count followers_count location text
## <chr> <int> <int> <chr> <chr>
## 1 igonzalezpr~ 33 73316 Buenos Air~ El fiscal Larrame~
tweets %>%
ggplot() +
geom_bar(aes(location)) +
coord_flip() +
labs(title = "Procedencia de los usuarios",
x = "cantidad",
y = "ubicación")

tweets %>%
filter(location != "", !is.na(location)) %>%
count(location) %>%
top_n(10, n) %>%
ggplot() +
geom_col(aes(x = reorder(location, n), y = n)) +
coord_flip() +
labs(title = "Procedencia de los usuarios",
x = "ubicación",
y = "cantidad")

ts_plot(tweets,"hours")

api_key <- "codigo_de_la_api__cortar_y_pegar_aqui"
register_google(key = api_key)
procedencia_tweets <- tweets %>%
sample_n(100) %>%
filter(!is.na(location), location != "") %>%
pull(location) %>%
geocode() %>%
group_by(lon, lat) %>%
summarise(cantidad = n())
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires,+Argentina&key=xxx
## Warning: Geocoding "Buenos Aires, Arg..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Lomas+De+Zamora&key=xxx
## Warning: Geocoding "Lomas De Zamora" failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires,+Argentina&key=xxx
## Warning: Geocoding "Buenos Aires, Arg..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires,+Argentina&key=xxx
## Warning: Geocoding "Buenos Aires, Arg..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires&key=xxx
## Warning: Geocoding "Buenos Aires" failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Ciudad+Buenos+Aires+Argentina&key=xxx
## Warning: Geocoding "Ciudad Buenos Air..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires,+Argentina&key=xxx
## Warning: Geocoding "Buenos Aires, Arg..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires+-+Argentina&key=xxx
## Warning: Geocoding "Buenos Aires - Ar..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires,+Argentina&key=xxx
## Warning: Geocoding "Buenos Aires, Arg..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires,+Argentina&key=xxx
## Warning: Geocoding "Buenos Aires, Arg..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Baires&key=xxx
## Warning: Geocoding "Baires" failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Esfera+Cultural+Goliciana&key=xxx
## Warning: Geocoding "Esfera Cultural G..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires,+Argentina&key=xxx
## Warning: Geocoding "Buenos Aires, Arg..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+aires&key=xxx
## Warning: Geocoding "Buenos aires" failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires,+Argentina&key=xxx
## Warning: Geocoding "Buenos Aires, Arg..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires,+Argentina&key=xxx
## Warning: Geocoding "Buenos Aires, Arg..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires?&key=xxx
## Warning: Geocoding "Buenos Aires?" failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Olivos+-+j_larteguy@yahoo.com&key=xxx
## Warning: Geocoding "Olivos - j_larteg..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires,+Argentina&key=xxx
## Warning: Geocoding "Buenos Aires, Arg..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires,+Argentina.&key=xxx
## Warning: Geocoding "Buenos Aires, Arg..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires+Argentina&key=xxx
## Warning: Geocoding "Buenos Aires Arge..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires,+Argentina&key=xxx
## Warning: Geocoding "Buenos Aires, Arg..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Boulogne,+Argentina&key=xxx
## Warning: Geocoding "Boulogne, Argentina" failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires&key=xxx
## Warning: Geocoding "Buenos Aires" failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires,+Argentina&key=xxx
## Warning: Geocoding "Buenos Aires, Arg..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires,+Argentina&key=xxx
## Warning: Geocoding "Buenos Aires, Arg..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires,+Argentina&key=xxx
## Warning: Geocoding "Buenos Aires, Arg..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Vicente+L%C3%B3pez,+Argentina&key=xxx
## Warning: Geocoding "Vicente López, Ar..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires&key=xxx
## Warning: Geocoding "Buenos Aires" failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Ituzaingo&key=xxx
## Warning: Geocoding "Ituzaingo" failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Banfield,+Argentina&key=xxx
## Warning: Geocoding "Banfield, Argentina" failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires,+Argentina&key=xxx
## Warning: Geocoding "Buenos Aires, Arg..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires&key=xxx
## Warning: Geocoding "Buenos Aires" failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires,+Argentina&key=xxx
## Warning: Geocoding "Buenos Aires, Arg..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires+-+Argentina&key=xxx
## Warning: Geocoding "Buenos Aires - Ar..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Quilmes,+Argentina&key=xxx
## Warning: Geocoding "Quilmes, Argentina" failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires,+Argentina&key=xxx
## Warning: Geocoding "Buenos Aires, Arg..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires&key=xxx
## Warning: Geocoding "Buenos Aires" failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires&key=xxx
## Warning: Geocoding "Buenos Aires" failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires&key=xxx
## Warning: Geocoding "Buenos Aires" failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires,+Argentina&key=xxx
## Warning: Geocoding "Buenos Aires, Arg..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires,+Argentina&key=xxx
## Warning: Geocoding "Buenos Aires, Arg..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires,+Argentina&key=xxx
## Warning: Geocoding "Buenos Aires, Arg..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires,+Argentina&key=xxx
## Warning: Geocoding "Buenos Aires, Arg..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires&key=xxx
## Warning: Geocoding "Buenos Aires" failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires,+Argentina&key=xxx
## Warning: Geocoding "Buenos Aires, Arg..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires&key=xxx
## Warning: Geocoding "Buenos Aires" failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires,+Argentina&key=xxx
## Warning: Geocoding "Buenos Aires, Arg..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=San+Miguel,+Argentina&key=xxx
## Warning: Geocoding "San Miguel, Argen..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Moreno,+Buenos+Aires.&key=xxx
## Warning: Geocoding "Moreno, Buenos Ai..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires,+Argentina&key=xxx
## Warning: Geocoding "Buenos Aires, Arg..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires&key=xxx
## Warning: Geocoding "Buenos Aires " failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires&key=xxx
## Warning: Geocoding "Buenos Aires" failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires,+Argentina&key=xxx
## Warning: Geocoding "Buenos Aires, Arg..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Avellaneda&key=xxx
## Warning: Geocoding "Avellaneda" failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires&key=xxx
## Warning: Geocoding "Buenos Aires" failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires,+Argentina&key=xxx
## Warning: Geocoding "Buenos Aires, Arg..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires&key=xxx
## Warning: Geocoding "Buenos Aires" failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=C.A.B.A.&key=xxx
## Warning: Geocoding "C.A.B.A." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires,+Argentine&key=xxx
## Warning: Geocoding "Buenos Aires, Arg..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Ezeiza&key=xxx
## Warning: Geocoding "Ezeiza" failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires&key=xxx
## Warning: Geocoding "Buenos Aires" failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Quilmes,+Argentina&key=xxx
## Warning: Geocoding "Quilmes, Argentina" failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Wilde&key=xxx
## Warning: Geocoding "Wilde " failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires&key=xxx
## Warning: Geocoding "Buenos Aires" failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires,+Argentina&key=xxx
## Warning: Geocoding "Buenos Aires, Arg..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires,+Argentina&key=xxx
## Warning: Geocoding "Buenos Aires, Arg..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=SAN+FERNANDO,ARGENTINA&key=xxx
## Warning: Geocoding "SAN FERNANDO,ARGE..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=San+Isidro+Buenos+Aires&key=xxx
## Warning: Geocoding "San Isidro Buenos..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires&key=xxx
## Warning: Geocoding "Buenos Aires" failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires&key=xxx
## Warning: Geocoding "Buenos Aires" failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires+Argentina&key=xxx
## Warning: Geocoding "Buenos Aires Arge..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires,+Argentina&key=xxx
## Warning: Geocoding "Buenos Aires, Arg..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires,+Argentina&key=xxx
## Warning: Geocoding "Buenos Aires, Arg..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Lomas+de+Zamora&key=xxx
## Warning: Geocoding "Lomas de Zamora" failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires&key=xxx
## Warning: Geocoding "Buenos Aires" failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Tigre,+Argentina&key=xxx
## Warning: Geocoding "Tigre, Argentina" failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires&key=xxx
## Warning: Geocoding "Buenos Aires" failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires&key=xxx
## Warning: Geocoding "Buenos Aires" failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Tigre,+Argentina&key=xxx
## Warning: Geocoding "Tigre, Argentina" failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires&key=xxx
## Warning: Geocoding "Buenos Aires" failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires,+Argentina&key=xxx
## Warning: Geocoding "Buenos Aires, Arg..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires,+Argentina&key=xxx
## Warning: Geocoding "Buenos Aires, Arg..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires,+Argentine&key=xxx
## Warning: Geocoding "Buenos Aires, Arg..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires,+Argentina.&key=xxx
## Warning: Geocoding "Buenos Aires, Arg..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires&key=xxx
## Warning: Geocoding "Buenos Aires" failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=LAS+LOMITAS+de+Zamora&key=xxx
## Warning: Geocoding "LAS LOMITAS de Za..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires.&key=xxx
## Warning: Geocoding "Buenos Aires." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Berazategui,+Argentina&key=xxx
## Warning: Geocoding "Berazategui, Arge..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Nordelta&key=xxx
## Warning: Geocoding "Nordelta" failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires,+Argentina&key=xxx
## Warning: Geocoding "Buenos Aires, Arg..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires,+Argentina&key=xxx
## Warning: Geocoding "Buenos Aires, Arg..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires,+Argentina&key=xxx
## Warning: Geocoding "Buenos Aires, Arg..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires&key=xxx
## Warning: Geocoding "Buenos Aires" failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires,+Argentina&key=xxx
## Warning: Geocoding "Buenos Aires, Arg..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Buenos+Aires,+Argentina&key=xxx
## Warning: Geocoding "Buenos Aires, Arg..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Lanus,+buenos+aires,+argentina&key=xxx
## Warning: Geocoding "Lanus, buenos air..." failed with error:
## The provided API key is invalid.
## Source : https://maps.googleapis.com/maps/api/geocode/json?address=Boedo.&key=xxx
## Warning: Geocoding "Boedo." failed with error:
## The provided API key is invalid.
ggplot(procedencia_tweets) +
borders("world") +
geom_point(aes(x = lon, y = lat, size = cantidad), alpha = .4, color = "red") +
labs(title = "Procedencia de los tweets capturados")
## Warning: Removed 1 rows containing missing values (geom_point).

tweets_guga <- search_tweets(q = "Lousteau",
geocode = "-34.603722,-58.381592,20mi",
include_rts = FALSE,
n = 20000,
retryonratelimit = TRUE)