Skip to content

Commit

Permalink
Remove read_por
Browse files Browse the repository at this point in the history
  • Loading branch information
hadley committed May 30, 2016
1 parent 563542d commit 5e03748
Show file tree
Hide file tree
Showing 4 changed files with 5 additions and 14 deletions.
1 change: 0 additions & 1 deletion NAMESPACE
Expand Up @@ -15,7 +15,6 @@ export(hms)
export(is.labelled)
export(labelled)
export(read_dta)
export(read_por)
export(read_sas)
export(read_sav)
export(read_spss)
Expand Down
3 changes: 3 additions & 0 deletions NEWS.md
@@ -1,5 +1,8 @@
# haven 0.2.0.9000

* Removed `read_por()` since it doesn't work and I'm unlikely to have time to
make it work in the near future.

* `is.labelled()` is now exported (#124).

* Recognise stata "%d" format as a date (#130).
Expand Down
10 changes: 1 addition & 9 deletions R/haven.R
Expand Up @@ -19,7 +19,7 @@ read_sas <- function(b7dat, b7cat = NULL) {
df_parse_sas(clean_path(b7dat), clean_path(b7cat))
}

#' Read SPSS (POR and SAV) files. Write SAV files.
#' Read SPSS (SAV) files. Write SAV files.
#'
#' Currently haven can read and write logical, integer, numeric, character
#' and factors. See \code{\link{labelled}} for how labelled variables in
Expand All @@ -40,13 +40,6 @@ read_sas <- function(b7dat, b7cat = NULL) {
#' read_sav(tmp)
NULL

#' @export
#' @rdname read_spss
read_por <- function(path) {
stop("por files are not currently supported", call. = FALSE)
df_parse_por(clean_path(path))
}

#' @export
#' @rdname read_spss
read_sav <- function(path) {
Expand All @@ -67,7 +60,6 @@ read_spss <- function(path) {

switch(ext,
sav = read_sav(path),
por = read_por(path),
stop("Unknown extension '.", ext, "'", call. = FALSE)
)
}
Expand Down
5 changes: 1 addition & 4 deletions man/read_spss.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

1 comment on commit 5e03748

@sjPlot
Copy link

@sjPlot sjPlot commented on 5e03748 May 30, 2016

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

The SPSS documentation says

In most cases, saving data in portable format is no longer necessary, since SPSS Statistics data files should be platform/operating system independent.

So I would also give lower priority to this features. I have never seen someone using this file format anyway (though I'm probably not representative)...

Please sign in to comment.