Creating custom annotation for running ChIPQC and ChIPseeker
0
0
Entering edit mode
coldi11 • 0
@d3ee54ff
Last seen 2.9 years ago
South Korea

Hi,

I'm trying to run bioconductor packages with Cricetulus griseus(Chinese hamster) genome annotation. As there is no compiled annotation for Cricetulus griseus, I'm trying to create a custom annotation.

But there's an error that I don't know how to fix it.

I attached codes and the results below:

## Load libraries
library(ChIPQC)
library(GenomicRanges)
## load CriGri-PICR annotation
library(GenomicFeatures)
TxDb.Crigri.PICR <- makeTxDbFromGFF(file = "Cricetulus_griseus_picr.CriGri-PICR.104.gtf.gz", format = "gtf")

## Load sample data
samples <- read.csv('meta/CHO_chipseq.csv')
View(samples)

## Create ChIPQC object
chipObj <- ChIPQC(samples, annotation=TxDb.Crigri.PICR)

The output error messages were like this:

> ## Load sample data
> samples <- read.csv('meta/CHO_chipseq.csv')
> View(samples)
> ## Create ChIPQC object
> chipObj <- ChIPQC(samples, annotation=TxDb.Crigri.PICR) 
Tp5-H3K4me1  H3K4me1   1 macs
Tp5-H3K4me3  H3K4me3   1 narrow
Tp5-H3K27ac  H3K27ac   1 narrow
Checking chromosomes:
[1] "RAZU01000001.1"
Compiling annotation...
Error in GeneAnnotation == "hg19" : 
  comparison (1) is possible only for atomic and list types

How can I fix this error?

Thanks ```

customAnnotation • 1.4k views
ADD COMMENT
0
Entering edit mode

Hi Respected Team,

I am also encoutering the same error given below:

Bam file has 24 contigs Calculating coverage histogram for chr1

Calculating SSD for chr1

Calculating unique positions per strand for chr1

Calculating shift for chr1

300 / 300

Error in names(res) <- *vtmp* : 'names' attribute [10] must be the same length as the vector [2] In addition: Warning message: stop worker failed: wrong args for environment sub assignment

this is my command in R for chipqc:

> library(ChIPQC)
> setwd("/home/admin_gopal@milkyway.allogene.com/CHIP-SEQ/Edited_hg38")
> samples = read.csv("QCexperiment.csv")
> library(TxDb.Hsapiens.UCSC.hg38.knownGene) exampleExp =
> ChIPQC(samples,annotation="hg38",chromosomes=c("chr1","chr2","chr3","chr4","chr5","chr6","chr7","chr8","chr9","chr10","chr11","chr12","chr13","chr14","chr15","chr16","chr17","chr18","chr19","chr20","chr21","chr22","chrX","chrY"),blacklist="hg38-blacklist.v2.bed")

Below is information of environment initialize

R version 4.1.0 (2021-05-18) -- "Camp Pontanezen" Copyright (C) 2021 The R Foundation for Statistical Computing Platform: x86_64-pc-linux-gnu (64-bit)

R is free software and comes with ABSOLUTELY NO WARRANTY. You are welcome to redistribute it under certain conditions. Type 'license()' or 'licence()' for distribution details.

Natural language support but running in an English locale

R is a collaborative project with many contributors. Type 'contributors()' for more information and 'citation()' on how to cite R or R packages in publications.

Type 'demo()' for some demos, 'help()' for on-line help, or 'help.start()' for an HTML browser interface to help. Type 'q()' to quit R.

[Previously saved workspace restored]

library(ChIPQC) Loading required package: ggplot2 Loading required package: DiffBind Loading required package: GenomicRanges Loading required package: stats4 Loading required package: BiocGenerics

Attaching package: ‘BiocGenerics’

The following objects are masked from ‘package:stats’:

IQR, mad, sd, var, xtabs

The following objects are masked from ‘package:base’:

anyDuplicated, append, as.data.frame, basename, cbind, colnames,
dirname, do.call, duplicated, eval, evalq, Filter, Find, get, grep,
grepl, intersect, is.unsorted, lapply, Map, mapply, match, mget,
order, paste, pmax, pmax.int, pmin, pmin.int, Position, rank,
rbind, Reduce, rownames, sapply, setdiff, sort, table, tapply,
union, unique, unsplit, which.max, which.min

Loading required package: S4Vectors

Attaching package: ‘S4Vectors’

The following objects are masked from ‘package:base’:

expand.grid, I, unname

Loading required package: IRanges Loading required package: GenomeInfoDb Loading required package: SummarizedExperiment Loading required package: MatrixGenerics Loading required package: matrixStats

Attaching package: ‘MatrixGenerics’

The following objects are masked from ‘package:matrixStats’:

colAlls, colAnyNAs, colAnys, colAvgsPerRowSet, colCollapse,
colCounts, colCummaxs, colCummins, colCumprods, colCumsums,
colDiffs, colIQRDiffs, colIQRs, colLogSumExps, colMadDiffs,
colMads, colMaxs, colMeans2, colMedians, colMins, colOrderStats,
colProds, colQuantiles, colRanges, colRanks, colSdDiffs, colSds,
colSums2, colTabulates, colVarDiffs, colVars, colWeightedMads,
colWeightedMeans, colWeightedMedians, colWeightedSds,
colWeightedVars, rowAlls, rowAnyNAs, rowAnys, rowAvgsPerColSet,
rowCollapse, rowCounts, rowCummaxs, rowCummins, rowCumprods,
rowCumsums, rowDiffs, rowIQRDiffs, rowIQRs, rowLogSumExps,
rowMadDiffs, rowMads, rowMaxs, rowMeans2, rowMedians, rowMins,
rowOrderStats, rowProds, rowQuantiles, rowRanges, rowRanks,
rowSdDiffs, rowSds, rowSums2, rowTabulates, rowVarDiffs, rowVars,
rowWeightedMads, rowWeightedMeans, rowWeightedMedians,
rowWeightedSds, rowWeightedVars

Loading required package: Biobase Welcome to Bioconductor

Vignettes contain introductory material; view with
'browseVignettes()'. To cite Bioconductor, see
'citation("Biobase")', and for packages 'citation("pkgname")'.

Attaching package: ‘Biobase’

The following object is masked from ‘package:MatrixGenerics’:

rowMedians

The following objects are masked from ‘package:matrixStats’:

anyMissing, rowMedians

DiffBind 3.4 Warning message: In (function (kind = NULL, normal.kind = NULL, sample.kind = NULL) : non-uniform 'Rounding' sampler used setwd("/home/admin_gopal@milkyway.allogene.com/CHIP-SEQ/Edited_hg38") samples = read.csv("QCexperiment.csv") library(TxDb.Hsapiens.UCSC.hg38.knownGene) Loading required package: GenomicFeatures

Please help me to resolve this issue.

Best regards Gopal

ADD REPLY

Login before adding your answer.

Traffic: 480 users visited in the last hour
Help About
FAQ
Access RSS
API
Stats

Use of this site constitutes acceptance of our User Agreement and Privacy Policy.

Powered by the version 2.3.6