unnest.GenomicRanges {plyranges}R Documentation

Expand list-columns in a Ranges object

Description

Expand list-columns in a Ranges object

Usage

## S3 method for class 'GenomicRanges'
unnest(data, ..., .drop = FALSE, .id = NULL,
  .keep_empty = FALSE)

Arguments

data

A Ranges object

...

list-column names to unnest

.drop

Should additional list columsn be dropped (default = FALSE)? By default unnest will keep other list columns even if they are nested.

.id

A character vector of length equal to number of list columns. If supplied will create new column(s) with name .id identifying the index of the list column (default = NULL).

.keep_empty

If a list-like column contains empty elements, should those elements be kept? (default = FALSE)

Value

a GRanges object with expanded list columns

Examples

grng <- as_granges(data.frame(seqnames = "chr1", start = 20:23, width = 1000))
grng <- mutate(grng, 
               exon_id = IntegerList(a = 1, b = c(4,5), c = 3, d = c(2,5))
               )
unnest(grng)
unnest(grng, .id = "name")

# empty list elements are not preserved by default
grng <- mutate(grng, 
               exon_id = IntegerList(a = NULL, b = c(4,5), c= 3, d = c(2,5))
               )
unnest(grng)
unnest(grng, .keep_empty = TRUE)
unnest(grng, .id = "name", .keep_empty = TRUE)


[Package plyranges version 1.4.0 Index]