Nothing
#'@include utilities.R ggpar.R ggpie.R
NULL
#'Donut chart
#'@description Create a donut chart.
#'@inheritParams ggboxplot
#'@inheritParams ggplot2::geom_errorbar
#'@param x variable containing values for drawing.
#'@param label variable specifying the label of each slice.
#'@param lab.pos character specifying the position for labels. Allowed values
#' are "out" (for outside) or "in" (for inside).
#'@param lab.adjust numeric value, used to adjust label position when lab.pos =
#' "in". Increase or decrease this value to see the effect.
#'@param lab.font a vector of length 3 indicating respectively the size (e.g.:
#' 14), the style (e.g.: "plain", "bold", "italic", "bold.italic") and the
#' color (e.g.: "red") of label font. For example \emph{lab.font= c(4, "bold",
#' "red")}.
#'@param font.family character vector specifying font family.
#'@param color,fill outline and fill colors.
#'@param ... other arguments to be passed to be passed to ggpar().
#'@details The plot can be easily customized using the function ggpar(). Read
#' ?ggpar for changing: \itemize{ \item main title and axis labels: main, xlab,
#' ylab \item axis limits: xlim, ylim (e.g.: ylim = c(0, 30)) \item axis
#' scales: xscale, yscale (e.g.: yscale = "log2") \item color palettes: palette
#' = "Dark2" or palette = c("gray", "blue", "red") \item legend title, labels
#' and position: legend = "right" \item plot orientation : orientation =
#' c("vertical", "horizontal", "reverse") }
#'@seealso \code{\link{ggpar}}, \code{\link{ggpie}}
#' @examples
#'
#' # Data: Create some data
#' # +++++++++++++++++++++++++++++++
#'
#' df <- data.frame(
#' group = c("Male", "Female", "Child"),
#' value = c(25, 25, 50))
#'
#' head(df)
#'
#'
#' # Basic pie charts
#' # ++++++++++++++++++++++++++++++++
#'
#' ggdonutchart(df, "value", label = "group")
#'
#'
#' # Change color
#' # ++++++++++++++++++++++++++++++++
#'
#' # Change fill color by group
#' # set line color to white
#' # Use custom color palette
#' ggdonutchart(df, "value", label = "group",
#' fill = "group", color = "white",
#' palette = c("#00AFBB", "#E7B800", "#FC4E07") )
#'
#'
#' # Change label
#' # ++++++++++++++++++++++++++++++++
#'
#' # Show group names and value as labels
#' labs <- paste0(df$group, " (", df$value, "%)")
#' ggdonutchart(df, "value", label = labs,
#' fill = "group", color = "white",
#' palette = c("#00AFBB", "#E7B800", "#FC4E07"))
#'
#' # Change the position and font color of labels
#' ggdonutchart(df, "value", label = labs,
#' lab.pos = "in", lab.font = "white",
#' fill = "group", color = "white",
#' palette = c("#00AFBB", "#E7B800", "#FC4E07"))
#'
#'
#'
#'@export
ggdonutchart <- function(
data, x, label = x, lab.pos = c("out", "in"), lab.adjust = 0,
lab.font = c(4, "plain", "black"), font.family = "",
color = "black", fill = "white", palette = NULL,
size = NULL, ggtheme = theme_pubr(), ...
)
{
lab.pos <- match.arg(lab.pos)
lab.font <- .parse_font(lab.font) %>%
.check_pie_labfont()
# We should order the data in desc order. Because,
# in stacked bar plot the order of factor levels are reversed
# Very important to have the label in the right place
group.vars <- intersect(c(fill, color), names(data))
if(length(group.vars) != 0){
group.val <- dplyr::pull(data, group.vars[1])
data <- data %>% dplyr::arrange(dplyr::desc(group.val))
}
# Label y coordinates when placed inside slices
.x <- dplyr::pull(data, x)
data <- data %>%
dplyr::mutate(
.lab.ypos. = cumsum(.x) -0.5*.x -lab.adjust
)
if(length(label) > 1 & length(label) != nrow(data))
stop("label should be of the same length as data")
else if(length(label) > 1){
# 1. Add label column
data <- data %>%
dplyr::mutate(.label. = label)
label <- ".label."
}
p <- ggplot(data, create_aes(list(x = 2, y = x))) +
geom_exec(
geom_bar, data, stat = "identity",
fill = fill, color = color, size = size
)
p <- ggpar(
p, palette = palette,
ggtheme = ggtheme,
font.family = font.family, ...
) +
coord_polar(
theta = "y", start = 0, clip = "off"
) +
ggtheme + .remove_axis()
# Annotate pie slice
#:::::::::::::::::::::::::::::::::::
if(!is.null(label)){
# Label each slice at the middle of the slice
if(lab.pos == "out"){
p <- p + scale_y_continuous(
breaks = cumsum(.x) - .x/2,
labels = dplyr::pull(data, label)
) +
ggplot2::theme(axis.text.x = element_text(
face = lab.font$face, color = lab.font$color, size = 2.5*lab.font$size,
family = font.family
))
}
# Compute the cumulative sum as label ypos
if(lab.pos == "in"){
p <- p + geom_text(
create_aes(list(y = ".lab.ypos.", label = label)),
size = lab.font$size, fontface = lab.font$face,
colour = lab.font$color, family = font.family
)+
clean_theme()
}
}
p + xlim(0.5, 2.5)
}
Any scripts or data that you put into this service are public.
Add the following code to your website.
For more information on customizing the embed code, read Embedding Snippets.