question 5

# install.packages("robotstxt")
library(robotstxt)
paths_allowed("https://www.wikipedia.org/wiki/2024_in_film")
##  www.wikipedia.org
## [1] TRUE
# install.packages("rvest")
library(rvest)
fil_html <- read_html("https://www.wikipedia.org/wiki/2024_in_film")
table_fil_html <- html_elements(fil_html, "table")
table_fil_html
## {xml_nodeset (7)}
## [1] <table class="sidebar nomobile nowraplinks"><tbody>\n<tr><th class="sideb ...
## [2] <table class="wikitable sortable" style="margin:auto; text-align:left">\n ...
## [3] <table class="wikitable sortable"><tbody>\n<tr>\n<th>Date</th>\n<th>Event ...
## [4] <table class="wikitable sortable" style="font-size:90%;"><tbody>\n<tr>\n< ...
## [5] <table class="wikitable" style="font-size: 90%;"><tbody>\n<tr>\n<th rowsp ...
## [6] <table class="wikitable sortable defaultcenter" style="font-size:90%;">\n ...
## [7] <table class="nowraplinks mw-collapsible open navbox-inner" style="border ...
tibble_fil_list <- html_table(table_fil_html[4])
tibble_fil_list
## [[1]]
## # A tibble: 30 × 5
##    Date                    Event                       Host  `Location(s)` Ref. 
##    <chr>                   <chr>                       <chr> <chr>         <chr>
##  1 January 18 – 28         2024 Sundance Film Festival Sund… Park City, U… [62] 
##  2 January 25 – February 4 53rd International Film Fe… Inte… Rotterdam, N… [63] 
##  3 February 7 – 17         39th Santa Barbara Interna… Sant… Santa Barbar… [64] 
##  4 February 15 – 25        74th Berlin International … Berl… Berlin, Germ… [65] 
##  5 February 20 – 24        13th Oceanside Internation… Ocea… Oceanside, C… [66] 
##  6 March 1 – 10            27th Málaga Film Festival   Mála… Málaga, Spain [67] 
##  7 May 9 – 19              2024 Seattle International… Seat… Seattle, Was… [68] 
##  8 May 14 – 25             2024 Cannes Film Festival   Cann… Cannes, Fran… [69] 
##  9 June 7 – 15             39th Guadalajara Internati… Guad… Guadalajara,… [70] 
## 10 June 9 – 15             2024 Annecy International … Anne… Annecy, Fran… [71] 
## # ℹ 20 more rows
eastern_tibble_fil <- tibble_fil_list[[1]]
eastern_tibble_fil
## # A tibble: 30 × 5
##    Date                    Event                       Host  `Location(s)` Ref. 
##    <chr>                   <chr>                       <chr> <chr>         <chr>
##  1 January 18 – 28         2024 Sundance Film Festival Sund… Park City, U… [62] 
##  2 January 25 – February 4 53rd International Film Fe… Inte… Rotterdam, N… [63] 
##  3 February 7 – 17         39th Santa Barbara Interna… Sant… Santa Barbar… [64] 
##  4 February 15 – 25        74th Berlin International … Berl… Berlin, Germ… [65] 
##  5 February 20 – 24        13th Oceanside Internation… Ocea… Oceanside, C… [66] 
##  6 March 1 – 10            27th Málaga Film Festival   Mála… Málaga, Spain [67] 
##  7 May 9 – 19              2024 Seattle International… Seat… Seattle, Was… [68] 
##  8 May 14 – 25             2024 Cannes Film Festival   Cann… Cannes, Fran… [69] 
##  9 June 7 – 15             39th Guadalajara Internati… Guad… Guadalajara,… [70] 
## 10 June 9 – 15             2024 Annecy International … Anne… Annecy, Fran… [71] 
## # ℹ 20 more rows
western_tibble_fil <- html_table(table_fil_html[5])[[1]]
western_tibble_fil
## # A tibble: 14 × 7
##    Category 82nd Golden Globe Aw…¹ 82nd Golden Globe Aw…² 30th Critics' Choice…³
##    <chr>    <chr>                  <chr>                  <chr>                 
##  1 Category "Drama"                "Musical or Comedy"    "30th Critics' Choice…
##  2 Best Pi… "The Brutalist"        "Emilia Pérez"         "Anora"               
##  3 Best Di… "Brady CorbetThe Brut… "Brady CorbetThe Brut… "Jon M. ChuWicked"    
##  4 Best Ac… "Adrien BrodyThe Brut… "Sebastian StanA Diff… "Adrien BrodyThe Brut…
##  5 Best Ac… "Fernanda TorresI'm S… "Demi MooreThe Substa… "Demi MooreThe Substa…
##  6 Best Su… "Kieran CulkinA Real … "Kieran CulkinA Real … "Kieran CulkinA Real …
##  7 Best Su… "Zoe SaldañaEmilia Pé… "Zoe SaldañaEmilia Pé… "Zoe SaldañaEmilia Pé…
##  8 Best Sc… "Peter StraughanConcl… "Peter StraughanConcl… "Peter StraughanConcl…
##  9 Best Sc… "Peter StraughanConcl… "Peter StraughanConcl… "Coralie FargeatThe S…
## 10 Best An… "Flow"                 "Flow"                 "The Wild Robot"      
## 11 Best Or… "Trent Reznor and Att… "Trent Reznor and Att… "Trent Reznor and Att…
## 12 Best Or… "\"El Mal\"Emilia Pér… "\"El Mal\"Emilia Pér… "\"El Mal\"Emilia Pér…
## 13 Best Fo… "Emilia Pérez"         "Emilia Pérez"         "Emilia Pérez"        
## 14 Best Do… "—"                    "—"                    "Super/Man: The Chris…
## # ℹ abbreviated names: ¹​`82nd Golden Globe AwardsJanuary 5, 2025`,
## #   ²​`82nd Golden Globe AwardsJanuary 5, 2025`,
## #   ³​`30th Critics' Choice AwardsFebruary 7, 2025`
## # ℹ 3 more variables: `78th BAFTA AwardsFebruary 16, 2025` <chr>,
## #   `Producers, Directors, Screen Actors, and Writers Guild AwardsFebruary 8 - 23, 2025` <chr>,
## #   `97th Academy AwardsMarch 2, 2025` <chr>

