Box plot: How to keep Y axis value as % and give high low rang in plot itself also?

I have researched in google and other related sites but did not get any ideas to keep the Y axis value as a percentage, when loading the data it's converting as number. Also can I add the high and low values of a box like below? Your reply will help me a lot. Thank you.

My Codes:
boxplot(Diminution~Area,data=Land, main="Paired sales",
xlab="Affected Area", ylab="Diminution of Price(%)")

Data

dput(head(Land))
structure(list(Diminution = c(-0.755354402508729, -0.97014594368672,
-0.601592445363365, -0.452736499921559, -0.283667621776504),
Area = c("Building", "Building", "Land", "Land", "Land")), row.names = c(NA,
-5L), class = c("tbl_df", "tbl", "data.frame"))

Not sure if this is what you're after. It is done with ggplot2.

library(tidyverse)

Land <- structure(list(Diminution = c(-0.755354402508729, -0.97014594368672,
                                      -0.601592445363365, -0.452736499921559, -0.283667621776504),
                       Area = c("Building", "Building", "Land", "Land", "Land")), row.names = c(NA,
                                                                                                -5L), class = c("tbl_df", "tbl", "data.frame"))

ggplot(Land, aes(Area, Diminution)) +
  geom_boxplot() +
  scale_y_continuous(labels = scales::percent_format()) +
  labs(x = "Affected Area",
       y = "Diminution of Price",
       title = "Paired sales")
  

This topic was automatically closed 42 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.