Skip to content

Commit

Permalink
add braces
Browse files Browse the repository at this point in the history
  • Loading branch information
Kirill Müller committed Mar 10, 2016
1 parent 687d7a5 commit 6442dd8
Showing 1 changed file with 4 additions and 4 deletions.
8 changes: 4 additions & 4 deletions R/parse_data.R
Original file line number Diff line number Diff line change
Expand Up @@ -24,13 +24,13 @@ repair_parse_data <- function(env) {
}

get_parse_data <- function(x) {
if (inherits(x, "srcref"))
if (inherits(x, "srcref")) {
get_parse_data(attr(x, "srcfile"))
else if (exists("original", x))
} else if (exists("original", x)) {
get_parse_data(x$original)
else if (exists("covr_parse_data", x))
} else if (exists("covr_parse_data", x)) {
x$covr_parse_data
else if (!is.null(data <- x[["parseData"]])) {
} else if (!is.null(data <- x[["parseData"]])) {
tokens <- attr(data, "tokens")
data <- t(unclass(data))
colnames(data) <- c("line1", "col1", "line2", "col2",
Expand Down

0 comments on commit 6442dd8

Please sign in to comment.