Browse code

Updated .providerVersion

Robert Ivánek authored on 16/11/2020 14:03:44
Showing 1 changed files

  • R/Gviz.R index dea0821..6d689ca 100644
... ...
@@ -983,7 +983,7 @@
983 983
     blist.conf <- if (notch) {
984 984
         t(vapply(blist, "[[", "conf", FUN.VALUE = numeric(2L)))
985 985
     } else {
986
-        t(blist.stats[, c(2, 4), drop = FALSE])
986
+        blist.stats[, c(2, 4), drop = FALSE]
987 987
     }
988 988
     ybnd <- cbind(
989 989
         blist.stats[, 3], blist.conf[, 2], blist.stats[, 4], blist.stats[, 4], blist.conf[, 2],
... ...
@@ -3094,10 +3094,7 @@ availableDefaultMapping <- function(file, trackType) {
3094 3094
 
3095 3095
 # temporary fix for providerVersion
3096 3096
 .providerVersion <- function(sequence) {
3097
-  genome <- try(providerVersion(sequence), silent=TRUE)
3098
-  if (is(genome, "try-error")) {
3099
-    genome <- metadata(sequence)$genome
3100
-  }
3097
+  genome <- metadata(sequence)$genome
3101 3098
   if (is.null(genome)) {
3102 3099
     genome <- NA
3103 3100
   }