Skip to content

Commit e5336a4

Browse files
committed
Update documentation
1 parent 5aecf7d commit e5336a4

File tree

5 files changed

+33
-21
lines changed

5 files changed

+33
-21
lines changed

R/geom-text.r

Lines changed: 4 additions & 4 deletions
Original file line numberDiff line numberDiff line change
@@ -10,11 +10,11 @@
1010
#' space they occupy on that plot is not constant in data units: when you
1111
#' resize a plot, labels stay the same size, but the size of the axes changes.
1212
#'
13-
#' \code{geom_text} and \code{geom_label} both add a label for each row in the
13+
#' `geom_text` and `geom_label` both add a label for each row in the
1414
#' data, even if coordinates x, y are set to single values in the call
15-
#' to \code{geom_label} or \code{geom_text}.
16-
#' To add labels at spefcified poitns use \code{\link{annotate}} with
17-
#' \code{annotate(geom = "text", ...)} or \code{annotate(geom = "label", ...)}
15+
#' to `geom_label` or `geom_text`.
16+
#' To add labels at specified points use [annotate()] with
17+
#' `annotate(geom = "text", ...)` or `annotate(geom = "label", ...)`
1818
#'
1919
#' @section Aesthetics:
2020
#' \aesthetics{geom}{text}

R/theme.r

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -539,8 +539,8 @@ calc_element <- function(element, theme, verbose = FALSE) {
539539
#'
540540
#' @param new The child element in the theme hierarchy
541541
#' @param old The parent element in the theme hierarchy
542-
#' @return A modified version of \code{new} updated with the properties of
543-
#' \code{old}
542+
#' @return A modified version of `new` updated with the properties of
543+
#' `old`
544544
#' @keywords internal
545545
#' @export
546546
#' @examples

man/geom_text.Rd

Lines changed: 6 additions & 0 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/ggsf.Rd

Lines changed: 1 addition & 1 deletion
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/ggtheme.Rd

Lines changed: 20 additions & 14 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

0 commit comments

Comments
 (0)