Exploiter Google Trend avec R (Rstudio)

Récupérer les tendances pour des mots clés.

Le but de la manoeuvre est ici de comprendre comment fonctionne le package « gtrendsR » en reproduisant, dans un premier temps, des données que nous pourrions avoir dans l’interface Google Trends.

## Je determine mon environnement de travail
setwd("")

## Je charge dans une variable la liste des librairies que je vais utiliser
packages = c("gtrendsR","reshape2","tidyr","dplyr","fuzzyjoin","ggplot2")

## J'installe automatiquement les librairies nécessaires et non installées
if (length(setdiff(packages, rownames(installed.packages()))) > 0) {
  install.packages(setdiff(packages, rownames(installed.packages()))) 
}

library(gtrendsR)
library(reshape2)
library(tidyr)
library(fuzzyjoin)
library(ggplot2)

## define the keywords
keywords=c("PS4","XBOX")
country=c('FR')
time=("2019-01-01 2019-12-20")
channel='web'

## Je requête Google trend
trends = gtrends(keywords,gprop =channel,geo=country, time = time)
time_trend = trends$interest_over_time
head(time_trend)
plot = ggplot(data=time_trend, aes(x=date, y=hits,group=keyword,col=keyword))+
  geom_line()+xlab('Time')+ylab('Relative Interest')+ theme_bw()+
  theme(legend.title = element_blank(),legend.position="bottom",legend.text=element_text(size=12))+ggtitle("Google Search Volume")
plot

## En mode Smooth 
plot = ggplot(data=time_trend, aes(x=date, y=hits,group=keyword,col=keyword))+
  geom_smooth(span=0.5,se=FALSE)+xlab('Time')+ylab('Relative Interest')+
  theme_bw()+theme(legend.title = element_blank(),legend.position="bottom",
                   legend.text=element_text(size=12))+ggtitle("Google Search Volume")
plot

Récupérer les mots clés qui cartonnent (à partir d’un mot clé)

trends = gtrends(geo = "FR", keyword="Assurance",time="today 1-m")
related_queries = trends$related_queries
related_queries_rising = related_queries[grepl("^rising", related_queries$related_queries),]
print(related_queries)

Récupérer les mots clés qui cartonnent (à partir d’un univers)

data(categories)
trends = gtrends(geo = "FR",time="today 1-m",category = "1361" )
related_queries = trends$related_queries
related_queries_rising = related_queries[grepl("^rising", related_queries$related_queries), ]

Comment mesurer les intérêts de recherche pour un univers ?

## Je recupere les categories disponibles
data(categories)

## Je sélectionne la catégorie qui m'intéresse
## Ici 1361 correspondant à la catégorie TOYS
trends <- gtrends(geo = "FR", category = "1361")

## Je sélectionne la periode
time_trend=trends$interest_over_time

## Je construis mon graph
plot = ggplot(data=time_trend, aes(x=date, y=hits,group=category,col=category))+
  geom_line()+xlab('Time')+ylab('Relative Interest')+ theme_bw()+
  theme(legend.title = element_blank(),legend.position="bottom",legend.text=element_text(size=12))+ggtitle("Google Search Volume")
plot

#En mode Smooth
plot = ggplot(data=time_trend, aes(x=date, y=hits,group=category,col=category))+
  geom_smooth(span=0.5,se=FALSE)+xlab('Time')+ylab('Relative Interest')+
  theme_bw()+theme(legend.title = element_blank(),legend.position="bottom",
                   legend.text=element_text(size=12))+ggtitle("Google Search Volume")
plot

Laisser un commentaire