#  on the first page, you should pull out the title, date, and author, and store
# these in an R data frame. 

library(rvest)
## Warning: package 'rvest' was built under R version 3.1.3
library(XML)
## Warning: package 'XML' was built under R version 3.1.3
## 
## Attaching package: 'XML'
## 
## The following object is masked from 'package:rvest':
## 
##     xml
library(plyr)
## Warning: package 'plyr' was built under R version 3.1.3
library(dplyr)
## Warning: package 'dplyr' was built under R version 3.1.3
## 
## Attaching package: 'dplyr'
## 
## The following objects are masked from 'package:plyr':
## 
##     arrange, count, desc, failwith, id, mutate, rename, summarise,
##     summarize
## 
## The following object is masked from 'package:stats':
## 
##     filter
## 
## The following objects are masked from 'package:base':
## 
##     intersect, setdiff, setequal, union
#function used for web scraping
web_scraping <- function(url)
{
  rblog.title<-url %>% 
    html_nodes(" #leftcontent h2") %>%
    html_text()
  rblog.titledf <- as.data.frame(rblog.title)
  
  rblog.DateAuthor<-url %>% 
    html_nodes(".meta") %>%
    html_text()
  
  
  rblog.DateAuthordf <- as.data.frame(rblog.DateAuthor)
  
  rblog.DateAuthordf<-within(rblog.DateAuthordf , rblog.DateAuthor<-data.frame(do.call('rbind', strsplit(as.character(rblog.DateAuthor), 'By', fixed=TRUE))))
  #rblog.DateAuth0rdf<- data.frame(do.call('rbind', strsplit(as.character(rblog.DateAuthor),'By',fixed=TRUE)))
  #Merge Title with date and author
  
  rblog.titleDateAuthordf <- data.frame(Title=rblog.titledf,rblog.DateAuthordf)
  #colnames(rblog.titleDateAuthordf)
  #print(rblog.titleDateAuthordf)
  return(rblog.titleDateAuthordf) 
}
#Read Main Page
rblogUrlMain <- html("http://www.r-bloggers.com/search/web%20scraping")
web_scraping(rblogUrlMain)
##                                                                            rblog.title
## 1                                                      rvest: easy web scraping with R
## 2  Migrating Table-oriented Web Scraping Code to rvest w/XPath & CSS Selector Examples
## 3                                                      Web Scraping: working with APIs
## 4                                     Web Scraping: Scaling up Digital Data Collection
## 5                                                   Web Scraping part2: Digging deeper
## 6                                      A Little Web Scraping Exercise with XML-Package
## 7                                             R: Web Scraping R-bloggers Facebook Page
## 8                                     Web scraping with Python – the dark side of data
## 9                                                       Web Scraping Google+ via XPath
## 10                                            Web Scraping Yahoo Search Page via XPath
##    rblog.DateAuthor.X1    rblog.DateAuthor.X2
## 1    November 24, 2014          hadleywickham
## 2   September 17, 2014  Bob Rudis (@hrbrmstr)
## 3       March 12, 2014          Rolf Fredheim
## 4        March 5, 2014          Rolf Fredheim
## 5    February 25, 2014          Rolf Fredheim
## 6        April 5, 2012            Kay Cichini
## 7      January 6, 2012            Tony Breyal
## 8    December 27, 2011          axiomOfChoice
## 9    November 11, 2011            Tony Breyal
## 10   November 10, 2011            Tony Breyal
#base information for blog entries on all of the tagged pages

