How to extract tables of Injury Compensation: Italy

Federica Gazzelloni
17 February 2021

Italy tables for injury compensation sources:

How to extract the tables from sources

Load necessary libraries:

library(tidyverse)
library(tabulizer)

Locate areas of the document for extracting the tables:

# rm_tables<-
#     locate_areas("http://www.tribunale.roma.it/allegatinews/A_24405.pdf",
#     pages = c(9,11,12,13,16))

Extract the table:

roma_table <- 
  extract_tables("http://www.tribunale.roma.it/allegatinews/A_24405.pdf",
                            output = "data.frame",
                            pages = c(9),
                            area = list(c(89, 57, 304, 480)),
                            guess = FALSE)


roma_table_clean <- reduce(roma_table, bind_rows)


table1<-roma_table_clean[3:12,1:3]

names(table1)<-c("Biological_damage",
                 "not_pecuniary_Damage",
                 "Moral_damage_Range")

rownames(table1) <- NULL

Table 1

Biological_damage not_pecuniary_Damage Moral_damage_Range
fino al 10% 12,5% dal 5% al 20%
dal 11% al 20% 20% dal 10% al 30%
dal 21% al 30% 25% dal 12,5% al 37,5%
dal 31% al 40% 30% dal 15% al 45%
dal 41% al 50% 35% dal 17,5% al 52,5%
dal 51% al 60% 40% dal 20% al 60%
dal 61% al 70% 45% dal 22,5% al 67,5%
dal 71% al 80% 50% dal 25% al 75%
dal 81% al 90% 55% dal 27,5% al 82,5%
dal 91% al 100% 60% dal 30% al 90%