library(ggplot2)
data <- data.frame(x = 7:3,         # Create example data
                   y = 1:5)
data  
##   x y
## 1 7 1
## 2 6 2
## 3 5 3
## 4 4 4
## 5 3 5
ggp <- ggplot(data, aes(x, y)) +    # Create ggplot2 plot
  geom_point()
ggp +                               # Add partly bold/italic text element to plot
  annotate("text", x = 4.5, y = 2.2, size = 5,
           label = "bold(MM)~italic(R) == 0.8",
           parse = TRUE) +
  geom_text(aes(label="NULL%~~%Linear",x=5,y=4),parse=T, color = "red") +
  annotate("text", x = 5, y = 3, label = "Model~~R^2~`=`~0.4",
           parse = TRUE)

ggplot(mtcars, aes(mpg, disp))+
  geom_point()+
  annotate("text",25,400, label=("'Large fish' >= 45 ~ 'cm'"), parse=TRUE, hjust=0)

#####https://stackoverflow.com/questions/43587386/annotate-with-greater-than-or-equal-to-in-ggplot
#https://statisticsglobe.com/add-bold-and-italic-text-to-ggplot2-plot-in-r
#https://stackoverflow.com/questions/63562677/ggplotie-with-parse-t-equal-symbol-problem