urlMain <-"http://www.r-bloggers.com/search/web%20scraping"
urlstr <-"/page/"
getPage <- function(page){
  
  url = paste(urlMain, urlstr,page, "/", sep = "")
  print(url)
  url.html <-html(url)
  #Call web_scraping function
 rblogdf<- web_scraping(url.html)
 print(rblogdf)
  #putting a pause in between  page reads
  Sys.sleep(1)
 return(rblogdf)
}
llply(2:17, getPage)
## [1] "http://www.r-bloggers.com/search/web%20scraping/page/2/"
##                                                        rblog.title
## 1           Web Scraping Google Scholar: Part 2 (Complete Success)
## 2                    Web Scraping Google Scholar (Partial Success)
## 3                                         Web Scraping Google URLs
## 4                                          Next Level Web Scraping
## 5  Web Scraping Google Scholar & Show Result as Word Cloud Using R
## 6                                        Scraping Web Pages With R
## 7                        FOMC Dates – Scraping Data From Web Pages
## 8               Scraping Fantasy Football Projections from the Web
## 9                                         Web-Scraping: the Basics
## 10           Relenium, Selenium for R. A new tool for webscraping.
##    rblog.DateAuthor.X1 rblog.DateAuthor.X2
## 1     November 8, 2011         Tony Breyal
## 2     November 8, 2011         Tony Breyal
## 3     November 7, 2011         Tony Breyal
## 4     November 5, 2011         Kay Cichini
## 5     November 1, 2011         Kay Cichini
## 6       April 15, 2015          Tony Hirst
## 7    November 30, 2014          Peter Chan
## 8        June 27, 2014      Isaac Petersen
## 9    February 19, 2014       Rolf Fredheim
## 10     January 4, 2014            aleixrvr
## [1] "http://www.r-bloggers.com/search/web%20scraping/page/3/"
##                                                                               rblog.title
## 1  R and the web (for beginners), Part III: Scraping MPs’ expenses in detail from the web
## 2                                                                       Web-Scraping in R
## 3                                    Scraping table from any web page with R or CloudStat
## 4                                             Scraping table from html web with CloudStat
## 5                                                          A Little Webscraping-Exercise…
## 6                                                                  Scraping web data in R
## 7                                                   Webscraping using readLines and RCurl
## 8                                                   Webscraping using readLines and RCurl
## 9                             Short R tutorial: Scraping Javascript Generated Data with R
## 10                                                   FOMC Dates – Full History Web Scrape
##    rblog.DateAuthor.X1 rblog.DateAuthor.X2
## 1      August 23, 2012        GivenTheData
## 2        April 2, 2012        diffuseprior
## 3     January 15, 2012                  PR
## 4     January 12, 2012           CloudStat
## 5     October 22, 2011         Kay Cichini
## 6      August 10, 2011          Zach Mayer
## 7       April 14, 2009               bryan
## 8       April 14, 2009               bryan
## 9       March 15, 2015            DataCamp
## 10    January 21, 2015          Peter Chan
## [1] "http://www.r-bloggers.com/search/web%20scraping/page/4/"
##                                                                          rblog.title
## 1                                                         Scraping XML Tables with R
## 2                                       Scraping SSL Labs Server Test Results With R
## 3                                                Interfacing R with Web technologies
## 4  Scraping organism metadata for Treebase repositories from GOLD using Python and R
## 5                                                           R-Bloggers’ Web-Presence
## 6                                  How-to Extract Text From Multiple Websites with R
## 7                                                    Scraping Flora of North America
## 8                                           Scraping R-bloggers with Python – Part 2
## 9                                                    Scraping R-Bloggers with Python
## 10              R-Function GScholarScraper to Webscrape Google Scholar Search Result
##    rblog.DateAuthor.X1                                 rblog.DateAuthor.X2
## 1         May 15, 2014                                            jgreenb1
## 2       April 29, 2014                               Bob Rudis (@hrbrmstr)
## 3       April 14, 2014                                         David Smith
## 4        April 4, 2014  What is this? David Springate's personal blog :: R
## 5        April 6, 2012                                         Kay Cichini
## 6    February 18, 2012                                 Christopher Gandrud
## 7     January 27, 2012                                        Recology - R
## 8      January 5, 2012                                  The PolStat R Feed
## 9      January 4, 2012                                  The PolStat R Feed
## 10    November 9, 2011                                         Kay Cichini
## [1] "http://www.r-bloggers.com/search/web%20scraping/page/5/"
## Warning in rbind(c("September 8, 2011", " nsaunders"), c("February 18,
## 2011", : number of columns of result is not a multiple of vector length
## (arg 1)
##                                                                               rblog.title
## 1                                      Interacting with bioinformatics webservers using R
## 2                                        R Screen Scraping: 105 Counties of Election Data
## 3                                                        Simple R Screen Scraping Example
## 4                                                                 Scrape Web data using R
## 5                                                          Digital Data Collection course
## 6                                                      Getting Data From An Online Source
## 7                                                Playing around with #rstats twitter data
## 8                                                   50 years of Christmas at the Windsors
## 9  Power Outage Impact Choropleths In 5 Steps in R (featuring rvest & RStudio “Projects”)
## 10                         Slightly Advanced rvest with Help from htmltools + XML + pipeR
##    rblog.DateAuthor.X1
## 1    September 8, 2011
## 2    February 18, 2011
## 3    February 18, 2011
## 4      August 13, 2010
## 5       March 20, 2015
## 6        March 6, 2015
## 7    February 28, 2015
## 8    December 19, 2014
## 9    November 27, 2014
## 10   November 26, 2014
##                                                                                                                                     rblog.DateAuthor.X2
## 1                                                                                                                                             nsaunders
## 2                                                                                                                                            Earl Glynn
## 3                                                                                                                                            Earl Glynn
## 4                                                                                                                                                    --
## 5                                                                                                                                         Rolf Fredheim
## 6                                                                                                                                        Robert Norberg
## 7   [email protected]\n/* <![CDATA[ */!function(){try{var t="currentScript"in document?document.currentScript:function(){for(var t=document.getElements
## 8                                                                                                                                        Dominic Nyhuis
## 9                                                                                                                                              hrbrmstr
## 10                                                                                                                                                  klr
##                                                                                                                                                                                                                                                                                                                                                                          rblog.DateAuthor.X3
## 1                                                                                                                                                                                                                                                                                                                                                                          September 8, 2011
## 2                                                                                                                                                                                                                                                                                                                                                                          February 18, 2011
## 3                                                                                                                                                                                                                                                                                                                                                                          February 18, 2011
## 4                                                                                                                                                                                                                                                                                                                                                                            August 13, 2010
## 5                                                                                                                                                                                                                                                                                                                                                                             March 20, 2015
## 6                                                                                                                                                                                                                                                                                                                                                                              March 6, 2015
## 7  TagName("script"),e=t.length;e--;)if(t[e].getAttribute("cf-hash"))return t[e]}();if(t&&t.previousSibling){var e,r,n,i,c=t.previousSibling,a=c.getAttribute("data-cfemail");if(a){for(e="",r=parseInt(a.substr(0,2),16),n=2;a.length-n;n+=2)i=parseInt(a.substr(n,2),16)^r,e+=String.fromCharCode(i);e=document.createTextNode(e),c.parentNode.replaceChild(e,c)}}}catch(u){}}();/* ]]> */
## 8                                                                                                                                                                                                                                                                                                                                                                          December 19, 2014
## 9                                                                                                                                                                                                                                                                                                                                                                          November 27, 2014
## 10                                                                                                                                                                                                                                                                                                                                                                         November 26, 2014
## [1] "http://www.r-bloggers.com/search/web%20scraping/page/6/"
##                                                                                                                       rblog.title
## 1                                                                                    What size will you be after you lose weight?
## 2 A bioinformatics walk-through: Accessing protein-protein interaction interfaces for all known protein structures with PDBe PISA
## 3                                                                                                            R User Group Roundup
## 4                                                                   Automatically Scrape Flight Ticket Data Using R and Phantomjs
## 5                                                                                                     Text Mining Gun Deaths Data
## 6                                                                                              Better handling of JSON data in R?
## 7                                                                                              Upcoming NYC R Programming Classes
## 8                                                                                                                    Introduction
## 9                                                                                     Programming instrumental music from scratch
##   rblog.DateAuthor.X1 rblog.DateAuthor.X2
## 1   November 14, 2014                 dan
## 2  September 28, 2014      biochemistries
## 3     August 28, 2014      Joseph Rickert
## 4      April 30, 2014        Huidong Tian
## 5      March 13, 2014       Francis Smart
## 6      March 13, 2014       Rolf Fredheim
## 7      March 10, 2014              vivian
## 8    February 1, 2014          steadyfish
## 9       July 29, 2013       Vik Paruchuri
## [1] "http://www.r-bloggers.com/search/web%20scraping/page/7/"
##                                                                             rblog.title
## 1                                           Programming instrumental music from scratch
## 2                                           Programming instrumental music from scratch
## 3                                                                      xkcd: Visualized
## 4  Has R-help gotten meaner over time? And what does Mancur Olson have to say about it?
## 5                                             Data Science, Data Analysis, R and Python
## 6                                                                             .Rhistory
## 7                                                   Hangman in R: A learning experience
## 8                                                                Data Analysis Training
## 9                                         Making an R Package: Not as hard as you think
## 10                                       Plotting Doctor Who Ratings (1963-2011) with R
##    rblog.DateAuthor.X1                 rblog.DateAuthor.X2
## 1        July 29, 2013                                 - r
## 2        July 29, 2013                       Vik Paruchuri
## 3          May 6, 2013                               Myles
## 4       April 30, 2013                         Trey Causey
## 5    December 15, 2012  Ron Pearson (aka TheNoodleDoodler)
## 6     October 27, 2012                     distantobserver
## 7        July 28, 2012                         tylerrinker
## 8       March 20, 2012                       prasoonsharma
## 9     January 11, 2012                         markbulling
## 10     January 3, 2012                         Tony Breyal
## [1] "http://www.r-bloggers.com/search/web%20scraping/page/8/"
##                                                                    rblog.title
## 1            GScholarXScraper: Hacking the GScholarScraper function with XPath
## 2                                           Facebook Graph API Explorer with R
## 3                       UCLA Statistics: Analyzing Thesis/Dissertation Lengths
## 4                                                        Cricket data analysis
## 5                                                              What to Expect?
## 6                                  Analysing The Rock ‘n’ Roll Madrid Marathon
## 7              Monitoring Price Fluctuations of Book Trade-In Values on Amazon
## 8                                     More Airline Crashes via the Hadleyverse
## 9                                                Knitr’s best hidden gem: spin
## 10 Fuzzy String Matching – a survival skill to tackle unstructured information
##    rblog.DateAuthor.X1   rblog.DateAuthor.X2
## 1    November 13, 2011           Tony Breyal
## 2    November 10, 2011           Tony Breyal
## 3   September 29, 2010          Ryan Rosario
## 4    September 4, 2010         prasoonsharma
## 5     January 22, 2010                  Ryan
## 6       April 18, 2015            aschinchon
## 7        April 8, 2015       Andrew Landgraf
## 8       March 31, 2015              hrbrmstr
## 9       March 23, 2015  Dean Attali's R Blog
## 10   February 26, 2015           Bigdata Doc
## [1] "http://www.r-bloggers.com/search/web%20scraping/page/9/"
##                                                             rblog.title
## 1            Who Has the Best Fantasy Football Projections? 2015 Update
## 2                                            Predicting the six nations
## 3                        Building a choropleth map of Italy using mapIT
## 4   New updates to the rNOMADS package and big changes in the GFS model
## 5                                Explore Kaggle Competition Data with R
## 6  How to analyze a new dataset (or, analyzing ‘supercar’ data, part 1)
## 7                                   FOMC Dates – Price Data Exploration
## 8                               A Letter of Recommendation for Nan Xiao
## 9                          Leveraging R for Job Openings for Economists
## 10                         Wrangling F1 Data With R – F1DataJunkie Book
##    rblog.DateAuthor.X1 rblog.DateAuthor.X2
## 1    February 20, 2015      Isaac Petersen
## 2     February 4, 2015     Mango Solutions
## 3     January 19, 2015     Davide Massidda
## 4     January 16, 2015           glossarch
## 5    December 23, 2014      notesofdabbler
## 6    December 16, 2014    Sharpsight Admin
## 7    December 14, 2014          Peter Chan
## 8    November 17, 2014           Yihui Xie
## 9     November 1, 2014       Thiemo Fetzer
## 10    October 30, 2014          Tony Hirst
## [1] "http://www.r-bloggers.com/search/web%20scraping/page/10/"
##                                                                                                rblog.title
## 1                                                         How to Download and Run R Scripts from this Site
## 2                                                                                  FIFA 15 Analysis with R
## 3  “Do You Want to Steal a Snowman?” – A Look (with R) At TorrentFreak’s Top 10 PiRated Movies List #TLAPD
## 4                                                                                         Visit of Di Cook
## 5                                                   Identify Fantasy Football Sleepers with this Shiny App
## 6                                     Time to Accept It: publishing in the Journal of Statistical Software
## 7                                                                                    2014 World Cup Squads
## 8                                                   Basketball Data Part II – Length of Career by Position
## 9                                         Using sentiment analysis to predict ratings of popular tv series
## 10                                                          On the trade history and dynamics of NBA teams
##    rblog.DateAuthor.X1    rblog.DateAuthor.X2
## 1     October 23, 2014         Isaac Petersen
## 2   September 26, 2014              The Clerk
## 3   September 18, 2014  Bob Rudis (@hrbrmstr)
## 4      August 12, 2014          Rob J Hyndman
## 5         July 6, 2014         Isaac Petersen
## 6        June 30, 2014                 brobar
## 7         June 5, 2014                 gjabel
## 8         June 2, 2014               jgreenb1
## 9         May 26, 2014             tlfvincent
## 10      April 28, 2014             tlfvincent
## [1] "http://www.r-bloggers.com/search/web%20scraping/page/11/"
##                                                                rblog.title
## 1                                Rblogger Posting Patterns Analyzed with R
## 2                           BARUG talks highlight R’s diverse applications
## 3                  Mapping academic collaborations in Evolutionary Biology
## 4                       President Approval Ratings from Roosevelt to Obama
## 5                                                        Evolution of Code
## 6                                                                    Terms
## 7                Live Google Spreadsheet For Keeping Track Of Sochi Medals
## 8  Using One Programming Language In the Context of Another – Python and R
## 9      Statistics meets rhetoric: A text analysis of "I Have a Dream" in R
## 10     Statistics meets rhetoric: A text analysis of “I Have a Dream” in R
##    rblog.DateAuthor.X1                                 rblog.DateAuthor.X2
## 1       April 11, 2014                                    Mark T Patterson
## 2       April 10, 2014                                      Joseph Rickert
## 3        April 4, 2014  What is this? David Springate's personal blog :: R
## 4       March 29, 2014                                          tlfvincent
## 5       March 27, 2014                                       Educate-R - R
## 6    February 13, 2014                                          Tal Galili
## 7    February 11, 2014                                            hrbrmstr
## 8     January 22, 2014                                          Tony Hirst
## 9     January 20, 2014                                          Max Ghenis
## 10    January 20, 2014                                          Max Ghenis
## [1] "http://www.r-bloggers.com/search/web%20scraping/page/12/"
##                                                                       rblog.title
## 1                      Second NYC R classes(announcement and teaching experience)
## 2                                              Calling Python from R with rPython
## 3  Why R is Better Than Excel for Fantasy Football (and most other) Data Analysis
## 4                               College Basketball: Presence in the NBA over Time
## 5                     Creating your personal, portable R code library with GitHub
## 6                                      MLB Rankings Using the Bradley-Terry Model
## 7                      ggplot2 Chloropleth of Supreme Court Decisions: A Tutorial
## 8                                           Which airline should you be loyal to?
## 9                                                         Opel Corsa Diesel Usage
## 10                                   Logging Data in R Loops: Applied to Twitter.
##    rblog.DateAuthor.X1 rblog.DateAuthor.X2
## 1     January 20, 2014          Tal Galili
## 2     January 13, 2014               bryan
## 3     January 13, 2014      Isaac Petersen
## 4     November 7, 2013    Mark T Patterson
## 5   September 21, 2013               bryan
## 6      August 31, 2013          John Ramey
## 7         July 4, 2013         tylerrinker
## 8         July 2, 2013                 dan
## 9        June 24, 2013            Wingfeet
## 10        May 26, 2013       Alistair Leak
## [1] "http://www.r-bloggers.com/search/web%20scraping/page/13/"
##                                                             rblog.title
## 1                                           Shiny App for CRAN packages
## 2                                               The Guerilla Guide to R
## 3                       Presentations of the third Milano R net meeting
## 4    Milano (Italy). April 18, 2013. Third Milano R net meeting: agenda
## 5                      April 18, 2013Third Milano R net meeting: agenda
## 6  Generating Labels for Supervised Text Classification using CAT and R
## 7                     Hilary: the most poisoned baby name in US history
## 8                                              R and foreign characters
## 9                                  SPARQL with R in less than 5 minutes
## 10           Multiple Classification and Authorship of the Hebrew Bible
##    rblog.DateAuthor.X1 rblog.DateAuthor.X2
## 1         May 13, 2013              pssguy
## 2         May 12, 2013        Nikhil Gopal
## 3       April 19, 2013        Milano R net
## 4       April 10, 2013        Milano R net
## 5       March 25, 2013        Milano R net
## 6     February 4, 2013             Solomon
## 7     January 29, 2013        hilaryparker
## 8     January 25, 2013       Rolf Fredheim
## 9     January 23, 2013               bryan
## 10     January 1, 2013           inkhorn82
## [1] "http://www.r-bloggers.com/search/web%20scraping/page/14/"
##                                                        rblog.title
## 1                        Chocolate and nobel prize – a true story?
## 2  Animated map of 2012 US election campaigning, with R and ffmpeg
## 3               Tips on accessing data from various sources with R
## 4                                               R Helper Functions
## 5      The R-Podcast Episode 10: Adventures in Data Munging Part 2
## 6                                             UseR 2012 highlights
## 7             Visualizing the CRAN:  Graphing Package Dependencies
## 8                               118 years of US State Weather Data
## 9                                      The 50 most used R packages
## 10                                 RStudio Development Environment
##    rblog.DateAuthor.X1 rblog.DateAuthor.X2
## 1    December 22, 2012          Max Gordon
## 2     October 28, 2012           civilstat
## 3      October 3, 2012         David Smith
## 4   September 25, 2012               bryan
## 5   September 16, 2012                Eric
## 6        June 20, 2012         David Smith
## 7         May 17, 2012        wrathematics
## 8       April 22, 2012  drunksandlampposts
## 9        April 5, 2012              flodel
## 10      March 23, 2012               bryan
## [1] "http://www.r-bloggers.com/search/web%20scraping/page/15/"
##                                                       rblog.title
## 1  R: A Quick Scrape of Top Grossing Films from boxofficemojo.com
## 2                   Installing quantstrat from R-forge and source
## 3                                            Analyzing R-bloggers
## 4                        Mapping the Iowa GOP 2012 Caucus Results
## 5                             Outliers in the European Parliament
## 6                                     Subscriptions Feature Added
## 7                                    Google Scholar (still) sucks
## 8                    Power Tools for Aspiring Data Journalists: R
## 9                                          Forecasting recessions
## 10                      CHCN: Canadian Historical Climate Network
##    rblog.DateAuthor.X1 rblog.DateAuthor.X2
## 1     January 13, 2012         Tony Breyal
## 2     January 10, 2012               bryan
## 3      January 6, 2012  The PolStat R Feed
## 4      January 4, 2012                 jjh
## 5    December 20, 2011    The PolStat Feed
## 6     December 7, 2011               bryan
## 7    November 13, 2011             bbolker
## 8     October 31, 2011          Tony Hirst
## 9       August 9, 2011          Zach Mayer
## 10      August 4, 2011       Steven Mosher
## [1] "http://www.r-bloggers.com/search/web%20scraping/page/16/"
##                                           rblog.title rblog.DateAuthor.X1
## 1                        hacking .gov shortened links       July 30, 2011
## 2            roll calls, ideal points, 112th Congress       June 29, 2011
## 3                  Automating R Scripts on Amazon EC2        June 9, 2011
## 4                                 Friday fun projects        May 14, 2011
## 5    Further Adventures in Visualisation with ggplot2      April 25, 2011
## 6                       Friday Function: setInternet2      April 15, 2011
## 7  Find NHL Players with 30 Goals and 100 PIM using R       April 2, 2011
## 8                         NBA Analysis:  Coming Soon!      March 21, 2011
## 9                              Clustering NHL Skaters    February 6, 2011
## 10          Dial-a-statistic! Featuring R and Estonia    January 16, 2011
##    rblog.DateAuthor.X2
## 1               Harlan
## 2              jackman
## 3        Travis Nelson
## 4            nsaunders
## 5              hayward
## 6          richierocks
## 7             btibert3
## 8                 Ryan
## 9                   --
## 10         Ethan Brown
## [1] "http://www.r-bloggers.com/search/web%20scraping/page/17/"
##                                   rblog.title rblog.DateAuthor.X1
## 1       How to buy a used car with R (part 1)    October 31, 2010
## 2       How to buy a used car with R (part 1)    October 31, 2010
## 3         Using XML package vs. BeautifulSoup     August 31, 2010
## 4               Are MLB Games Getting Longer?      August 5, 2010
## 5 Analyze Gold Demand and Investments using R       June 29, 2010
## 6        tooltips in R graphics; nytR package   December 28, 2009
##    rblog.DateAuthor.X2
## 1  Dan Knoepfle's Blog
## 2  Dan Knoepfle's Blog
## 3                 Ryan
## 4                 Ryan
## 5                    C
## 6              jackman
## [[1]]
##                                                        rblog.title
## 1           Web Scraping Google Scholar: Part 2 (Complete Success)
## 2                    Web Scraping Google Scholar (Partial Success)
## 3                                         Web Scraping Google URLs
## 4                                          Next Level Web Scraping
## 5  Web Scraping Google Scholar & Show Result as Word Cloud Using R
## 6                                        Scraping Web Pages With R
## 7                        FOMC Dates – Scraping Data From Web Pages
## 8               Scraping Fantasy Football Projections from the Web
## 9                                         Web-Scraping: the Basics
## 10           Relenium, Selenium for R. A new tool for webscraping.
##    rblog.DateAuthor.X1 rblog.DateAuthor.X2
## 1     November 8, 2011         Tony Breyal
## 2     November 8, 2011         Tony Breyal
## 3     November 7, 2011         Tony Breyal
## 4     November 5, 2011         Kay Cichini
## 5     November 1, 2011         Kay Cichini
## 6       April 15, 2015          Tony Hirst
## 7    November 30, 2014          Peter Chan
## 8        June 27, 2014      Isaac Petersen
## 9    February 19, 2014       Rolf Fredheim
## 10     January 4, 2014            aleixrvr
## 
## [[2]]
##                                                                               rblog.title
## 1  R and the web (for beginners), Part III: Scraping MPs’ expenses in detail from the web
## 2                                                                       Web-Scraping in R
## 3                                    Scraping table from any web page with R or CloudStat
## 4                                             Scraping table from html web with CloudStat
## 5                                                          A Little Webscraping-Exercise…
## 6                                                                  Scraping web data in R
## 7                                                   Webscraping using readLines and RCurl
## 8                                                   Webscraping using readLines and RCurl
## 9                             Short R tutorial: Scraping Javascript Generated Data with R
## 10                                                   FOMC Dates – Full History Web Scrape
##    rblog.DateAuthor.X1 rblog.DateAuthor.X2
## 1      August 23, 2012        GivenTheData
## 2        April 2, 2012        diffuseprior
## 3     January 15, 2012                  PR
## 4     January 12, 2012           CloudStat
## 5     October 22, 2011         Kay Cichini
## 6      August 10, 2011          Zach Mayer
## 7       April 14, 2009               bryan
## 8       April 14, 2009               bryan
## 9       March 15, 2015            DataCamp
## 10    January 21, 2015          Peter Chan
## 
## [[3]]
##                                                                          rblog.title
## 1                                                         Scraping XML Tables with R
## 2                                       Scraping SSL Labs Server Test Results With R
## 3                                                Interfacing R with Web technologies
## 4  Scraping organism metadata for Treebase repositories from GOLD using Python and R
## 5                                                           R-Bloggers’ Web-Presence
## 6                                  How-to Extract Text From Multiple Websites with R
## 7                                                    Scraping Flora of North America
## 8                                           Scraping R-bloggers with Python – Part 2
## 9                                                    Scraping R-Bloggers with Python
## 10              R-Function GScholarScraper to Webscrape Google Scholar Search Result
##    rblog.DateAuthor.X1                                 rblog.DateAuthor.X2
## 1         May 15, 2014                                            jgreenb1
## 2       April 29, 2014                               Bob Rudis (@hrbrmstr)
## 3       April 14, 2014                                         David Smith
## 4        April 4, 2014  What is this? David Springate's personal blog :: R
## 5        April 6, 2012                                         Kay Cichini
## 6    February 18, 2012                                 Christopher Gandrud
## 7     January 27, 2012                                        Recology - R
## 8      January 5, 2012                                  The PolStat R Feed
## 9      January 4, 2012                                  The PolStat R Feed
## 10    November 9, 2011                                         Kay Cichini
## 
## [[4]]
##                                                                               rblog.title
## 1                                      Interacting with bioinformatics webservers using R
## 2                                        R Screen Scraping: 105 Counties of Election Data
## 3                                                        Simple R Screen Scraping Example
## 4                                                                 Scrape Web data using R
## 5                                                          Digital Data Collection course
## 6                                                      Getting Data From An Online Source
## 7                                                Playing around with #rstats twitter data
## 8                                                   50 years of Christmas at the Windsors
## 9  Power Outage Impact Choropleths In 5 Steps in R (featuring rvest & RStudio “Projects”)
## 10                         Slightly Advanced rvest with Help from htmltools + XML + pipeR
##    rblog.DateAuthor.X1
## 1    September 8, 2011
## 2    February 18, 2011
## 3    February 18, 2011
## 4      August 13, 2010
## 5       March 20, 2015
## 6        March 6, 2015
## 7    February 28, 2015
## 8    December 19, 2014
## 9    November 27, 2014
## 10   November 26, 2014
##                                                                                                                                     rblog.DateAuthor.X2
## 1                                                                                                                                             nsaunders
## 2                                                                                                                                            Earl Glynn
## 3                                                                                                                                            Earl Glynn
## 4                                                                                                                                                    --
## 5                                                                                                                                         Rolf Fredheim
## 6                                                                                                                                        Robert Norberg
## 7   [email protected]\n/* <![CDATA[ */!function(){try{var t="currentScript"in document?document.currentScript:function(){for(var t=document.getElements
## 8                                                                                                                                        Dominic Nyhuis
## 9                                                                                                                                              hrbrmstr
## 10                                                                                                                                                  klr
##                                                                                                                                                                                                                                                                                                                                                                          rblog.DateAuthor.X3
## 1                                                                                                                                                                                                                                                                                                                                                                          September 8, 2011
## 2                                                                                                                                                                                                                                                                                                                                                                          February 18, 2011
## 3                                                                                                                                                                                                                                                                                                                                                                          February 18, 2011
## 4                                                                                                                                                                                                                                                                                                                                                                            August 13, 2010
## 5                                                                                                                                                                                                                                                                                                                                                                             March 20, 2015
## 6                                                                                                                                                                                                                                                                                                                                                                              March 6, 2015
## 7  TagName("script"),e=t.length;e--;)if(t[e].getAttribute("cf-hash"))return t[e]}();if(t&&t.previousSibling){var e,r,n,i,c=t.previousSibling,a=c.getAttribute("data-cfemail");if(a){for(e="",r=parseInt(a.substr(0,2),16),n=2;a.length-n;n+=2)i=parseInt(a.substr(n,2),16)^r,e+=String.fromCharCode(i);e=document.createTextNode(e),c.parentNode.replaceChild(e,c)}}}catch(u){}}();/* ]]> */
## 8                                                                                                                                                                                                                                                                                                                                                                          December 19, 2014
## 9                                                                                                                                                                                                                                                                                                                                                                          November 27, 2014
## 10                                                                                                                                                                                                                                                                                                                                                                         November 26, 2014
## 
## [[5]]
##                                                                                                                       rblog.title
## 1                                                                                    What size will you be after you lose weight?
## 2 A bioinformatics walk-through: Accessing protein-protein interaction interfaces for all known protein structures with PDBe PISA
## 3                                                                                                            R User Group Roundup
## 4                                                                   Automatically Scrape Flight Ticket Data Using R and Phantomjs
## 5                                                                                                     Text Mining Gun Deaths Data
## 6                                                                                              Better handling of JSON data in R?
## 7                                                                                              Upcoming NYC R Programming Classes
## 8                                                                                                                    Introduction
## 9                                                                                     Programming instrumental music from scratch
##   rblog.DateAuthor.X1 rblog.DateAuthor.X2
## 1   November 14, 2014                 dan
## 2  September 28, 2014      biochemistries
## 3     August 28, 2014      Joseph Rickert
## 4      April 30, 2014        Huidong Tian
## 5      March 13, 2014       Francis Smart
## 6      March 13, 2014       Rolf Fredheim
## 7      March 10, 2014              vivian
## 8    February 1, 2014          steadyfish
## 9       July 29, 2013       Vik Paruchuri
## 
## [[6]]
##                                                                             rblog.title
## 1                                           Programming instrumental music from scratch
## 2                                           Programming instrumental music from scratch
## 3                                                                      xkcd: Visualized
## 4  Has R-help gotten meaner over time? And what does Mancur Olson have to say about it?
## 5                                             Data Science, Data Analysis, R and Python
## 6                                                                             .Rhistory
## 7                                                   Hangman in R: A learning experience
## 8                                                                Data Analysis Training
## 9                                         Making an R Package: Not as hard as you think
## 10                                       Plotting Doctor Who Ratings (1963-2011) with R
##    rblog.DateAuthor.X1                 rblog.DateAuthor.X2
## 1        July 29, 2013                                 - r
## 2        July 29, 2013                       Vik Paruchuri
## 3          May 6, 2013                               Myles
## 4       April 30, 2013                         Trey Causey
## 5    December 15, 2012  Ron Pearson (aka TheNoodleDoodler)
## 6     October 27, 2012                     distantobserver
## 7        July 28, 2012                         tylerrinker
## 8       March 20, 2012                       prasoonsharma
## 9     January 11, 2012                         markbulling
## 10     January 3, 2012                         Tony Breyal
## 
## [[7]]
##                                                                    rblog.title
## 1            GScholarXScraper: Hacking the GScholarScraper function with XPath
## 2                                           Facebook Graph API Explorer with R
## 3                       UCLA Statistics: Analyzing Thesis/Dissertation Lengths
## 4                                                        Cricket data analysis
## 5                                                              What to Expect?
## 6                                  Analysing The Rock ‘n’ Roll Madrid Marathon
## 7              Monitoring Price Fluctuations of Book Trade-In Values on Amazon
## 8                                     More Airline Crashes via the Hadleyverse
## 9                                                Knitr’s best hidden gem: spin
## 10 Fuzzy String Matching – a survival skill to tackle unstructured information
##    rblog.DateAuthor.X1   rblog.DateAuthor.X2
## 1    November 13, 2011           Tony Breyal
## 2    November 10, 2011           Tony Breyal
## 3   September 29, 2010          Ryan Rosario
## 4    September 4, 2010         prasoonsharma
## 5     January 22, 2010                  Ryan
## 6       April 18, 2015            aschinchon
## 7        April 8, 2015       Andrew Landgraf
## 8       March 31, 2015              hrbrmstr
## 9       March 23, 2015  Dean Attali's R Blog
## 10   February 26, 2015           Bigdata Doc
## 
## [[8]]
##                                                             rblog.title
## 1            Who Has the Best Fantasy Football Projections? 2015 Update
## 2                                            Predicting the six nations
## 3                        Building a choropleth map of Italy using mapIT
## 4   New updates to the rNOMADS package and big changes in the GFS model
## 5                                Explore Kaggle Competition Data with R
## 6  How to analyze a new dataset (or, analyzing ‘supercar’ data, part 1)
## 7                                   FOMC Dates – Price Data Exploration
## 8                               A Letter of Recommendation for Nan Xiao
## 9                          Leveraging R for Job Openings for Economists
## 10                         Wrangling F1 Data With R – F1DataJunkie Book
##    rblog.DateAuthor.X1 rblog.DateAuthor.X2
## 1    February 20, 2015      Isaac Petersen
## 2     February 4, 2015     Mango Solutions
## 3     January 19, 2015     Davide Massidda
## 4     January 16, 2015           glossarch
## 5    December 23, 2014      notesofdabbler
## 6    December 16, 2014    Sharpsight Admin
## 7    December 14, 2014          Peter Chan
## 8    November 17, 2014           Yihui Xie
## 9     November 1, 2014       Thiemo Fetzer
## 10    October 30, 2014          Tony Hirst
## 
## [[9]]
##                                                                                                rblog.title
## 1                                                         How to Download and Run R Scripts from this Site
## 2                                                                                  FIFA 15 Analysis with R
## 3  “Do You Want to Steal a Snowman?” – A Look (with R) At TorrentFreak’s Top 10 PiRated Movies List #TLAPD
## 4                                                                                         Visit of Di Cook
## 5                                                   Identify Fantasy Football Sleepers with this Shiny App
## 6                                     Time to Accept It: publishing in the Journal of Statistical Software
## 7                                                                                    2014 World Cup Squads
## 8                                                   Basketball Data Part II – Length of Career by Position
## 9                                         Using sentiment analysis to predict ratings of popular tv series
## 10                                                          On the trade history and dynamics of NBA teams
##    rblog.DateAuthor.X1    rblog.DateAuthor.X2
## 1     October 23, 2014         Isaac Petersen
## 2   September 26, 2014              The Clerk
## 3   September 18, 2014  Bob Rudis (@hrbrmstr)
## 4      August 12, 2014          Rob J Hyndman
## 5         July 6, 2014         Isaac Petersen
## 6        June 30, 2014                 brobar
## 7         June 5, 2014                 gjabel
## 8         June 2, 2014               jgreenb1
## 9         May 26, 2014             tlfvincent
## 10      April 28, 2014             tlfvincent
## 
## [[10]]
##                                                                rblog.title
## 1                                Rblogger Posting Patterns Analyzed with R
## 2                           BARUG talks highlight R’s diverse applications
## 3                  Mapping academic collaborations in Evolutionary Biology
## 4                       President Approval Ratings from Roosevelt to Obama
## 5                                                        Evolution of Code
## 6                                                                    Terms
## 7                Live Google Spreadsheet For Keeping Track Of Sochi Medals
## 8  Using One Programming Language In the Context of Another – Python and R
## 9      Statistics meets rhetoric: A text analysis of "I Have a Dream" in R
## 10     Statistics meets rhetoric: A text analysis of “I Have a Dream” in R
##    rblog.DateAuthor.X1                                 rblog.DateAuthor.X2
## 1       April 11, 2014                                    Mark T Patterson
## 2       April 10, 2014                                      Joseph Rickert
## 3        April 4, 2014  What is this? David Springate's personal blog :: R
## 4       March 29, 2014                                          tlfvincent
## 5       March 27, 2014                                       Educate-R - R
## 6    February 13, 2014                                          Tal Galili
## 7    February 11, 2014                                            hrbrmstr
## 8     January 22, 2014                                          Tony Hirst
## 9     January 20, 2014                                          Max Ghenis
## 10    January 20, 2014                                          Max Ghenis
## 
## [[11]]
##                                                                       rblog.title
## 1                      Second NYC R classes(announcement and teaching experience)
## 2                                              Calling Python from R with rPython
## 3  Why R is Better Than Excel for Fantasy Football (and most other) Data Analysis
## 4                               College Basketball: Presence in the NBA over Time
## 5                     Creating your personal, portable R code library with GitHub
## 6                                      MLB Rankings Using the Bradley-Terry Model
## 7                      ggplot2 Chloropleth of Supreme Court Decisions: A Tutorial
## 8                                           Which airline should you be loyal to?
## 9                                                         Opel Corsa Diesel Usage
## 10                                   Logging Data in R Loops: Applied to Twitter.
##    rblog.DateAuthor.X1 rblog.DateAuthor.X2
## 1     January 20, 2014          Tal Galili
## 2     January 13, 2014               bryan
## 3     January 13, 2014      Isaac Petersen
## 4     November 7, 2013    Mark T Patterson
## 5   September 21, 2013               bryan
## 6      August 31, 2013          John Ramey
## 7         July 4, 2013         tylerrinker
## 8         July 2, 2013                 dan
## 9        June 24, 2013            Wingfeet
## 10        May 26, 2013       Alistair Leak
## 
## [[12]]
##                                                             rblog.title
## 1                                           Shiny App for CRAN packages
## 2                                               The Guerilla Guide to R
## 3                       Presentations of the third Milano R net meeting
## 4    Milano (Italy). April 18, 2013. Third Milano R net meeting: agenda
## 5                      April 18, 2013Third Milano R net meeting: agenda
## 6  Generating Labels for Supervised Text Classification using CAT and R
## 7                     Hilary: the most poisoned baby name in US history
## 8                                              R and foreign characters
## 9                                  SPARQL with R in less than 5 minutes
## 10           Multiple Classification and Authorship of the Hebrew Bible
##    rblog.DateAuthor.X1 rblog.DateAuthor.X2
## 1         May 13, 2013              pssguy
## 2         May 12, 2013        Nikhil Gopal
## 3       April 19, 2013        Milano R net
## 4       April 10, 2013        Milano R net
## 5       March 25, 2013        Milano R net
## 6     February 4, 2013             Solomon
## 7     January 29, 2013        hilaryparker
## 8     January 25, 2013       Rolf Fredheim
## 9     January 23, 2013               bryan
## 10     January 1, 2013           inkhorn82
## 
## [[13]]
##                                                        rblog.title
## 1                        Chocolate and nobel prize – a true story?
## 2  Animated map of 2012 US election campaigning, with R and ffmpeg
## 3               Tips on accessing data from various sources with R
## 4                                               R Helper Functions
## 5      The R-Podcast Episode 10: Adventures in Data Munging Part 2
## 6                                             UseR 2012 highlights
## 7             Visualizing the CRAN:  Graphing Package Dependencies
## 8                               118 years of US State Weather Data
## 9                                      The 50 most used R packages
## 10                                 RStudio Development Environment
##    rblog.DateAuthor.X1 rblog.DateAuthor.X2
## 1    December 22, 2012          Max Gordon
## 2     October 28, 2012           civilstat
## 3      October 3, 2012         David Smith
## 4   September 25, 2012               bryan
## 5   September 16, 2012                Eric
## 6        June 20, 2012         David Smith
## 7         May 17, 2012        wrathematics
## 8       April 22, 2012  drunksandlampposts
## 9        April 5, 2012              flodel
## 10      March 23, 2012               bryan
## 
## [[14]]
##                                                       rblog.title
## 1  R: A Quick Scrape of Top Grossing Films from boxofficemojo.com
## 2                   Installing quantstrat from R-forge and source
## 3                                            Analyzing R-bloggers
## 4                        Mapping the Iowa GOP 2012 Caucus Results
## 5                             Outliers in the European Parliament
## 6                                     Subscriptions Feature Added
## 7                                    Google Scholar (still) sucks
## 8                    Power Tools for Aspiring Data Journalists: R
## 9                                          Forecasting recessions
## 10                      CHCN: Canadian Historical Climate Network
##    rblog.DateAuthor.X1 rblog.DateAuthor.X2
## 1     January 13, 2012         Tony Breyal
## 2     January 10, 2012               bryan
## 3      January 6, 2012  The PolStat R Feed
## 4      January 4, 2012                 jjh
## 5    December 20, 2011    The PolStat Feed
## 6     December 7, 2011               bryan
## 7    November 13, 2011             bbolker
## 8     October 31, 2011          Tony Hirst
## 9       August 9, 2011          Zach Mayer
## 10      August 4, 2011       Steven Mosher
## 
## [[15]]
##                                           rblog.title rblog.DateAuthor.X1
## 1                        hacking .gov shortened links       July 30, 2011
## 2            roll calls, ideal points, 112th Congress       June 29, 2011
## 3                  Automating R Scripts on Amazon EC2        June 9, 2011
## 4                                 Friday fun projects        May 14, 2011
## 5    Further Adventures in Visualisation with ggplot2      April 25, 2011
## 6                       Friday Function: setInternet2      April 15, 2011
## 7  Find NHL Players with 30 Goals and 100 PIM using R       April 2, 2011
## 8                         NBA Analysis:  Coming Soon!      March 21, 2011
## 9                              Clustering NHL Skaters    February 6, 2011
## 10          Dial-a-statistic! Featuring R and Estonia    January 16, 2011
##    rblog.DateAuthor.X2
## 1               Harlan
## 2              jackman
## 3        Travis Nelson
## 4            nsaunders
## 5              hayward
## 6          richierocks
## 7             btibert3
## 8                 Ryan
## 9                   --
## 10         Ethan Brown
## 
## [[16]]
##                                   rblog.title rblog.DateAuthor.X1
## 1       How to buy a used car with R (part 1)    October 31, 2010
## 2       How to buy a used car with R (part 1)    October 31, 2010
## 3         Using XML package vs. BeautifulSoup     August 31, 2010
## 4               Are MLB Games Getting Longer?      August 5, 2010
## 5 Analyze Gold Demand and Investments using R       June 29, 2010
## 6        tooltips in R graphics; nytR package   December 28, 2009
##    rblog.DateAuthor.X2
## 1  Dan Knoepfle's Blog
## 2  Dan Knoepfle's Blog
## 3                 Ryan
## 4                 Ryan
## 5                    C
## 6              jackman