Deepak Mongia - Data 607 Week 9 Assignment

Deepak Mongia

October 27, 2018

Assignment - Web APIs

The New York Times web site provides a rich set of APIs, as described here: http://developer.nytimes.com/docs You’ll need to start by signing up for an API key. Your task is to choose one of the New York Times APIs, construct an interface in R to read in the JSON data, and transform it to an R dataframe.

Step-1: Loading the required packages

library(httr)
library(jsonlite)
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(kableExtra)

We have already requested the API key to get / read the data from the NY Times API. We are using the books_api from the NY Times page : http://developer.nytimes.com/

nyt_books_url <- "https://api.nytimes.com/svc/books/v3/lists/best-sellers/history.json"

nyt_books <- GET(nyt_books_url, query = list(api_key = "a01880c89030475c908b46f8072e2a02"))

nyt_books$status_code
## [1] 200
text_content <- content(nyt_books, as = "text")

json_content_df <- text_content %>% fromJSON() %>% as.data.frame()

dim(json_content_df)
## [1] 20 14
json_content_df %>% kable() %>% kable_styling()
status copyright num_results results.title results.description results.contributor results.author results.contributor_note results.price results.age_group results.publisher results.isbns results.ranks_history results.reviews
OK Copyright (c) 2018 The New York Times Company. All Rights Reserved. 31691 “I GIVE YOU MY BODY …” The author of the Outlander novels gives tips on writing sex scenes, drawing on examples from the books. by Diana Gabaldon Diana Gabaldon 0.00 Dell list(isbn10 = “0399178570”, isbn13 = “9780399178573”) list(primary_isbn10 = “0399178570”, primary_isbn13 = “9780399178573”, rank = 8, list_name = “Advice How-To and Miscellaneous”, display_name = “Advice, How-To & Miscellaneous”, published_date = “2016-09-04”, bestsellers_date = “2016-08-20”, weeks_on_list = 1, ranks_last_week = NA, asterisk = 0, dagger = 0) list(book_review_link = “”, first_chapter_link = “”, sunday_review_link = “”, article_chapter_link = “”)
OK Copyright (c) 2018 The New York Times Company. All Rights Reserved. 31691 “MOST BLESSED OF THE PATRIARCHS” A character study that attempts to make sense of Jefferson’s contradictions. by Annette Gordon-Reed and Peter S. Onuf Annette Gordon-Reed and Peter S Onuf 0.00 Liveright list(isbn10 = “0871404427”, isbn13 = “9780871404428”) list(primary_isbn10 = “0871404427”, primary_isbn13 = “9780871404428”, rank = 16, list_name = “Hardcover Nonfiction”, display_name = “Hardcover Nonfiction”, published_date = “2016-05-01”, bestsellers_date = “2016-04-16”, weeks_on_list = 1, ranks_last_week = NA, asterisk = 1, dagger = 0) list(book_review_link = “”, first_chapter_link = “”, sunday_review_link = “”, article_chapter_link = “”)
OK Copyright (c) 2018 The New York Times Company. All Rights Reserved. 31691 #ASKGARYVEE The entrepreneur expands on subjects addressed on his Internet show, like marketing, management and social media. by Gary Vaynerchuk Gary Vaynerchuk 0.00 HarperCollins list(isbn10 = c(“0062273124”, “0062273132”), isbn13 = c(“9780062273123”, “9780062273130”)) list(primary_isbn10 = c(“0062273124”, “0062273124”), primary_isbn13 = c(“9780062273123”, “9780062273123”), rank = 5:6, list_name = c(“Business Books”, “Advice How-To and Miscellaneous”), display_name = c(“Business”, “Advice, How-To & Miscellaneous”), published_date = c(“2016-04-10”, “2016-03-27”), bestsellers_date = c(“2016-03-26”, “2016-03-12”), weeks_on_list = 0:1, ranks_last_week = c(NA, NA), asterisk = c(0, 0), dagger = c(1, 1)) list(book_review_link = “”, first_chapter_link = “”, sunday_review_link = “”, article_chapter_link = “”)
OK Copyright (c) 2018 The New York Times Company. All Rights Reserved. 31691 #GIRLBOSS An online fashion retailer traces her path to success. by Sophia Amoruso Sophia Amoruso 0.00 Portfolio/Penguin/Putnam list(isbn10 = c(“039916927X”, “1591847931”), isbn13 = c(“9780399169274”, “9781591847939”)) list(primary_isbn10 = c(“1591847931”, “1591847931”, “1591847931”, “1591847931”, “039916927X”, “039916927X”, “039916927X”), primary_isbn13 = c(“9781591847939”, “9781591847939”, “9781591847939”, “9781591847939”, “9780399169274”, “9780399169274”, “9780399169274”), rank = c(8, 9, 9, 8, 10, 8, 14), list_name = c(“Business Books”, “Business Books”, “Business Books”, “Business Books”, “Business Books”, “Business Books”, “Advice How-To and Miscellaneous”), display_name = c(“Business”, “Business”, “Business”, “Business”, “Business”, “Business”, “Advice, How-To & Miscellaneous”), published_date = c(“2016-03-13”, “2016-01-17”, “2015-12-13”, “2015-11-15”, “2014-11-09”, “2014-10-12”, “2014-09-21”), bestsellers_date = c(“2016-02-27”, “2016-01-02”, “2015-11-28”, “2015-10-31”, “2014-10-25”, “2014-09-27”, “2014-09-06”), weeks_on_list = c(0, 0, 0, 0, 0, 0, 0), ranks_last_week = c(NA, NA, NA, NA, NA, NA, NA), asterisk = c(0, 0, 0, 0, 0, 0, 0), dagger = c(0, 0, 0, 0, 0, 0, 0)) list(book_review_link = “”, first_chapter_link = “”, sunday_review_link = “”, article_chapter_link = “”)
OK Copyright (c) 2018 The New York Times Company. All Rights Reserved. 31691 #NEVERAGAIN Students from Marjory Stoneman Douglas High School describe the Valentine’s Day mass shooting and outline ways to prevent similar incidents. by David Hogg and Lauren Hogg David Hogg and Lauren Hogg 0.00 Random House list(isbn10 = “198480183X”, isbn13 = “9781984801838”) list(primary_isbn10 = “198480183X”, primary_isbn13 = “9781984801838”, rank = 9, list_name = “Paperback Nonfiction”, display_name = “Paperback Nonfiction”, published_date = “2018-07-08”, bestsellers_date = “2018-06-23”, weeks_on_list = 1, ranks_last_week = NA, asterisk = 0, dagger = 0) list(book_review_link = “”, first_chapter_link = “”, sunday_review_link = “”, article_chapter_link = “”)
OK Copyright (c) 2018 The New York Times Company. All Rights Reserved. 31691 $100 STARTUP How to build a profitable start up for $100 or less and be your own boss. by Chris Guillebeau Chris Guillebeau 23.00 Crown Business list(isbn10 = “0307951529”, isbn13 = “9780307951526”) list() list(book_review_link = “”, first_chapter_link = “”, sunday_review_link = “”, article_chapter_link = “”)
OK Copyright (c) 2018 The New York Times Company. All Rights Reserved. 31691 $20 PER GALLON by Christopher Steiner Christopher Steiner 0.00 Grand Central list() list() list(book_review_link = “”, first_chapter_link = “”, sunday_review_link = “”, article_chapter_link = “”)
OK Copyright (c) 2018 The New York Times Company. All Rights Reserved. 31691 ’57, Chicago NA NA Steve Monroe NA 0.00 NA NA list(isbn10 = “0786867302”, isbn13 = “9780786867301”) list() list(book_review_link = “”, first_chapter_link = NA, sunday_review_link = “https://www.nytimes.com/2001/07/29/books/books-in-brief-fiction-poetry-319660.html”, article_chapter_link = NA)
OK Copyright (c) 2018 The New York Times Company. All Rights Reserved. 31691 ‘ROCK OF AGES:’‘ROLLING STONE’‘HISTORY OF ROCK AND ROLL’ NA NA GEOFFREY STOKES, KEN TUCKER’ ’ED WARD NA 0.00 NA NA list(isbn10 = “0671630687”, isbn13 = “9780671630683”) list() list(book_review_link = “”, first_chapter_link = NA, sunday_review_link = “https://www.nytimes.com/1986/12/28/books/three-chord-music-in-a-three-piece-suit.html”, article_chapter_link = NA)
OK Copyright (c) 2018 The New York Times Company. All Rights Reserved. 31691 ‘THE HIGH ROAD TO CHINA: GEORGE BOGLE, THE PANCHEN LAMA AND THE FIRST BRITISH EXPEDITION TO TIBET’ NA NA KATE TELTSCHER NA 0.00 NA NA list(isbn10 = “0374217009”, isbn13 = “9780374217006”) list() list(book_review_link = “”, first_chapter_link = NA, sunday_review_link = “https://www.nytimes.com/2007/04/22/books/review/Stuart.t.html”, article_chapter_link = NA)
OK Copyright (c) 2018 The New York Times Company. All Rights Reserved. 31691 ’TIL DEATH by Sharon Sala Sharon Sala 0.00 Harlequin Mira list(isbn10 = “0778314278”, isbn13 = “9780778314271”) list() list(book_review_link = “”, first_chapter_link = “”, sunday_review_link = “”, article_chapter_link = “”)
OK Copyright (c) 2018 The New York Times Company. All Rights Reserved. 31691 ’TIL DEATH DO US PART A matchmaker in Victorian England turns to a crime novelist for help when she starts receiving a series of disturbingly personalized trinkets. by Amanda Quick Amanda Quick 0.00 Berkley list(isbn10 = c(“069819361X”, “039917446X”), isbn13 = c(“9780698193611”, “9780399174469”)) list(primary_isbn10 = c(“069819361X”, “069819361X”), primary_isbn13 = c(“9780698193611”, “9780698193611”), rank = c(9, 15), list_name = c(“E-Book Fiction”, “Combined Print and E-Book Fiction”), display_name = c(“E-Book Fiction”, “Combined Print & E-Book Fiction”), published_date = c(“2016-05-08”, “2016-05-08”), bestsellers_date = c(“2016-04-23”, “2016-04-23”), weeks_on_list = c(1, 1), ranks_last_week = c(NA, NA), asterisk = c(0, 0), dagger = c(0, 0)) list(book_review_link = “”, first_chapter_link = “”, sunday_review_link = “”, article_chapter_link = “”)
OK Copyright (c) 2018 The New York Times Company. All Rights Reserved. 31691 ’Til Faith Do Us Part: How Interfaith Marriage is Transforming America NA NA Naomi Schaefer Riley NA 0.00 NA NA list(isbn10 = “0199873747”, isbn13 = “9780199873746”) list() list(book_review_link = “”, first_chapter_link = NA, sunday_review_link = “https://www.nytimes.com/2013/05/26/books/review/til-faith-do-us-part-by-naomi-schaefer-riley.html”, article_chapter_link = NA)
OK Copyright (c) 2018 The New York Times Company. All Rights Reserved. 31691 ’TIS THE SEASON Two classic holiday stories — “Under the Christmas Tree” (2009) and “Midnight Confessions” (2010) — plus the novella “Backward Glance” (1991). by Robyn Carr Ron Carr 0.00 Harlequin Mira list(isbn10 = “0778316645”, isbn13 = “9780778316640”) list(primary_isbn10 = c(“0778316645”, “0778316645”), primary_isbn13 = c(“9780778316640”, “9780778316640”), rank = c(18, 6), list_name = c(“Mass Market Paperback”, “Mass Market Paperback”), display_name = c(“Paperback Mass-Market Fiction”, “Paperback Mass-Market Fiction”), published_date = c(“2014-11-30”, “2014-11-16”), bestsellers_date = c(“2014-11-15”, “2014-11-01”), weeks_on_list = 0:1, ranks_last_week = c(NA, NA), asterisk = 0:1, dagger = c(0, 0)) list(book_review_link = “”, first_chapter_link = “”, sunday_review_link = “”, article_chapter_link = “”)
OK Copyright (c) 2018 The New York Times Company. All Rights Reserved. 31691 ——, THAT’S DELICIOUS by Action Bronson with Rachel Wharton Action Bronson with Rachel Wharton 0.00 Abrams list(isbn10 = “1419726552”, isbn13 = “9781419726552”) list(primary_isbn10 = “1419726552”, primary_isbn13 = “9781419726552”, rank = 9, list_name = “Advice How-To and Miscellaneous”, display_name = “Advice, How-To & Miscellaneous”, published_date = “2017-10-01”, bestsellers_date = “2017-09-16”, weeks_on_list = 1, ranks_last_week = NA, asterisk = 0, dagger = 1) list(book_review_link = “”, first_chapter_link = “”, sunday_review_link = “”, article_chapter_link = “”)
OK Copyright (c) 2018 The New York Times Company. All Rights Reserved. 31691 …and the Horse He Rode In On: The People V. Kenneth Starr NA NA James Carville NA 0.00 NA NA list(isbn10 = “0684857340”, isbn13 = “9780684857343”) list() list(book_review_link = “”, first_chapter_link = NA, sunday_review_link = “https://www.nytimes.com/1998/10/18/books/preaching-to-the-converted.html”, article_chapter_link = NA)
OK Copyright (c) 2018 The New York Times Company. All Rights Reserved. 31691 .HACK G.U. , VOL. 5 This series, set in the future, is about an online, multiplayer game run amok. This volume concludes the tale. by Hamazaki Tatsuya Hamazaki Tatsuya 10.99 TOKYOPOP list() list() list(book_review_link = “”, first_chapter_link = “”, sunday_review_link = “”, article_chapter_link = “”)
OK Copyright (c) 2018 The New York Times Company. All Rights Reserved. 31691 1 Ragged Ridge Road NA NA David Adams Richards NA 0.00 NA NA list(isbn10 = “0671003542”, isbn13 = “9780671003548”) list() list(book_review_link = “”, first_chapter_link = NA, sunday_review_link = “https://www.nytimes.com/1997/08/31/books/books-in-brief-fiction-747866.html”, article_chapter_link = NA)
OK Copyright (c) 2018 The New York Times Company. All Rights Reserved. 31691 1,000 PLACES TO SEE BEFORE YOU DIE A guide for traveling the world; second edition updated with new entries. by Patricia Schultz Patricia Schultz 0.00 Workman list(isbn10 = c(“0761156860”, “0761104844”), isbn13 = c(“9780761156864”, “9780761104841”)) list(primary_isbn10 = c(“0761156860”, “0761156860”, “0761156860”), primary_isbn13 = c(“9780761156864”, “9780761156864”, “9780761156864”), rank = c(10, 8, 12), list_name = c(“Travel”, “Travel”, “Travel”), display_name = c(“Travel”, “Travel”, “Travel”), published_date = c(“2015-04-12”, “2015-03-15”, “2015-01-11”), bestsellers_date = c(“2015-03-28”, “2015-02-28”, “2014-12-27”), weeks_on_list = c(0, 0, 0), ranks_last_week = c(NA, NA, NA), asterisk = c(0, 0, 0), dagger = c(0, 0, 0)) list(book_review_link = “”, first_chapter_link = “”, sunday_review_link = “”, article_chapter_link = “”)
OK Copyright (c) 2018 The New York Times Company. All Rights Reserved. 31691 1,000 RECORDINGS TO HEAR BEFORE YOU DIE Operas, rock albums, blues, classical music, world music and other essentials, from a musician and music journalist. by Tom Moon Tom Moon 0.00 Workman list() list() list(book_review_link = “”, first_chapter_link = “”, sunday_review_link = “”, article_chapter_link = “”)
# Removing the first 3 columns as those are irrelevant here, and not needed
json_content_df <- json_content_df[, -(1:3)]

json_content_df %>% kable() %>% kable_styling()
results.title results.description results.contributor results.author results.contributor_note results.price results.age_group results.publisher results.isbns results.ranks_history results.reviews
“I GIVE YOU MY BODY …” The author of the Outlander novels gives tips on writing sex scenes, drawing on examples from the books. by Diana Gabaldon Diana Gabaldon 0.00 Dell list(isbn10 = “0399178570”, isbn13 = “9780399178573”) list(primary_isbn10 = “0399178570”, primary_isbn13 = “9780399178573”, rank = 8, list_name = “Advice How-To and Miscellaneous”, display_name = “Advice, How-To & Miscellaneous”, published_date = “2016-09-04”, bestsellers_date = “2016-08-20”, weeks_on_list = 1, ranks_last_week = NA, asterisk = 0, dagger = 0) list(book_review_link = “”, first_chapter_link = “”, sunday_review_link = “”, article_chapter_link = “”)
“MOST BLESSED OF THE PATRIARCHS” A character study that attempts to make sense of Jefferson’s contradictions. by Annette Gordon-Reed and Peter S. Onuf Annette Gordon-Reed and Peter S Onuf 0.00 Liveright list(isbn10 = “0871404427”, isbn13 = “9780871404428”) list(primary_isbn10 = “0871404427”, primary_isbn13 = “9780871404428”, rank = 16, list_name = “Hardcover Nonfiction”, display_name = “Hardcover Nonfiction”, published_date = “2016-05-01”, bestsellers_date = “2016-04-16”, weeks_on_list = 1, ranks_last_week = NA, asterisk = 1, dagger = 0) list(book_review_link = “”, first_chapter_link = “”, sunday_review_link = “”, article_chapter_link = “”)
#ASKGARYVEE The entrepreneur expands on subjects addressed on his Internet show, like marketing, management and social media. by Gary Vaynerchuk Gary Vaynerchuk 0.00 HarperCollins list(isbn10 = c(“0062273124”, “0062273132”), isbn13 = c(“9780062273123”, “9780062273130”)) list(primary_isbn10 = c(“0062273124”, “0062273124”), primary_isbn13 = c(“9780062273123”, “9780062273123”), rank = 5:6, list_name = c(“Business Books”, “Advice How-To and Miscellaneous”), display_name = c(“Business”, “Advice, How-To & Miscellaneous”), published_date = c(“2016-04-10”, “2016-03-27”), bestsellers_date = c(“2016-03-26”, “2016-03-12”), weeks_on_list = 0:1, ranks_last_week = c(NA, NA), asterisk = c(0, 0), dagger = c(1, 1)) list(book_review_link = “”, first_chapter_link = “”, sunday_review_link = “”, article_chapter_link = “”)
#GIRLBOSS An online fashion retailer traces her path to success. by Sophia Amoruso Sophia Amoruso 0.00 Portfolio/Penguin/Putnam list(isbn10 = c(“039916927X”, “1591847931”), isbn13 = c(“9780399169274”, “9781591847939”)) list(primary_isbn10 = c(“1591847931”, “1591847931”, “1591847931”, “1591847931”, “039916927X”, “039916927X”, “039916927X”), primary_isbn13 = c(“9781591847939”, “9781591847939”, “9781591847939”, “9781591847939”, “9780399169274”, “9780399169274”, “9780399169274”), rank = c(8, 9, 9, 8, 10, 8, 14), list_name = c(“Business Books”, “Business Books”, “Business Books”, “Business Books”, “Business Books”, “Business Books”, “Advice How-To and Miscellaneous”), display_name = c(“Business”, “Business”, “Business”, “Business”, “Business”, “Business”, “Advice, How-To & Miscellaneous”), published_date = c(“2016-03-13”, “2016-01-17”, “2015-12-13”, “2015-11-15”, “2014-11-09”, “2014-10-12”, “2014-09-21”), bestsellers_date = c(“2016-02-27”, “2016-01-02”, “2015-11-28”, “2015-10-31”, “2014-10-25”, “2014-09-27”, “2014-09-06”), weeks_on_list = c(0, 0, 0, 0, 0, 0, 0), ranks_last_week = c(NA, NA, NA, NA, NA, NA, NA), asterisk = c(0, 0, 0, 0, 0, 0, 0), dagger = c(0, 0, 0, 0, 0, 0, 0)) list(book_review_link = “”, first_chapter_link = “”, sunday_review_link = “”, article_chapter_link = “”)
#NEVERAGAIN Students from Marjory Stoneman Douglas High School describe the Valentine’s Day mass shooting and outline ways to prevent similar incidents. by David Hogg and Lauren Hogg David Hogg and Lauren Hogg 0.00 Random House list(isbn10 = “198480183X”, isbn13 = “9781984801838”) list(primary_isbn10 = “198480183X”, primary_isbn13 = “9781984801838”, rank = 9, list_name = “Paperback Nonfiction”, display_name = “Paperback Nonfiction”, published_date = “2018-07-08”, bestsellers_date = “2018-06-23”, weeks_on_list = 1, ranks_last_week = NA, asterisk = 0, dagger = 0) list(book_review_link = “”, first_chapter_link = “”, sunday_review_link = “”, article_chapter_link = “”)
$100 STARTUP How to build a profitable start up for $100 or less and be your own boss. by Chris Guillebeau Chris Guillebeau 23.00 Crown Business list(isbn10 = “0307951529”, isbn13 = “9780307951526”) list() list(book_review_link = “”, first_chapter_link = “”, sunday_review_link = “”, article_chapter_link = “”)
$20 PER GALLON by Christopher Steiner Christopher Steiner 0.00 Grand Central list() list() list(book_review_link = “”, first_chapter_link = “”, sunday_review_link = “”, article_chapter_link = “”)
’57, Chicago NA NA Steve Monroe NA 0.00 NA NA list(isbn10 = “0786867302”, isbn13 = “9780786867301”) list() list(book_review_link = “”, first_chapter_link = NA, sunday_review_link = “https://www.nytimes.com/2001/07/29/books/books-in-brief-fiction-poetry-319660.html”, article_chapter_link = NA)
‘ROCK OF AGES:’‘ROLLING STONE’‘HISTORY OF ROCK AND ROLL’ NA NA GEOFFREY STOKES, KEN TUCKER’ ’ED WARD NA 0.00 NA NA list(isbn10 = “0671630687”, isbn13 = “9780671630683”) list() list(book_review_link = “”, first_chapter_link = NA, sunday_review_link = “https://www.nytimes.com/1986/12/28/books/three-chord-music-in-a-three-piece-suit.html”, article_chapter_link = NA)
‘THE HIGH ROAD TO CHINA: GEORGE BOGLE, THE PANCHEN LAMA AND THE FIRST BRITISH EXPEDITION TO TIBET’ NA NA KATE TELTSCHER NA 0.00 NA NA list(isbn10 = “0374217009”, isbn13 = “9780374217006”) list() list(book_review_link = “”, first_chapter_link = NA, sunday_review_link = “https://www.nytimes.com/2007/04/22/books/review/Stuart.t.html”, article_chapter_link = NA)
’TIL DEATH by Sharon Sala Sharon Sala 0.00 Harlequin Mira list(isbn10 = “0778314278”, isbn13 = “9780778314271”) list() list(book_review_link = “”, first_chapter_link = “”, sunday_review_link = “”, article_chapter_link = “”)
’TIL DEATH DO US PART A matchmaker in Victorian England turns to a crime novelist for help when she starts receiving a series of disturbingly personalized trinkets. by Amanda Quick Amanda Quick 0.00 Berkley list(isbn10 = c(“069819361X”, “039917446X”), isbn13 = c(“9780698193611”, “9780399174469”)) list(primary_isbn10 = c(“069819361X”, “069819361X”), primary_isbn13 = c(“9780698193611”, “9780698193611”), rank = c(9, 15), list_name = c(“E-Book Fiction”, “Combined Print and E-Book Fiction”), display_name = c(“E-Book Fiction”, “Combined Print & E-Book Fiction”), published_date = c(“2016-05-08”, “2016-05-08”), bestsellers_date = c(“2016-04-23”, “2016-04-23”), weeks_on_list = c(1, 1), ranks_last_week = c(NA, NA), asterisk = c(0, 0), dagger = c(0, 0)) list(book_review_link = “”, first_chapter_link = “”, sunday_review_link = “”, article_chapter_link = “”)
’Til Faith Do Us Part: How Interfaith Marriage is Transforming America NA NA Naomi Schaefer Riley NA 0.00 NA NA list(isbn10 = “0199873747”, isbn13 = “9780199873746”) list() list(book_review_link = “”, first_chapter_link = NA, sunday_review_link = “https://www.nytimes.com/2013/05/26/books/review/til-faith-do-us-part-by-naomi-schaefer-riley.html”, article_chapter_link = NA)
’TIS THE SEASON Two classic holiday stories — “Under the Christmas Tree” (2009) and “Midnight Confessions” (2010) — plus the novella “Backward Glance” (1991). by Robyn Carr Ron Carr 0.00 Harlequin Mira list(isbn10 = “0778316645”, isbn13 = “9780778316640”) list(primary_isbn10 = c(“0778316645”, “0778316645”), primary_isbn13 = c(“9780778316640”, “9780778316640”), rank = c(18, 6), list_name = c(“Mass Market Paperback”, “Mass Market Paperback”), display_name = c(“Paperback Mass-Market Fiction”, “Paperback Mass-Market Fiction”), published_date = c(“2014-11-30”, “2014-11-16”), bestsellers_date = c(“2014-11-15”, “2014-11-01”), weeks_on_list = 0:1, ranks_last_week = c(NA, NA), asterisk = 0:1, dagger = c(0, 0)) list(book_review_link = “”, first_chapter_link = “”, sunday_review_link = “”, article_chapter_link = “”)
——, THAT’S DELICIOUS by Action Bronson with Rachel Wharton Action Bronson with Rachel Wharton 0.00 Abrams list(isbn10 = “1419726552”, isbn13 = “9781419726552”) list(primary_isbn10 = “1419726552”, primary_isbn13 = “9781419726552”, rank = 9, list_name = “Advice How-To and Miscellaneous”, display_name = “Advice, How-To & Miscellaneous”, published_date = “2017-10-01”, bestsellers_date = “2017-09-16”, weeks_on_list = 1, ranks_last_week = NA, asterisk = 0, dagger = 1) list(book_review_link = “”, first_chapter_link = “”, sunday_review_link = “”, article_chapter_link = “”)
…and the Horse He Rode In On: The People V. Kenneth Starr NA NA James Carville NA 0.00 NA NA list(isbn10 = “0684857340”, isbn13 = “9780684857343”) list() list(book_review_link = “”, first_chapter_link = NA, sunday_review_link = “https://www.nytimes.com/1998/10/18/books/preaching-to-the-converted.html”, article_chapter_link = NA)
.HACK G.U. , VOL. 5 This series, set in the future, is about an online, multiplayer game run amok. This volume concludes the tale. by Hamazaki Tatsuya Hamazaki Tatsuya 10.99 TOKYOPOP list() list() list(book_review_link = “”, first_chapter_link = “”, sunday_review_link = “”, article_chapter_link = “”)
1 Ragged Ridge Road NA NA David Adams Richards NA 0.00 NA NA list(isbn10 = “0671003542”, isbn13 = “9780671003548”) list() list(book_review_link = “”, first_chapter_link = NA, sunday_review_link = “https://www.nytimes.com/1997/08/31/books/books-in-brief-fiction-747866.html”, article_chapter_link = NA)
1,000 PLACES TO SEE BEFORE YOU DIE A guide for traveling the world; second edition updated with new entries. by Patricia Schultz Patricia Schultz 0.00 Workman list(isbn10 = c(“0761156860”, “0761104844”), isbn13 = c(“9780761156864”, “9780761104841”)) list(primary_isbn10 = c(“0761156860”, “0761156860”, “0761156860”), primary_isbn13 = c(“9780761156864”, “9780761156864”, “9780761156864”), rank = c(10, 8, 12), list_name = c(“Travel”, “Travel”, “Travel”), display_name = c(“Travel”, “Travel”, “Travel”), published_date = c(“2015-04-12”, “2015-03-15”, “2015-01-11”), bestsellers_date = c(“2015-03-28”, “2015-02-28”, “2014-12-27”), weeks_on_list = c(0, 0, 0), ranks_last_week = c(NA, NA, NA), asterisk = c(0, 0, 0), dagger = c(0, 0, 0)) list(book_review_link = “”, first_chapter_link = “”, sunday_review_link = “”, article_chapter_link = “”)
1,000 RECORDINGS TO HEAR BEFORE YOU DIE Operas, rock albums, blues, classical music, world music and other essentials, from a musician and music journalist. by Tom Moon Tom Moon 0.00 Workman list() list() list(book_review_link = “”, first_chapter_link = “”, sunday_review_link = “”, article_chapter_link = “”)