Skip to content

Commit 1df1e82

Browse files
committed
Replace tabs with spaces
1 parent c718e2d commit 1df1e82

File tree

3 files changed

+23
-23
lines changed

3 files changed

+23
-23
lines changed

R/autoplot.r

Lines changed: 3 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -10,12 +10,12 @@
1010
#' @export
1111
#' @seealso \code{\link{ggplot}} and \code{\link{fortify}}
1212
autoplot <- function(object, ...) {
13-
UseMethod("autoplot")
13+
UseMethod("autoplot")
1414
}
1515

1616
#' @S3method autoplot default
1717
autoplot.default <- function(object, ...) {
18-
error.msg <- paste("Objects of type",class(object),"not supported by autoplot. Please use qplot() or ggplot() instead.\n")
19-
stop(error.msg, call.=FALSE)
18+
error.msg <- paste("Objects of type",class(object),"not supported by autoplot. Please use qplot() or ggplot() instead.\n")
19+
stop(error.msg, call.=FALSE)
2020
}
2121

R/ggplot2.r

Lines changed: 15 additions & 15 deletions
Original file line numberDiff line numberDiff line change
@@ -36,13 +36,13 @@ NULL
3636
#' This dataset was produced from US economic time series data available from \url{http://research.stlouisfed.org/fred2}.
3737
#'
3838
#' \itemize{
39-
#' \item date. Month of data collection
39+
#' \item date. Month of data collection
4040
#'
41-
#' \item psavert, personal savings rate, \url{http://research.stlouisfed.org/fred2/series/PSAVERT/}
42-
#' \item pce, personal consumption expenditures, in billions of dollars, \url{http://research.stlouisfed.org/fred2/series/PCE}
43-
#' \item unemploy, number of unemployed in thousands, \url{http://research.stlouisfed.org/fred2/series/UNEMPLOY}
44-
#' \item uempmed, median duration of unemployment, in week, \url{http://research.stlouisfed.org/fred2/series/UEMPMED}
45-
#' \item pop, total population, in thousands, \url{http://research.stlouisfed.org/fred2/series/POP}
41+
#' \item psavert, personal savings rate, \url{http://research.stlouisfed.org/fred2/series/PSAVERT/}
42+
#' \item pce, personal consumption expenditures, in billions of dollars, \url{http://research.stlouisfed.org/fred2/series/PCE}
43+
#' \item unemploy, number of unemployed in thousands, \url{http://research.stlouisfed.org/fred2/series/UNEMPLOY}
44+
#' \item uempmed, median duration of unemployment, in week, \url{http://research.stlouisfed.org/fred2/series/UEMPMED}
45+
#' \item pop, total population, in thousands, \url{http://research.stlouisfed.org/fred2/series/POP}
4646
#'
4747
#' }
4848
#'
@@ -111,15 +111,15 @@ NULL
111111
#' Movies were selected for inclusion if they had a known length and had been rated by at least one imdb user. The data set contains the following fields:
112112
#'
113113
#' \itemize{
114-
#' \item title. Title of the movie.
115-
#' \item year. Year of release.
116-
#' \item budget. Total budget (if known) in US dollars
117-
#' \item length. Length in minutes.
118-
#' \item rating. Average IMDB user rating.
119-
#' \item votes. Number of IMDB users who rated this movie.
120-
#' \item r1-10. Multiplying by ten gives percentile (to nearest 10\%) of users who rated this movie a 1.
121-
#' \item mpaa. MPAA rating.
122-
#' \item action, animation, comedy, drama, documentary, romance, short. Binary variables representing if movie was classified as belonging to that genre.
114+
#' \item title. Title of the movie.
115+
#' \item year. Year of release.
116+
#' \item budget. Total budget (if known) in US dollars
117+
#' \item length. Length in minutes.
118+
#' \item rating. Average IMDB user rating.
119+
#' \item votes. Number of IMDB users who rated this movie.
120+
#' \item r1-10. Multiplying by ten gives percentile (to nearest 10\%) of users who rated this movie a 1.
121+
#' \item mpaa. MPAA rating.
122+
#' \item action, animation, comedy, drama, documentary, romance, short. Binary variables representing if movie was classified as belonging to that genre.
123123
#' }
124124
#'
125125
#' @docType data

R/stat-sum.r

Lines changed: 5 additions & 5 deletions
Original file line numberDiff line numberDiff line change
@@ -15,12 +15,12 @@
1515
#' # By default, all categorical variables in the plot form grouping
1616
#' # variables, and the default behavior in stat_sum is to show the
1717
#' # proportion. Specifying stat_sum with no group identifier leads to
18-
#' # a plot which is not meaningful:
18+
#' # a plot which is not meaningful:
1919
#' d + stat_sum()
20-
#' # To correct this problem and achieve a more desirable plot, we need
21-
#' # to specify which group the proportion is to be calculated over.
22-
#' # There are several ways to do this:
23-
#'
20+
#' # To correct this problem and achieve a more desirable plot, we need
21+
#' # to specify which group the proportion is to be calculated over.
22+
#' # There are several ways to do this:
23+
#'
2424
#' # by overall proportion
2525
#' d + stat_sum(aes(group = 1))
2626
#' d + stat_sum(aes(group = 1)) + scale_size(range = c(3, 10))

0 commit comments

Comments
 (0)