library(ggplot2)
## Warning: le package 'ggplot2' a été compilé avec la version R 4.2.3
fs = function(x,epsilon,delta) dnorm(sinh(delta*asinh(x)-epsilon))*delta*cosh(delta*asinh(x)-epsilon)/sqrt(1+x^2)
vec = seq(-5,5,0.001)
x <- seq(-6,1, length=1000)
hx <- dnorm(x,mean=-2, sd=1)
plot(x, hx, type="l", xlab="Perte", ylab="probabilité")
points(vec,fs(vec,-2,1.3),type="l",col="red")
text(0.3, 0.2, expression("L"[h]))
arrows(0,0,0,0.3)
abline(v=-2,lty='dotted')  
text(-1.9,0.01,~mu)
arrows(0.2,0.2,-0.5,0.15)
text(-4,0.3, expression("L"[h^"'"]))
arrows(-4,0.25,-3.2,0.2)