How to create a pie chart from a dataset

That is not a reprex, that is a link to an unnecessarily large .csv file (please read the guide), here is a basic example of how to do a pie chart with ggplot2 and one of your variables.

If you need further help, please provide a proper REPRoducible EXample (reprex) illustrating your issue.

library(tidyverse)

sample_data <- read_delim("https://www.dropbox.com/s/ma5wqmegy6ud8q1/dataset%20example.csv?dl=1", delim = ";")

sample_data %>%
    count(Pr) %>% 
    mutate(Pr = factor(Pr), percentage = n / sum(n)) %>% 
    ggplot(aes(x = "", percentage, fill = Pr)) +
    geom_col(color="white") +
    coord_polar(theta = "y", start=0) +
    theme_void()

Created on 2020-01-13 by the reprex package (v0.3.0.9000)