webscrapping data

Hi

I want to retrieve data from this link.

[UFJF - Programas de Ingresso]

By rvest package, please guide me how can I retrieve data from this link into RStudio automatically by coding.

Thanks

Good. What have you tried? The table looks a bit tricky being in a dataTables_wrapper.

This is the top line anyway:

library(tidyverse)
library(rvest)

url <- "http://www4.vestibular.ufjf.br/2021/notaspism1/A.html"

read_html(url) %>%
  html_nodes('table') %>% 
  .[2] %>%
  html_table(fill = TRUE) %>%
  as.data.frame()

not working for the data in table

Yeah I know. It is just the header. It might be useful for you or someone else (or me later).

Also, just post the code, not the screenshot.

can you please help me to retrieve data?

Did you try anything yourself? Post what you tried.

library(XML)
library(rvest)
simple <- read_html("http://www4.vestibular.ufjf.br/2021/notaspism1/H.html")

  
tbls <- html_nodes(simple, "table")
head(tbls)


tbls2_ls <- list()

  tbls2_ls$example <- simple %>%
  html_nodes("#example") %>% 
  html_table(fill = TRUE) %>%
  .[[1]]

str(tbls2_ls)

This topic was automatically closed 21 days after the last reply. New replies are no longer allowed.

If you have a query related to it or one of the replies, start a new topic and refer back with a link.