In this simple visualization, I added two .png pictures
to an empty plot (ggplot2 of course) and then added a simple text to the
plot.
rm(list = ls())
library(ggplot2)
library(cowplot)
image1 <- "https://gallery.yopriceville.com/var/albums/Free-Clipart-Pictures/Grass-Grounds-Coverings-PNG-Clipart/Valley_Trail_Ground_Transparent_PNG_Image.png?m=1480564502"
image2 <- "http://r-studio.ir/wp-content/uploads/2019/07/New-logo-Transparent.png"
ctext <- c('نوروز','1402','مبارک باد')
ftext <- 'امیدوارم سال جدید سرشار از اتفاقات خوب باشه براتون'
data <- data.frame(colors=rep(c('red','green','blue')),
ctext=ctext,ftext=ftext,
y=quantile(1:6,probs=c(0.75,0.45,0.25)))
p <- ggplot(data) +
geom_text(aes(x = 4, y = y, label = ctext, colour=colors), size=28, show.legend=F, family='mono') +
# geom_text(aes(x = 4, y = 0), label = ftext, colour='white', size=10, family='serif') +
ylim(0,5)+
theme_void()
p
ggdraw() +
draw_image(image1,x=0, y=-0.34, scale =1) +
draw_image(image2,x=0.42, y=0.4, scale =0.2) +
draw_plot(p)