Browse code

type check index

LiNk-NY authored on 12/09/2023 15:48:08
Showing 1 changed files

... ...
@@ -63,6 +63,7 @@ TCGAbarcode <- function(barcodes, participant = TRUE, sample = FALSE,
63 63
 {
64 64
     .checkBarcodes(barcodes)
65 65
     filler <- .uniqueDelim(barcodes)
66
+    stopifnot(is.null(index) || is.numeric(index))
66 67
     if (is.null(index))
67 68
         index <- which(
68 69
             c(rep(participant, 3), sample, portion, plate, center)