library(ggplot2)
## Warning: le package 'ggplot2' a été compilé avec la version R 4.2.3
ggplot(data.frame(x = c(-3, 3)), aes(x)) +
  stat_function(fun = dnorm) + 
  stat_function(fun = dnorm, 
                xlim = c(1,3),
                geom = "area") + ylab("") +xlab("") +
  geom_text(x=-2.5, y=-0.01, label="Gain")+
  geom_text(x=2.5, y=-0.01, label="Perte")+
  geom_text(x=1, y=-0.01, label="V")+
  geom_text(x=2.3, y=0.18, label="(1-x%)")+
  geom_segment(aes(x = 2, y = 0.15, xend = 1.3, yend = 0.08),
               size=0.5,arrow = arrow(type="closed",length = unit(4, "mm")))
## Warning: Using `size` aesthetic for lines was deprecated in ggplot2 3.4.0.
## ℹ Please use `linewidth` instead.
## This warning is displayed once every 8 hours.
## Call `lifecycle::last_lifecycle_warnings()` to see where this warning was
## generated.
## Warning in geom_segment(aes(x = 2, y = 0.15, xend = 1.3, yend = 0.08), size = 0.5, : All aesthetics have length 1, but the data has 2 rows.
## ℹ Did you mean to use `annotate()`?