question 6

library(dplyr)
## 
## Attaching package: 'dplyr'
## The following objects are masked from 'package:stats':
## 
##     filter, lag
## The following objects are masked from 'package:base':
## 
##     intersect, setdiff, setequal, union
library(rvest)
wiki_html <- read_html("https://en.wikipedia.org/wiki/2024_in_film")
tables <- html_elements(wiki_html, "table.wikitable")
tibble_list <- html_table(tables[1])
highest_tibble <- tibble_list[[1]]
colnames(highest_tibble) <- c("Rank", "Title", "Distributor", "WorldwideGross")
highest_tibble
## # A tibble: 10 × 4
##     Rank Title                           Distributor  WorldwideGross
##    <int> <chr>                           <chr>        <chr>         
##  1     1 Inside Out 2                    Disney       $1,698,863,816
##  2     2 Deadpool & Wolverine            Disney       $1,338,073,645
##  3     3 Moana 2                         Disney       $1,059,242,164
##  4     4 Despicable Me 4                 Universal    $971,315,095  
##  5     5 Wicked                          Universal    $756,535,681  
##  6     6 Mufasa: The Lion King           Disney       $723,060,982  
##  7     7 Dune: Part Two                  Warner Bros. $715,409,065  
##  8     8 Godzilla x Kong: The New Empire Warner Bros. $572,505,338  
##  9     9 Kung Fu Panda 4                 Universal    $547,689,492  
## 10    10 Sonic the Hedgehog 3            Paramount    $492,162,604