Google Trend Example

The Google Trend of “mengmeng” & “meng”

terms <- c("meng", "mengmeng", "chen")
out <- gtrend_scraper(usr, psw, terms) 
q = out %>%
    trend2long() %>%
    ggplot(aes(x=start, y=trend, color=term)) +
        geom_line() +
        facet_wrap(~term, ncol = 1) +
        guides(color=FALSE)
(gg <- ggplotly(q))