]> git.donarmstrong.com Git - ape.git/blob - R/read.dna.R
new code for reading FASTA files
[ape.git] / R / read.dna.R
1 ## read.dna.R (2012-12-27)
2
3 ##   Read DNA Sequences in a File
4
5 ## Copyright 2003-2012 Emmanuel Paradis
6
7 ## This file is part of the R-package `ape'.
8 ## See the file ../COPYING for licensing issues.
9
10 read.FASTA <- function(file)
11 {
12     sz <- file.info(file)$size
13     x <- readBin(file, "raw", sz)
14     if (Sys.info()[1] == "Windows") {
15         icr <- which(x == as.raw(0x0d)) # CR
16         x <- x[-icr]
17     }
18     res <- .Call("rawStreamToDNAbin", x, PACKAGE = "ape")
19     class(res) <- "DNAbin"
20     res
21 }
22
23 read.dna <- function(file, format = "interleaved", skip = 0,
24                      nlines = 0, comment.char = "#",
25                      as.character = FALSE, as.matrix = NULL)
26 {
27     findFirstNucleotide <- function(x) {
28         ## actually find the 1st non-blank character
29         ## just in case: pat.base <- "[-AaCcGgTtUuMmRrWwSsYyKkVvHhDdBbNn?]{10}"
30         tmp <- regexpr("[[:blank:]]+", x[1]) # consider only a single string
31         tmp[1] + attr(tmp, "match.length")
32     }
33     getTaxaNames <- function(x) {
34         x <- sub("^['\" ]+", "", x) # remove the leading quotes and spaces
35         x <- sub("['\" ]+$", "", x) #   "     "  trailing  "     "    "
36         x
37     }
38     getNucleotide <- function(x) {
39         x <- gsub(" ", "", x)
40         x <- strsplit(x, NULL)
41         tolower(unlist(x))
42     }
43     formats <- c("interleaved", "sequential", "fasta", "clustal")
44     format <- match.arg(format, formats)
45     if (format == "fasta") {
46         obj <- read.FASTA(file)
47     } else {
48         X <- scan(file = file, what = "", sep = "\n", quiet = TRUE,
49                   skip = skip, nlines = nlines, comment.char = comment.char)
50
51         if (format %in% formats[1:2]) {
52             ## need to remove the possible leading spaces and/or tabs in the first line
53             fl <- gsub("^[[:blank:]]+", "", X[1])
54             fl <- as.numeric(unlist(strsplit(fl, "[[:blank:]]+")))
55             if (length(fl) != 2 || any(is.na(fl)))
56                 stop("the first line of the file must contain the dimensions of the data")
57             n <- fl[1]
58             s <- fl[2]
59             obj <- matrix("", n, s)
60             X <- X[-1]
61         }
62         switch(format,
63                "interleaved" = {
64                    start.seq <- findFirstNucleotide(X[1])
65                    one2n <- 1:n
66                    taxa <- getTaxaNames(substr(X[one2n], 1, start.seq - 1))
67                    X[one2n] <- substr(X[one2n], start.seq, nchar(X[one2n]))
68                    nl <- length(X)
69                    for (i in one2n)
70                        obj[i, ] <- getNucleotide(X[seq(i, nl, n)])
71                },
72                "sequential" = {
73                    taxa <- character(n)
74                    j <- 1L # line number
75                    for (i in 1:n) {
76                        start.seq <- findFirstNucleotide(X[j])
77                        taxa[i] <- getTaxaNames(substr(X[j], 1, start.seq - 1))
78                        sequ <- getNucleotide(substr(X[j], start.seq, nchar(X[j])))
79                        j <- j + 1L
80                        while (length(sequ) < s) {
81                            sequ <- c(sequ, getNucleotide(X[j]))
82                            j <- j + 1L
83                        }
84                        obj[i, ] <- sequ
85                    }
86                    taxa <- getTaxaNames(taxa)
87                },
88                "clustal" = {
89                    X <- X[-1] # drop the line with "Clustal bla bla..."
90                    ## find where the 1st sequence starts
91                    start.seq <- findFirstNucleotide(X[1])
92                    ## find the lines with *********....
93                    nspaces <- paste("^ {", start.seq - 1, "}", sep = "", collapse = "")
94                    stars <- grep(nspaces, X)
95                    ## we now know how many sequences in the file:
96                    n <- stars[1] - 1
97                    taxa <- getTaxaNames(substr(X[1:n], 1, start.seq - 1))
98                    ## need to remove the sequence names before getting the sequences:
99                    X <- substr(X, start.seq, nchar(X))
100                    nl <- length(X)
101                    ## find the length of the 1st sequence:
102                    tmp <- getNucleotide(X[seq(1, nl, n + 1)])
103                    s <- length(tmp)
104                    obj <- matrix("", n, s)
105                    obj[1, ] <- tmp
106                    for (i in 2:n)
107                        obj[i, ] <- getNucleotide(X[seq(i, nl, n + 1)])
108                })
109
110     if (format != "fasta") {
111         rownames(obj) <- taxa
112     } else {
113         LENGTHS <- unique(unlist(lapply(obj, length)))
114         allSameLength <- length(LENGTHS) == 1
115         if (is.logical(as.matrix)) {
116             if (as.matrix && !allSameLength)
117                 stop("sequences in FASTA file not of the same length")
118         } else {
119             as.matrix <- allSameLength
120         }
121         if (as.matrix) {
122             obj <- matrix(unlist(obj), ncol = LENGTHS, byrow = TRUE)
123             rownames(obj) <- taxa
124         }
125     }
126     if (!as.character) obj <- as.DNAbin(obj)
127     obj
128 }