Skip to content

Commit

Permalink
Merge pull request #518 from setempler/fixed-typo
Browse files Browse the repository at this point in the history
fixed typo
  • Loading branch information
vspinu authored Feb 12, 2017
2 parents d515020 + a36e2ca commit a338a41
Showing 1 changed file with 1 addition and 1 deletion.
2 changes: 1 addition & 1 deletion R/parse.r
Original file line number Diff line number Diff line change
Expand Up @@ -468,7 +468,7 @@ hms <- function(..., quiet = FALSE, roll = FALSE) {
##' selected and \%Y counts as 2.5 tockens (so that it has a priority over
##' \%y\%m). Se examples.
##' @param exact logical. If \code{TRUE}, \code{orders} parameter is interpreted
##' as an exact \code{strptime} format and no trainign or guessing are
##' as an exact \code{strptime} format and no training or guessing are
##' performed.
##' @return a vector of POSIXct date-time objects
##' @seealso \code{strptime}, \code{\link{ymd}}, \code{\link{ymd_hms}}
Expand Down

0 comments on commit a338a41

Please sign in to comment.