The circle plot is full on big screens but gets cropped on small screens.

The circle plot appears well on larger screens like laptops, but when viewed on smaller screens like mobile devices, some circle points are not fully displayed; they are cut off, resulting in only half of the circle being visible. How can I address this issue to ensure the entire circle is visible on smaller screens?

R_code<-
library(ggplot2)
library(readr)
last4Months <- read_csv("E:/WORK/NOVEMBER/05.11.23(Problem solve)/last4Months.csv")
last4Months$WeekDay <- as.factor(last4Months$WeekDay)

ggplot(data = last4Months, mapping = aes_string(x = colnames(last4Months)[1], y = colnames(last4Months)[4])) + 
  geom_point(aes(color = Month), size = 1.5) + 
  geom_point(aes(size = DayNr, color = Month), alpha=1/3) + 
  facet_wrap(~WeekDay, ncol = 3) + 
  scale_x_continuous(breaks = c(1,2,3,4,5,6,7,8,9,10,11,12), labels = c("Jan","Feb","Mar","Apr","May","Jun","Jul","Aug","Sep","Oct","Nov","Dec")) +
  theme(
    plot.title = element_text(size = rel(1)), 
    legend.title = element_text(size = rel(1)), 
    legend.position = "top",
  ) +
  guides(x = guide_axis(angle = 30), color = "none")

p-1-copy

You can't guarantee that things will always be visible, but you can make it much more likely by increasing the axis expansion. See the expand argument for scale_x_continuous.

E.g.

+ scale_x_continuous(
    breaks = c(1,2,3,4,5,6,7,8,9,10,11,12), 
    labels =  c("Jan","Feb","Mar","Apr","May","Jun","Jul","Aug","Sep","Oct","Nov","Dec"),
    expand = expansion(mult = 0.2)
) +