The Google trend line can be analyzed using an R platform using the gtrendR package. We use the package to compare the key words "Bigdata","Genomics", "Bioinformatics","Systems Biology".
library(gtrendsR)
trend <- gtrends(c("Bigdata","Genomics","Bioinformatics","Systems Biology"))
plot(trend)

tr1 <- gtrends("Bigdata")
tr2 <- gtrends("Genomics")
tr3 <- gtrends("Bioinformatics")
tr4 <- gtrends("Systems Biology")
a<-tr1$interest_over_time
b<-tr2$interest_over_time
c<-tr3$interest_over_time
d<-tr4$interest_over_time
aa<-a$hits
bb<-b$hits
cc<-c$hits
dd<-d$hits
T<-trend$interest_over_time
TT<-T$hits
TT1<-TT[1:260]
TT2<-TT[261:520]
TT3<-TT[521:780]
TT4<-TT[781:1040]
par(mfrow=c(2,2))
x<-1:261
plot(x,aa,pch=19,col="red")
points(1:length(TT1),TT1,pch=19,col="green")
plot(1:length(bb),bb,pch=19,col="red")
points(1:length(TT2),TT2,pch=19,col="green")
plot(1:length(cc),cc,pch=19,col="red")
points(1:length(TT3),TT3,pch=19,col="green")
plot(1:length(dd),dd,pch=19,col="red")
points(1:length(TT4),TT4,pch=19,col="green")

length(TT)
## [1] 1044
par(mfrow=c(2,3))
plot(bb,aa,pch=19,xlab="Genomics",ylab="Big Data")
plot(cc,aa,pch=19,xlab="Bioinformatics",ylab="Big Data")
plot(dd,aa,pch=19,xlab="Systems Biology",ylab="Big Data")
plot(bb,cc,pch=19,xlab="Genomics",ylab="Bioinformatics")
plot(bb,dd,pch=19,xlab="Genomics",ylab="Systems Biology")
plot(cc,dd,pch=19,xlab="Bioinformatics",ylab="Systems Biology")
