diff --git a/R/utilities-help.R b/R/utilities-help.R index d0c0a15576..98680e9ad3 100644 --- a/R/utilities-help.R +++ b/R/utilities-help.R @@ -90,7 +90,7 @@ rd_orientation <- function() { c( "@section Orientation: ", paste( - 'This geom treats each axis differently and, thus, can thus have two orientations.', + 'This geom treats each axis differently and, thus, can have two orientations.', 'Often the orientation is easy to deduce from a combination of the given', 'mappings and the types of positional scales in use. Thus, ggplot2 will by', 'default try to guess which orientation the layer should have. Under rare', diff --git a/man/geom_bar.Rd b/man/geom_bar.Rd index c6573959ae..685437df63 100644 --- a/man/geom_bar.Rd +++ b/man/geom_bar.Rd @@ -171,7 +171,7 @@ bars and then standardising each bar to have the same height. } \section{Orientation}{ -This geom treats each axis differently and, thus, can thus have two orientations. Often the orientation is easy to deduce from a combination of the given mappings and the types of positional scales in use. Thus, ggplot2 will by default try to guess which orientation the layer should have. Under rare circumstances, the orientation is ambiguous and guessing may fail. In that case the orientation can be specified directly using the \code{orientation} parameter, which can be either \code{"x"} or \code{"y"}. The value gives the axis that the geom should run along, \code{"x"} being the default orientation you would expect for the geom. +This geom treats each axis differently and, thus, can have two orientations. Often the orientation is easy to deduce from a combination of the given mappings and the types of positional scales in use. Thus, ggplot2 will by default try to guess which orientation the layer should have. Under rare circumstances, the orientation is ambiguous and guessing may fail. In that case the orientation can be specified directly using the \code{orientation} parameter, which can be either \code{"x"} or \code{"y"}. The value gives the axis that the geom should run along, \code{"x"} being the default orientation you would expect for the geom. } \section{Computed variables}{ diff --git a/man/geom_boxplot.Rd b/man/geom_boxplot.Rd index 9556904fd3..04365a23f6 100644 --- a/man/geom_boxplot.Rd +++ b/man/geom_boxplot.Rd @@ -198,7 +198,7 @@ the US spelling will take precedence. } \section{Orientation}{ -This geom treats each axis differently and, thus, can thus have two orientations. Often the orientation is easy to deduce from a combination of the given mappings and the types of positional scales in use. Thus, ggplot2 will by default try to guess which orientation the layer should have. Under rare circumstances, the orientation is ambiguous and guessing may fail. In that case the orientation can be specified directly using the \code{orientation} parameter, which can be either \code{"x"} or \code{"y"}. The value gives the axis that the geom should run along, \code{"x"} being the default orientation you would expect for the geom. +This geom treats each axis differently and, thus, can have two orientations. Often the orientation is easy to deduce from a combination of the given mappings and the types of positional scales in use. Thus, ggplot2 will by default try to guess which orientation the layer should have. Under rare circumstances, the orientation is ambiguous and guessing may fail. In that case the orientation can be specified directly using the \code{orientation} parameter, which can be either \code{"x"} or \code{"y"}. The value gives the axis that the geom should run along, \code{"x"} being the default orientation you would expect for the geom. } \section{Summary statistics}{ diff --git a/man/geom_density.Rd b/man/geom_density.Rd index 30ec7391c7..b0138fa538 100644 --- a/man/geom_density.Rd +++ b/man/geom_density.Rd @@ -172,7 +172,7 @@ data that comes from an underlying smooth distribution. } \section{Orientation}{ -This geom treats each axis differently and, thus, can thus have two orientations. Often the orientation is easy to deduce from a combination of the given mappings and the types of positional scales in use. Thus, ggplot2 will by default try to guess which orientation the layer should have. Under rare circumstances, the orientation is ambiguous and guessing may fail. In that case the orientation can be specified directly using the \code{orientation} parameter, which can be either \code{"x"} or \code{"y"}. The value gives the axis that the geom should run along, \code{"x"} being the default orientation you would expect for the geom. +This geom treats each axis differently and, thus, can have two orientations. Often the orientation is easy to deduce from a combination of the given mappings and the types of positional scales in use. Thus, ggplot2 will by default try to guess which orientation the layer should have. Under rare circumstances, the orientation is ambiguous and guessing may fail. In that case the orientation can be specified directly using the \code{orientation} parameter, which can be either \code{"x"} or \code{"y"}. The value gives the axis that the geom should run along, \code{"x"} being the default orientation you would expect for the geom. } \section{Computed variables}{ diff --git a/man/geom_histogram.Rd b/man/geom_histogram.Rd index b298a092a2..c04fd428db 100644 --- a/man/geom_histogram.Rd +++ b/man/geom_histogram.Rd @@ -217,7 +217,7 @@ in between each bar. } \section{Orientation}{ -This geom treats each axis differently and, thus, can thus have two orientations. Often the orientation is easy to deduce from a combination of the given mappings and the types of positional scales in use. Thus, ggplot2 will by default try to guess which orientation the layer should have. Under rare circumstances, the orientation is ambiguous and guessing may fail. In that case the orientation can be specified directly using the \code{orientation} parameter, which can be either \code{"x"} or \code{"y"}. The value gives the axis that the geom should run along, \code{"x"} being the default orientation you would expect for the geom. +This geom treats each axis differently and, thus, can have two orientations. Often the orientation is easy to deduce from a combination of the given mappings and the types of positional scales in use. Thus, ggplot2 will by default try to guess which orientation the layer should have. Under rare circumstances, the orientation is ambiguous and guessing may fail. In that case the orientation can be specified directly using the \code{orientation} parameter, which can be either \code{"x"} or \code{"y"}. The value gives the axis that the geom should run along, \code{"x"} being the default orientation you would expect for the geom. } \section{Aesthetics}{ diff --git a/man/geom_linerange.Rd b/man/geom_linerange.Rd index d064de5ebe..3f96ae3448 100644 --- a/man/geom_linerange.Rd +++ b/man/geom_linerange.Rd @@ -190,7 +190,7 @@ Various ways of representing a vertical interval defined by \code{x}, } \section{Orientation}{ -This geom treats each axis differently and, thus, can thus have two orientations. Often the orientation is easy to deduce from a combination of the given mappings and the types of positional scales in use. Thus, ggplot2 will by default try to guess which orientation the layer should have. Under rare circumstances, the orientation is ambiguous and guessing may fail. In that case the orientation can be specified directly using the \code{orientation} parameter, which can be either \code{"x"} or \code{"y"}. The value gives the axis that the geom should run along, \code{"x"} being the default orientation you would expect for the geom. +This geom treats each axis differently and, thus, can have two orientations. Often the orientation is easy to deduce from a combination of the given mappings and the types of positional scales in use. Thus, ggplot2 will by default try to guess which orientation the layer should have. Under rare circumstances, the orientation is ambiguous and guessing may fail. In that case the orientation can be specified directly using the \code{orientation} parameter, which can be either \code{"x"} or \code{"y"}. The value gives the axis that the geom should run along, \code{"x"} being the default orientation you would expect for the geom. } \examples{ diff --git a/man/geom_path.Rd b/man/geom_path.Rd index 6e22325673..2f9c76ccee 100644 --- a/man/geom_path.Rd +++ b/man/geom_path.Rd @@ -181,7 +181,7 @@ corresponds to a single case which provides the start and end coordinates. } \section{Orientation}{ -This geom treats each axis differently and, thus, can thus have two orientations. Often the orientation is easy to deduce from a combination of the given mappings and the types of positional scales in use. Thus, ggplot2 will by default try to guess which orientation the layer should have. Under rare circumstances, the orientation is ambiguous and guessing may fail. In that case the orientation can be specified directly using the \code{orientation} parameter, which can be either \code{"x"} or \code{"y"}. The value gives the axis that the geom should run along, \code{"x"} being the default orientation you would expect for the geom. +This geom treats each axis differently and, thus, can have two orientations. Often the orientation is easy to deduce from a combination of the given mappings and the types of positional scales in use. Thus, ggplot2 will by default try to guess which orientation the layer should have. Under rare circumstances, the orientation is ambiguous and guessing may fail. In that case the orientation can be specified directly using the \code{orientation} parameter, which can be either \code{"x"} or \code{"y"}. The value gives the axis that the geom should run along, \code{"x"} being the default orientation you would expect for the geom. } \section{Missing value handling}{ diff --git a/man/geom_ribbon.Rd b/man/geom_ribbon.Rd index 9e98df0e4e..19550f0675 100644 --- a/man/geom_ribbon.Rd +++ b/man/geom_ribbon.Rd @@ -187,7 +187,7 @@ be used instead. } \section{Orientation}{ -This geom treats each axis differently and, thus, can thus have two orientations. Often the orientation is easy to deduce from a combination of the given mappings and the types of positional scales in use. Thus, ggplot2 will by default try to guess which orientation the layer should have. Under rare circumstances, the orientation is ambiguous and guessing may fail. In that case the orientation can be specified directly using the \code{orientation} parameter, which can be either \code{"x"} or \code{"y"}. The value gives the axis that the geom should run along, \code{"x"} being the default orientation you would expect for the geom. +This geom treats each axis differently and, thus, can have two orientations. Often the orientation is easy to deduce from a combination of the given mappings and the types of positional scales in use. Thus, ggplot2 will by default try to guess which orientation the layer should have. Under rare circumstances, the orientation is ambiguous and guessing may fail. In that case the orientation can be specified directly using the \code{orientation} parameter, which can be either \code{"x"} or \code{"y"}. The value gives the axis that the geom should run along, \code{"x"} being the default orientation you would expect for the geom. } \examples{ diff --git a/man/geom_smooth.Rd b/man/geom_smooth.Rd index 2ce488a9d1..da1635a784 100644 --- a/man/geom_smooth.Rd +++ b/man/geom_smooth.Rd @@ -191,7 +191,7 @@ scale and then back-transformed to the response scale. } \section{Orientation}{ -This geom treats each axis differently and, thus, can thus have two orientations. Often the orientation is easy to deduce from a combination of the given mappings and the types of positional scales in use. Thus, ggplot2 will by default try to guess which orientation the layer should have. Under rare circumstances, the orientation is ambiguous and guessing may fail. In that case the orientation can be specified directly using the \code{orientation} parameter, which can be either \code{"x"} or \code{"y"}. The value gives the axis that the geom should run along, \code{"x"} being the default orientation you would expect for the geom. +This geom treats each axis differently and, thus, can have two orientations. Often the orientation is easy to deduce from a combination of the given mappings and the types of positional scales in use. Thus, ggplot2 will by default try to guess which orientation the layer should have. Under rare circumstances, the orientation is ambiguous and guessing may fail. In that case the orientation can be specified directly using the \code{orientation} parameter, which can be either \code{"x"} or \code{"y"}. The value gives the axis that the geom should run along, \code{"x"} being the default orientation you would expect for the geom. } \section{Computed variables}{ diff --git a/man/geom_violin.Rd b/man/geom_violin.Rd index 571329a598..f2721169e3 100644 --- a/man/geom_violin.Rd +++ b/man/geom_violin.Rd @@ -184,7 +184,7 @@ boxplot. } \section{Orientation}{ -This geom treats each axis differently and, thus, can thus have two orientations. Often the orientation is easy to deduce from a combination of the given mappings and the types of positional scales in use. Thus, ggplot2 will by default try to guess which orientation the layer should have. Under rare circumstances, the orientation is ambiguous and guessing may fail. In that case the orientation can be specified directly using the \code{orientation} parameter, which can be either \code{"x"} or \code{"y"}. The value gives the axis that the geom should run along, \code{"x"} being the default orientation you would expect for the geom. +This geom treats each axis differently and, thus, can have two orientations. Often the orientation is easy to deduce from a combination of the given mappings and the types of positional scales in use. Thus, ggplot2 will by default try to guess which orientation the layer should have. Under rare circumstances, the orientation is ambiguous and guessing may fail. In that case the orientation can be specified directly using the \code{orientation} parameter, which can be either \code{"x"} or \code{"y"}. The value gives the axis that the geom should run along, \code{"x"} being the default orientation you would expect for the geom. } \section{Computed variables}{ diff --git a/man/stat_summary.Rd b/man/stat_summary.Rd index ad45350819..65f3bb049a 100644 --- a/man/stat_summary.Rd +++ b/man/stat_summary.Rd @@ -181,7 +181,7 @@ aggregate. } \section{Orientation}{ -This geom treats each axis differently and, thus, can thus have two orientations. Often the orientation is easy to deduce from a combination of the given mappings and the types of positional scales in use. Thus, ggplot2 will by default try to guess which orientation the layer should have. Under rare circumstances, the orientation is ambiguous and guessing may fail. In that case the orientation can be specified directly using the \code{orientation} parameter, which can be either \code{"x"} or \code{"y"}. The value gives the axis that the geom should run along, \code{"x"} being the default orientation you would expect for the geom. +This geom treats each axis differently and, thus, can have two orientations. Often the orientation is easy to deduce from a combination of the given mappings and the types of positional scales in use. Thus, ggplot2 will by default try to guess which orientation the layer should have. Under rare circumstances, the orientation is ambiguous and guessing may fail. In that case the orientation can be specified directly using the \code{orientation} parameter, which can be either \code{"x"} or \code{"y"}. The value gives the axis that the geom should run along, \code{"x"} being the default orientation you would expect for the geom. } \section{Summary functions}{