Read from XML

library("xml2")
library("XML")
data = read_xml('https://raw.githubusercontent.com/johnnyboy1287/booksxml/main/Lab8_XMLbooks.xml')

data <-xmlParse(data)

xmldf <- xmlToDataFrame(data)

Read from HTML

library(rvest)
htmlrawdata <- read_html("https://raw.githubusercontent.com/johnnyboy1287/htmlbooks/main/Lab8_books.html")

htmldata <- htmlrawdata %>% html_table(fill=TRUE)

htmldf <- as.data.frame(htmldata)

Read from JSON

library(rjson)

JSONdata<-fromJSON(file="https://raw.githubusercontent.com/johnnyboy1287/BooksJson/main/jsonBook.json")

jsondf <- as.data.frame(JSONdata)

The data frames are more or less similar. Getting them to be so was different for each file type.