Yes, I was looking into that, however, I'm not sure what would be the xlim and what would be the ylim, given that it's a GIS plot.
Here is the code I have currently. Where would I set the limits for my continuous data?
p1 <- all %>%
filter(DEPTH_CLASS == "UV") %>%
ggplot() +
geom_sf(data=lm, fill="white") + # Lake Michigan shapefile
geom_sf(aes(size = Density, color=Density)) + # Density plots
scale_color_gradientn(colors = c("#FFFFCC", "#FFEDA0", "#FED976", "#FEB24C", "#FD8D3C", "#FC4E2A", "#E31A1C", "#B10026")) + # Where do I go from here?
theme(axis.text.x = element_blank(), # remove x-axis text
axis.text.y = element_blank(), # remove y-axis text
axis.ticks = element_blank(), # remove axis ticks
axis.title.x = element_text(size=18), # remove x-axis labels
axis.title.y = element_text(size=18), # remove y-axis labels
panel.background = element_blank(),
panel.grid.major = element_blank(), #remove major-grid labels
panel.grid.minor = element_blank(), #remove minor-grid labels
plot.background = element_blank(),
legend.key.size = unit(0.25, 'cm')) +
guides(color='legend', size='legend') +
labs(color = bquote('Indiv'~m^-3),
size = bquote('Indiv'~m^-3)) +
ggtitle("UV") +
theme(plot.title = element_text(size = 10,
hjust = 0.5))