... | ... |
@@ -142,7 +142,7 @@ gmql_join <- function(left_data, right_data, genometric_predicate, joinBy, |
142 | 142 |
else |
143 | 143 |
join_matrix <- .jnull("java/lang/String") |
144 | 144 |
|
145 |
- if(!is.null(reg_attributes)) |
|
145 |
+ if(!identical(reg_attributes,"")) |
|
146 | 146 |
{ |
147 | 147 |
if(!is.character(reg_attributes)) |
148 | 148 |
stop("metadata: no valid input") |
... | ... |
@@ -103,6 +103,8 @@ read_gmql <- function(dataset, parser = "CustomParser", is_local = TRUE, |
103 | 103 |
if(identical(parser_name,"CUSTOMPARSER")) |
104 | 104 |
{ |
105 | 105 |
list <- show_schema(url,dataset) |
106 |
+ coords_sys <- list$coordinate_system |
|
107 |
+ type <- list$type |
|
106 | 108 |
schema_names <- vapply(list$fields, function(x){x$name}, |
107 | 109 |
character(1)) |
108 | 110 |
schema_type <- vapply(list$fields, function(x){x$type}, |