Remove bold from plot title

Hello,

I have a plot, and I want to remove the bold from the title that seems to appear automatically... Any help would be appreciated. Thanks in advance


relevance_plot <- relevance_data %>% 
  ggplot(aes(x = Condition, y = relevance_comp)) +
  labs(title = "Figure 5. Mean average relevance rating for Relevance Scale question and condition.", x = "Text Condition", y = "Mean Relavance Rating") +
  theme_cowplot()
relevance_plot +
  geom_point(position = "jitter")
relevance_plot + 
  geom_point(stat = "summary",
           fun.y = "mean")
relevance_plot + 
  geom_point(stat = "summary",
           fun.y = "mean",
           size = 4, 
           shape = 21,
           fill = "black") +
  ylim(0, 7) +
  stat_summary(fun.data="mean_cl_boot",geom="errorbar", width = .25)

relevance_plot_final <- relevance_plot + 
  stat_summary(fun.data="mean_cl_boot",geom="errorbar", width = .25) +
  geom_point(stat = "summary",
           fun.y = "mean",
           size = 4, 
           shape = 21,
           fill = "black") +
  plot(font.main = 1, main = "Foo") +
  ylim(0, 7) +
  theme(text=element_text(family="Times New Roman", size=12))
relevance_plot_final

Hi, can you provide a reproducible example of relevance_data? It will help with working out what your graph looks like.

Indeed the bold comes from the theme_cowplot().
You need to add:

plot.title = element_text(face = "plain")

to the theme().

library(ggplot2)
library(cowplot)

ggplot(ToothGrowth, aes(x = interaction(supp, dose), 
                        y = len)) +
  geom_point() +
  theme_cowplot() + 
  geom_point(stat = "summary",
             fun = "mean",
             size = 4, 
             shape = 21,
             fill = "black") +
  stat_summary(fun.data="mean_cl_boot",geom="errorbar", width = .25) +
  labs(title = "Figure 5. Mean average relevance rating for Relevance Scale question and condition.", 
       x = "Text Condition", 
       y = "Mean Relavance Rating") +
  theme(plot.title = element_text(face = "plain"))

Thank you a lot for the help it worked !

This topic was automatically closed 21 days after the last reply. New replies are no longer allowed.

If you have a query related to it or one of the replies, start a new topic and refer back with a link.