Dates & Times

library(ggplot2)
dta1 <- read.table("tw_to_us.txt")
year<-c(1950,1955,1960,1965,1970,1975,1980,1985,1990,1991,1992,1993,1994,1995,1996,1997,1998,1999,2000,2001,2002,2003,2004)
dta1<-data.frame(dta1,year)
ggplot(dta1,aes(x=year,y=V1)) + geom_line(lwd = rel(1.2)) +
  labs(x="Year",y="Number of students") +
  geom_vline(xintercept = c(1995), linetype = "dotted")

Map

library(leaflet)
library(magrittr)
m <- leaflet() %>%
  addTiles() %>%
  addMarkers(lng = 120.226047, lat = 23.002525, popup = "永林綜合料理台南本店") %>%
  addMarkers(lng = 120.221600, lat = 23.006749, popup = "萬伯鹹粥") %>% 
  addMarkers(lng = 120.218918, lat = 23.005900, popup = "老友小吃")
m

The Web

library(rvest)

# Spider-Man: Homecoming
fL <- "https://www.imdb.com/title/tt2250912/?ref_=nv_sr_1"

# extract content of web page
film_ts <- read_html(fL)

# extract rating
film_ts %>%
  html_node("strong span") %>%
  html_text() %>%
  as.numeric()
## [1] 7.5
# extract cast
film_ts %>%
  html_nodes("#titleCast .itemprop span") %>%
  html_text()
##  [1] "Tom Holland"       "Michael Keaton"    "Robert Downey Jr."
##  [4] "Marisa Tomei"      "Jon Favreau"       "Gwyneth Paltrow"  
##  [7] "Zendaya"           "Donald Glover"     "Jacob Batalon"    
## [10] "Laura Harrier"     "Tony Revolori"     "Bokeem Woodbine"  
## [13] "Tyne Daly"         "Abraham Attah"     "Hannibal Buress"