├── .DS_Store
├── .Rhistory
├── DESCRIPTION
├── NAMESPACE
├── R
├── .Rhistory
├── cnv_caller_functions_packaged.R
└── data.R
├── README.md
├── cnv_caller_functions_packaged.R
├── copyscat_tutorial.R
├── data
├── scDataSamp.RData
├── scDataSamp.rda
└── scDataSampClusters.rda
├── gpl_license.txt
├── hg19_references
├── hg19_1e+06_cpg_densities.tsv
├── hg19_1e+06_cytoband_densities_granges.tsv
└── hg19_chrom_sizes.tsv
├── hg38_references
├── hg38_1e+06_cpg_densities.tsv
├── hg38_1e+06_cytoband_densities_granges.tsv
└── hg38_chrom_sizes.tsv
├── man
├── annotateCNV3.Rd
├── annotateCNV4.Rd
├── annotateCNV4B.Rd
├── annotateLosses.Rd
├── clusterCNV.Rd
├── collapseChrom3N.Rd
├── computeCenters.Rd
├── cutAverage.Rd
├── estimateCellCycleFraction.Rd
├── filterCells.Rd
├── generateReferences.Rd
├── getAlteredSegments.Rd
├── getDoubleMinutes.Rd
├── getLOHRegions.Rd
├── graphCNVDistribution.Rd
├── identifyCNVClusters.Rd
├── identifyDoubleMinutes.Rd
├── identifyNonNeoplastic.Rd
├── initialiseEnvironment.Rd
├── initializeStandards.Rd
├── makeFakeCells.Rd
├── normalizeMatrixN.Rd
├── readInputTable.Rd
├── saveSummaryStats.Rd
├── scDataSamp.Rd
├── scDataSampClusters.Rd
├── scaleMatrix.Rd
├── scaleMatrixBins.Rd
├── setOutputFile.Rd
├── smoothClusters.Rd
└── testOverlap.Rd
├── process_fragment_file.py
└── scDataSampClusters.Rdata
/.DS_Store:
--------------------------------------------------------------------------------
https://raw.githubusercontent.com/spcdot/CopyscAT/e785ed313cdcb64cf2f153c9e6cddf7f8351829d/.DS_Store
--------------------------------------------------------------------------------
/.Rhistory:
--------------------------------------------------------------------------------
1 | #normalize ratio by general gain or loss of signal
2 | withRatio$ratio = withRatio$ratio/colMeans(withRatio["ratio"])
3 | cpts=cpt.meanvar(as.numeric(unlist(withRatio %>% dplyr::select(ratio))),penalty = "AIC",method = "PELT",minseglen = 2) # can change to 3 for fewer bits
4 | cpt_list<-data.frame(end=cpts@cpts, start=lag(cpts@cpts,default=0)+1,mean=cpts@param.est$mean) %>% filter(mean>1.5 | mean<0.5) %>% mutate(chrom=curChrom)
5 | #append start and end based on loc
6 | cpt_list$end=withRatio$segment[cpt_list$end]
7 | cpt_list$start=withRatio$segment[cpt_list$start]
8 | allCpts=append(allCpts,list(cpt_list))
9 | }
10 | }
11 | #? adjust and normalize?
12 | all_roi<-bind_rows(allCpts)
13 | #iterate through regions
14 | allVals=list()
15 | for (j in 1:nrow(all_roi))
16 | {
17 | curStart=all_roi$start[j]
18 | curEnd=all_roi$end[j]
19 | cellSubset=scData_k_norm %>% filter(chrom==all_roi$chrom[j])
20 | locStart=which(cellSubset$pos==curStart)
21 | locEnd=which(cellSubset$pos==curEnd)
22 | cellSubset=cellSubset[locStart:locEnd,]
23 | merged_by_cluster<-inner_join(rownames_to_column(data.frame(mean=colMeans(cellSubset %>% dplyr::select(ends_with("-1")))),var="barcode"),
24 | rownames_to_column(data.frame(cluster=nmf_results$cellAssigns),var="barcode"))
25 | merged_by_cluster<-merged_by_cluster %>% mutate(neoplastic=(cluster!=nmf_results$clusterNormal)) %>% mutate(cluster=factor(cluster),neoplastic=factor(neoplastic))
26 | merged_by_cluster %>% group_by(neoplastic) %>% summarise(mean=median(mean),counts=n())
27 | #can we feed residuals into the decomposition?
28 | #estimated ratio
29 | testdata=(merged_by_cluster %>% dplyr::select(-barcode,-neoplastic))
30 | discrims<-lda(cluster~.,data=testdata)
31 | preds = discrims %>% predict(testdata)
32 | preds$class
33 | estimated_losses=bind_cols(left_join(data.frame(cluster=preds$class),
34 | rownames_to_column(data.frame(discrims$means),var="cluster")) %>% mutate(mean=mean/discrims$means[nmf_results$clusterNormal]),barcode=merged_by_cluster$barcode) %>% mutate(alteration=j)
35 | allVals=append(allVals,list(estimated_losses))
36 | }
37 | #if range less than 0.4 remove column
38 | valsTable=bind_rows(allVals)
39 | alterationsTable=valsTable %>% dplyr::select(mean,barcode,alteration) # %>% spread(value=mean,key=barcode)
40 | #name alterations
41 | all_roi<-all_roi %>% mutate(name=sprintf("%s:%s-%s",chrom,start,end),alteration=row_number())
42 | final_alterations<-left_join(alterationsTable,all_roi %>% dplyr::select(alteration,name),by="alteration")
43 | final_alterations<-final_alterations %>% dplyr::select(barcode, mean,name) %>% spread(key=name,value=mean)
44 | all_ranges<-apply(final_alterations %>% dplyr::select(-barcode),2,max)-apply(final_alterations %>% dplyr::select(-barcode),2,min)
45 | rangeThreshold=0.4
46 | which(all_ranges>rangeThreshold)
47 | final_alterations<-final_alterations[c("barcode",names(which(all_ranges>rangeThreshold)))]
48 | #then remove ones with max of one group < X (e.g. 50)
49 | minCutoff=50
50 | clean_list=unlist(final_alterations %>% gather("alteration","value",starts_with("chr")) %>% group_by(alteration,value) %>% summarise(min=n()) %>% arrange(alteration,min) %>% slice_head(n=1) %>% filter(min>minCutoff) %>% dplyr::select(alteration))
51 | clean_list<-as.vector(clean_list)
52 | final_alterations<-final_alterations %>% dplyr::select(c("barcode",clean_list))
53 | final_alterations
54 | write.table(file="~/p6d-chr_all-test.csv",x=final_alterations,quote=FALSE,sep=",",row.names=FALSE,col.names=TRUE)
55 | load("~/bing_ren_brain/rna_files/brain1rna.Rdata")
56 | gene.activities[1:5,1:5]
57 | colnames(gene.activities)
58 | rownames(gene.activities)
59 | genenames_to_convert<-rownames(gene.activities)
60 | hgnc.check<-checkGeneSymbols(genenames_to_convert)
61 | #rename to suggested symbols
62 | hgnc.check[which(!is.na(hgnc.check$Suggested.Symbol)),]
63 | final_rowlist<-which(!is.na(hgnc.check$Suggested.Symbol))
64 | library(HGNChelper)
65 | getCurrentHumanMap()
66 | #checkGeneSymbols
67 | genenames_to_convert<-rownames(gene.activities)
68 | hgnc.check<-checkGeneSymbols(genenames_to_convert)
69 | #rename to suggested symbols
70 | hgnc.check[which(!is.na(hgnc.check$Suggested.Symbol)),]
71 | final_rowlist<-which(!is.na(hgnc.check$Suggested.Symbol))
72 | final_rowlist
73 | final_rowlist
74 | gene.activities[final_rowlist,]
75 | gene.activities<-gene.activities[final_rowlist,]
76 | rownames(gene.activities)<-hgnc.check$Suggested.Symbol[final_rowlist]
77 | rnamod_genes<-read.delim("~/sf_peaklists/RNA_modules_may2022.tsv",header=TRUE,sep="\t")
78 | rnamod_genes<-rnamod_genes %>% mutate(Genes=strsplit(Genes,", ")) %>% unnest(Genes)
79 | rnamod_genes<-rnamod_genes %>% transmute(Module=RNAmodule,Gene=Genes)
80 | library(dplyr)
81 | library(tidyr)
82 | library(stringr)
83 | library(Matrix)
84 | library(ggplot2)
85 | library(pheatmap)
86 | rnamod_genes<-read.delim("~/sf_peaklists/RNA_modules_may2022.tsv",header=TRUE,sep="\t")
87 | rnamod_genes<-rnamod_genes %>% mutate(Genes=strsplit(Genes,", ")) %>% unnest(Genes)
88 | rnamod_genes<-rnamod_genes %>% transmute(Module=RNAmodule,Gene=Genes)
89 | read.delim("~/bing_ren_brain/GSE184462_metadata.tsv")
90 | all_meta<-read.delim("~/bing_ren_brain/GSE184462_metadata.tsv")
91 | total_means
92 | module_names=unique(rnamod_genes$Module)
93 | module_averages_by_sample<-data.frame()
94 | #peak_unfiltered %>% filter(Module=="white") %>% select(chrom,start,end)
95 | #USING PRE-NORMED VALUES SO NO CORRECTIONS NEEDED
96 | #pdf("gene_peaks_sf_529_2022.pdf",width=4,height=4)
97 | #rownames(gene.activities)
98 | rawData=data.frame()
99 | rnamod_genes$Gene[which(str_detect(rnamod_genes$Gene,"H2A"))]
100 | celltype_activity$V1[which(str_detect(celltype_activity$V1,"H2A"))]
101 | for (mod_name in module_names)
102 | {
103 | mod_genelist<-rnamod_genes %>% dplyr::filter(Module==mod_name) %>% dplyr::select(Gene)
104 | final_genes<-which(mod_genelist$Gene %in% rownames(gene.activities))
105 | if(length(final_genes)>0)
106 | {
107 | total_means<-data.frame(mean=colMeans(gene.activities[rownames(gene.activities) %in% mod_genelist[final_genes]]),module=mod_name)
108 | #apply gene weight normalization
109 | total_means$mean<-total_means$mean
110 | if (ncol(rawData)>0)
111 | {
112 | rawData = bind_cols(rawData,total_means %>% dplyr::select(-module))
113 | }
114 | else
115 | {
116 | rawData = total_means %>% dplyr::select(-module)
117 | }
118 | module_averages_by_sample = rbind.data.frame(module_averages_by_sample,rownames_to_column(total_means,var="barcode") %>% mutate(samp=substr(barcode,1,5)) %>% group_by(samp) %>% summarise(value=mean(mean)) %>% mutate(cluster=mod_name))
119 | #module_averages_by_sample = rbind.data.frame(module_averages_by_sample,rownames_to_column(total_means,var="barcode") %>% mutate(samp=substr(barcode,1,5)) %>% group_by(samp) %>% summarise(value=mean(mean)) %>% mutate(cluster=mod_name))
120 | #combined@meta.data[which(is.na(combined@meta.data[mod_name])),mod_name]<-0
121 | #print(FeaturePlot(combined,features = mod_name,order = TRUE,min.cutoff = "q20",max.cutoff = "q99"))
122 | }
123 | }
124 | rawData
125 | gene.activities[rownames(gene.activities) %in% mod_genelist[final_genes]])
126 | gene.activities[rownames(gene.activities) %in% mod_genelist[final_genes]]
127 | rownames(gene.activities) %in% mod_genelist[final_genes]]
128 | rownames(gene.activities) %in% mod_genelist[final_genes]
129 | mod_genelist[final_genes]
130 | mod_genelist
131 | final_genes
132 | mod_genelist[final_genes]
133 | mod_genelist
134 | mod_genelist[1:5]
135 | mod_genelist[,1:5]
136 | str(mod_genelist)
137 | rawData=data.frame()
138 | rnamod_genes$Gene[which(str_detect(rnamod_genes$Gene,"H2A"))]
139 | celltype_activity$V1[which(str_detect(celltype_activity$V1,"H2A"))]
140 | for (mod_name in module_names)
141 | {
142 | mod_genelist<-rnamod_genes %>% dplyr::filter(Module==mod_name) %>% dplyr::select(Gene)
143 | final_genes<-which(mod_genelist$Gene %in% rownames(gene.activities))
144 | if(length(final_genes)>0)
145 | {
146 | total_means<-data.frame(mean=colMeans(gene.activities[rownames(gene.activities) %in% mod_genelist$Gene[final_genes]]),module=mod_name)
147 | #apply gene weight normalization
148 | total_means$mean<-total_means$mean
149 | if (ncol(rawData)>0)
150 | {
151 | rawData = bind_cols(rawData,total_means %>% dplyr::select(-module))
152 | }
153 | else
154 | {
155 | rawData = total_means %>% dplyr::select(-module)
156 | }
157 | module_averages_by_sample = rbind.data.frame(module_averages_by_sample,rownames_to_column(total_means,var="barcode") %>% mutate(samp=substr(barcode,1,5)) %>% group_by(samp) %>% summarise(value=mean(mean)) %>% mutate(cluster=mod_name))
158 | #module_averages_by_sample = rbind.data.frame(module_averages_by_sample,rownames_to_column(total_means,var="barcode") %>% mutate(samp=substr(barcode,1,5)) %>% group_by(samp) %>% summarise(value=mean(mean)) %>% mutate(cluster=mod_name))
159 | #combined@meta.data[which(is.na(combined@meta.data[mod_name])),mod_name]<-0
160 | #print(FeaturePlot(combined,features = mod_name,order = TRUE,min.cutoff = "q20",max.cutoff = "q99"))
161 | }
162 | }
163 | total_means
164 | data.frame(mean=colMeans(gene.activities[rownames(gene.activities) %in% mod_genelist$Gene[final_genes]]),module=mod_name)
165 | gene.activities[rownames(gene.activities) %in% mod_genelist$Gene[final_genes]]
166 | rownames(gene.activities) %in% mod_genelist$Gene[final_genes]
167 | gene.activities[rownames(gene.activities) %in% mod_genelist$Gene[final_genes],]
168 | mod_genelist$Gene[final_genes],]
169 | mod_genelist$Gene[final_genes]
170 | mod_name
171 | unique(mod_genelist$Gene[final_genes])
172 | total_means<-data.frame(mean=colMeans(gene.activities[rownames(gene.activities) %in% unique(mod_genelist$Gene[final_genes]),]),module=mod_name)
173 | total_means
174 | inner_join
175 | ?inner_join
176 | module_names=unique(rnamod_genes$Module)
177 | module_averages_by_sample<-data.frame()
178 | rawData=data.frame()
179 | for (mod_name in module_names)
180 | {
181 | mod_genelist<-rnamod_genes %>% dplyr::filter(Module==mod_name) %>% dplyr::select(Gene)
182 | final_genes<-which(mod_genelist$Gene %in% rownames(gene.activities))
183 | if(length(final_genes)>0)
184 | {
185 | total_means<-data.frame(mean=colMeans(gene.activities[rownames(gene.activities) %in% unique(mod_genelist$Gene[final_genes]),]),module=mod_name)
186 | #apply gene weight normalization
187 | total_means$mean<-total_means$mean
188 | if (ncol(rawData)>0)
189 | {
190 | rawData = bind_cols(rawData,total_means %>% dplyr::select(-module))
191 | }
192 | else
193 | {
194 | rawData = total_means %>% dplyr::select(-module)
195 | }
196 | module_averages_by_sample = rbind.data.frame(module_averages_by_sample,rownames_to_column(total_means,var="barcode") %>% mutate(samp=substr(barcode,1,5)) %>% group_by(samp) %>% summarise(value=mean(mean)) %>% mutate(cluster=mod_name))
197 | #module_averages_by_sample = rbind.data.frame(module_averages_by_sample,rownames_to_column(total_means,var="barcode") %>% mutate(samp=substr(barcode,1,5)) %>% group_by(samp) %>% summarise(value=mean(mean)) %>% mutate(cluster=mod_name))
198 | #combined@meta.data[which(is.na(combined@meta.data[mod_name])),mod_name]<-0
199 | #print(FeaturePlot(combined,features = mod_name,order = TRUE,min.cutoff = "q20",max.cutoff = "q99"))
200 | }
201 | }
202 | library(tibble)
203 | total_means
204 | rownames(total_means)
205 | left_join(data.frame(barcode=rownames(total_means)),all_meta,by="barcode")
206 | all_meta
207 | colnames(all_meta)
208 | left_join(data.frame(cellID=rownames(total_means)),all_meta,by="barcode")
209 | left_join(data.frame(cellID=rownames(total_means)),all_meta,by="cellID")
210 | total_means
211 | all_meta
212 | all_meta %>% dplyr::filter(str_detect(sample,"brain")) %>% mutate(barcode=str_match(cellID,'[ACTG]+$'))
213 | all_meta %>% dplyr::filter(str_detect(sample,"brain")) %>% mutate(barcode=str_match(cellID,'[ACTG]+$'))
214 | all_meta %>% dplyr::filter(str_detect(sample,"cort")) %>% mutate(barcode=str_match(cellID,'[ACTG]+$'))
215 | all_meta %>% dplyr::filter(str_detect(tissue,"brain")) %>% mutate(barcode=str_match(cellID,'[ACTG]+$'))
216 | unique(all_meta$tissue)
217 | all_meta
218 | tail(all_meta)
219 | all_meta<-read.delim("~/bing_ren_brain/GSE184462_metadata.tsv")
220 | tail(all_meta)
221 | unique(all_meta$tissue)
222 | all_meta %>% dplyr::filter(str_detect(tissue,"brain")) %>% mutate(barcode=str_match(cellID,'[ACTG]+$'))
223 | all_meta_clean<-all_meta %>% dplyr::filter(str_detect(tissue,"brain")) %>% mutate(barcode=str_match(cellID,'[ACTG]+$'))
224 | rm(all_meta)
225 | left_join(data.frame(barcode=rownames(total_means)),all_meta_clean,by="barcode")
226 | cell_meta<-left_join(data.frame(barcode=rownames(total_means)),all_meta_clean,by="barcode")
227 | total_means
228 | module_names=unique(rnamod_genes$Module)
229 | module_averages_by_sample<-data.frame()
230 | #peak_unfiltered %>% filter(Module=="white") %>% select(chrom,start,end)
231 | #USING PRE-NORMED VALUES SO NO CORRECTIONS NEEDED
232 | #pdf("gene_peaks_sf_529_2022.pdf",width=4,height=4)
233 | #rownames(gene.activities)
234 | rawData=data.frame()
235 | library(tibble)
236 | for (mod_name in module_names)
237 | {
238 | mod_genelist<-rnamod_genes %>% dplyr::filter(Module==mod_name) %>% dplyr::select(Gene)
239 | final_genes<-which(mod_genelist$Gene %in% rownames(gene.activities))
240 | if(length(final_genes)>0)
241 | {
242 | total_means<-data.frame(mean=colMeans(gene.activities[rownames(gene.activities) %in% unique(mod_genelist$Gene[final_genes]),]),module=mod_name)
243 | #apply gene weight normalization
244 | total_means$mean<-total_means$mean
245 | if (ncol(rawData)>0)
246 | {
247 | rawData = bind_cols(rawData,total_means %>% dplyr::select(-module))
248 | }
249 | else
250 | {
251 | rawData = total_means %>% dplyr::select(-module)
252 | }
253 | cell_meta<-left_join(data.frame(barcode=rownames(total_means)),all_meta_clean,by="barcode")
254 | module_averages_by_sample = full_join(rbind.data.frame(module_averages_by_sample,rownames_to_column(total_means,var="barcode"),cell_meta,by="barcode") %>% group_by(cell.type) %>% summarise(value=mean(mean)) %>% mutate(cluster=mod_name))
255 | #module_averages_by_sample = rbind.data.frame(module_averages_by_sample,rownames_to_column(total_means,var="barcode") %>% mutate(samp=substr(barcode,1,5)) %>% group_by(samp) %>% summarise(value=mean(mean)) %>% mutate(cluster=mod_name))
256 | #combined@meta.data[which(is.na(combined@meta.data[mod_name])),mod_name]<-0
257 | #print(FeaturePlot(combined,features = mod_name,order = TRUE,min.cutoff = "q20",max.cutoff = "q99"))
258 | }
259 | }
260 | module_names=unique(rnamod_genes$Module)
261 | module_averages_by_sample<-data.frame()
262 | #peak_unfiltered %>% filter(Module=="white") %>% select(chrom,start,end)
263 | #USING PRE-NORMED VALUES SO NO CORRECTIONS NEEDED
264 | #pdf("gene_peaks_sf_529_2022.pdf",width=4,height=4)
265 | #rownames(gene.activities)
266 | rawData=data.frame()
267 | library(tibble)
268 | for (mod_name in module_names)
269 | {
270 | mod_genelist<-rnamod_genes %>% dplyr::filter(Module==mod_name) %>% dplyr::select(Gene)
271 | final_genes<-which(mod_genelist$Gene %in% rownames(gene.activities))
272 | if(length(final_genes)>0)
273 | {
274 | total_means<-data.frame(mean=colMeans(gene.activities[rownames(gene.activities) %in% unique(mod_genelist$Gene[final_genes]),]),module=mod_name)
275 | #apply gene weight normalization
276 | total_means$mean<-total_means$mean
277 | if (ncol(rawData)>0)
278 | {
279 | rawData = bind_cols(rawData,total_means %>% dplyr::select(-module))
280 | }
281 | else
282 | {
283 | rawData = total_means %>% dplyr::select(-module)
284 | }
285 | cell_meta<-left_join(data.frame(barcode=rownames(total_means)),all_meta_clean,by="barcode")
286 | module_averages_by_sample = rbind.data.frame(module_averages_by_sample,full_join(rownames_to_column(total_means,var="barcode"),cell_meta,by="barcode") %>% group_by(cell.type) %>% summarise(value=mean(mean)) %>% mutate(cluster=mod_name))
287 | #module_averages_by_sample = rbind.data.frame(module_averages_by_sample,rownames_to_column(total_means,var="barcode") %>% mutate(samp=substr(barcode,1,5)) %>% group_by(samp) %>% summarise(value=mean(mean)) %>% mutate(cluster=mod_name))
288 | #combined@meta.data[which(is.na(combined@meta.data[mod_name])),mod_name]<-0
289 | #print(FeaturePlot(combined,features = mod_name,order = TRUE,min.cutoff = "q20",max.cutoff = "q99"))
290 | }
291 | }
292 | colnames(rawData)<-module_names
293 | rawData[1:5,1:5]
294 | module_averages_by_sample
295 | module_averages_by_sample
296 | pheatmap(module_averages_by_sample,scale="column",cluster_cols = TRUE,clustering_method = "ward.D",show_rownames = TRUE,show_colnames=TRUE)
297 | module_averages_by_sample
298 | module_averages_by_sample %>% spread(cluster)
299 | module_averages_by_sample %>% spread(cluster)
300 | module_averages_by_sample %>% spread(key="cluster",value="value")
301 | column_to_rownames()module_averages_by_sample %>% spread(key="cluster",value="value"),var="cell.type")
302 | column_to_rownames(module_averages_by_sample %>% spread(key="cluster",value="value"),var="cell.type")
303 | heatmap_stuff<-column_to_rownames(module_averages_by_sample %>% spread(key="cluster",value="value"),var="cell.type")
304 | pheatmap(heatmap_stuff,scale="column",cluster_cols = TRUE,clustering_method = "ward.D",show_rownames = TRUE,show_colnames=TRUE)
305 | set.seed(42)
306 | random_genes<-sample(1:nrow(gene.activities),size=3000,replace=F)
307 | activityScoreWeights<-colSums(gene.activities[random_genes,])
308 | activityScoreWeights
309 | module_averages_by_sample<-data.frame()
310 | #peak_unfiltered %>% filter(Module=="white") %>% select(chrom,start,end)
311 | #USING PRE-NORMED VALUES SO NO CORRECTIONS NEEDED
312 | #pdf("gene_peaks_sf_529_2022.pdf",width=4,height=4)
313 | #rownames(gene.activities)
314 | rawData=data.frame()
315 | library(tibble)
316 | for (mod_name in module_names)
317 | {
318 | mod_genelist<-rnamod_genes %>% dplyr::filter(Module==mod_name) %>% dplyr::select(Gene)
319 | final_genes<-which(mod_genelist$Gene %in% rownames(gene.activities))
320 | if(length(final_genes)>0)
321 | {
322 | total_means<-data.frame(mean=colMeans(gene.activities[rownames(gene.activities) %in% unique(mod_genelist$Gene[final_genes]),]),module=mod_name)
323 | #apply gene weight normalization
324 | total_means$mean<-total_means$mean / activityScoreWeights
325 | if (ncol(rawData)>0)
326 | {
327 | rawData = bind_cols(rawData,total_means %>% dplyr::select(-module))
328 | }
329 | else
330 | {
331 | rawData = total_means %>% dplyr::select(-module)
332 | }
333 | cell_meta<-left_join(data.frame(barcode=rownames(total_means)),all_meta_clean,by="barcode")
334 | module_averages_by_sample = rbind.data.frame(module_averages_by_sample,full_join(rownames_to_column(total_means,var="barcode"),cell_meta,by="barcode") %>% group_by(cell.type) %>% summarise(value=mean(mean)) %>% mutate(cluster=mod_name))
335 | #module_averages_by_sample = rbind.data.frame(module_averages_by_sample,rownames_to_column(total_means,var="barcode") %>% mutate(samp=substr(barcode,1,5)) %>% group_by(samp) %>% summarise(value=mean(mean)) %>% mutate(cluster=mod_name))
336 | #combined@meta.data[which(is.na(combined@meta.data[mod_name])),mod_name]<-0
337 | #print(FeaturePlot(combined,features = mod_name,order = TRUE,min.cutoff = "q20",max.cutoff = "q99"))
338 | }
339 | }
340 | colnames(rawData)<-module_names
341 | dev.off()
342 | rawData[1:5,1:5]
343 | module_averages_by_sample
344 | heatmap_stuff<-column_to_rownames(module_averages_by_sample %>% spread(key="cluster",value="value"),var="cell.type")
345 | pheatmap(heatmap_stuff,scale="column",cluster_cols = TRUE,clustering_method = "ward.D",show_rownames = TRUE,show_colnames=TRUE)
346 | write.table(rawData,file="~/bing_ren_brain/adult_rna_modules_all_may2022_1.tsv",col.names=TRUE,quote=FALSE,sep='\t')
347 | write.table(module_averages_by_sample,file="~/bing_ren_brain/adult_rna_modules_celltypes_may2022_1.tsv",col.names=TRUE,quote=FALSE,sep='\t')
348 | dev.off()
349 | dev.off()
350 | pdf("~/bing_ren_brain/sf_rna_module_heatmap.pdf",width=5,height=5)
351 | pheatmap(heatmap_stuff,scale="column",cluster_cols = TRUE,clustering_method = "ward.D",show_rownames = TRUE,show_colnames=TRUE)
352 | dev.off()
353 | write.table(rawData,file="~/bing_ren_brain/adult_rna_modules_all_may2022_1.tsv",col.names=TRUE,quote=FALSE,sep='\t')
354 | write.table(module_averages_by_sample,file="~/bing_ren_brain/adult_rna_modules_celltypes_may2022_1.tsv",col.names=TRUE,quote=FALSE,sep='\t')
355 | load("~/bing_ren_brain/rna_files/brain2rna.Rdata")
356 | #metadata
357 | all_meta<-read.delim("~/bing_ren_brain/GSE184462_metadata.tsv")
358 | tail(all_meta)
359 | unique(all_meta$tissue)
360 | all_meta_clean<-all_meta %>% dplyr::filter(str_detect(tissue,"brain")) %>% mutate(barcode=str_match(cellID,'[ACTG]+$'))
361 | rm(all_meta)
362 | gene.activities[1:5,1:5]
363 | rownames(gene.activities)
364 | library(HGNChelper)
365 | getCurrentHumanMap()
366 | #checkGeneSymbols
367 | genenames_to_convert<-rownames(gene.activities)
368 | hgnc.check<-checkGeneSymbols(genenames_to_convert)
369 | #rename to suggested symbols
370 | hgnc.check[which(!is.na(hgnc.check$Suggested.Symbol)),]
371 | final_rowlist<-which(!is.na(hgnc.check$Suggested.Symbol))
372 | gene.activities<-gene.activities[final_rowlist,]
373 | rownames(gene.activities)<-hgnc.check$Suggested.Symbol[final_rowlist]
374 | set.seed(42)
375 | random_genes<-sample(1:nrow(gene.activities),size=3000,replace=F)
376 | activityScoreWeights<-colSums(gene.activities[random_genes,])
377 | #gene.activities<-gene.activities/
378 | #normalie values
379 | #RUN THROUGH MODULES
380 | module_names=unique(rnamod_genes$Module)
381 | module_averages_by_sample<-data.frame()
382 | #peak_unfiltered %>% filter(Module=="white") %>% select(chrom,start,end)
383 | #USING PRE-NORMED VALUES SO NO CORRECTIONS NEEDED
384 | #pdf("gene_peaks_sf_529_2022.pdf",width=4,height=4)
385 | #rownames(gene.activities)
386 | rawData=data.frame()
387 | library(tibble)
388 | for (mod_name in module_names)
389 | {
390 | mod_genelist<-rnamod_genes %>% dplyr::filter(Module==mod_name) %>% dplyr::select(Gene)
391 | final_genes<-which(mod_genelist$Gene %in% rownames(gene.activities))
392 | if(length(final_genes)>0)
393 | {
394 | total_means<-data.frame(mean=colMeans(gene.activities[rownames(gene.activities) %in% unique(mod_genelist$Gene[final_genes]),]),module=mod_name)
395 | #apply gene weight normalization
396 | total_means$mean<-total_means$mean / activityScoreWeights
397 | if (ncol(rawData)>0)
398 | {
399 | rawData = bind_cols(rawData,total_means %>% dplyr::select(-module))
400 | }
401 | else
402 | {
403 | rawData = total_means %>% dplyr::select(-module)
404 | }
405 | cell_meta<-left_join(data.frame(barcode=rownames(total_means)),all_meta_clean,by="barcode")
406 | module_averages_by_sample = rbind.data.frame(module_averages_by_sample,full_join(rownames_to_column(total_means,var="barcode"),cell_meta,by="barcode") %>% group_by(cell.type) %>% summarise(value=mean(mean)) %>% mutate(cluster=mod_name))
407 | #module_averages_by_sample = rbind.data.frame(module_averages_by_sample,rownames_to_column(total_means,var="barcode") %>% mutate(samp=substr(barcode,1,5)) %>% group_by(samp) %>% summarise(value=mean(mean)) %>% mutate(cluster=mod_name))
408 | #combined@meta.data[which(is.na(combined@meta.data[mod_name])),mod_name]<-0
409 | #print(FeaturePlot(combined,features = mod_name,order = TRUE,min.cutoff = "q20",max.cutoff = "q99"))
410 | }
411 | }
412 | colnames(rawData)<-module_names
413 | dev.off()
414 | rawData[1:5,1:5]
415 | module_averages_by_sample
416 | heatmap_stuff<-column_to_rownames(module_averages_by_sample %>% spread(key="cluster",value="value"),var="cell.type")
417 | pheatmap(heatmap_stuff,scale="column",cluster_cols = TRUE,clustering_method = "ward.D",show_rownames = TRUE,show_colnames=TRUE)
418 | pheatmap(heatmap_stuff,scale="column",cluster_cols = TRUE,clustering_method = "ward.D",show_rownames = TRUE,show_colnames=TRUE)
419 | write.table(rawData,file="~/bing_ren_brain/adult_rna_modules_all_may2022_2.tsv",col.names=TRUE,quote=FALSE,sep='\t')
420 | write.table(module_averages_by_sample,file="~/bing_ren_brain/adult_rna_modules_celltypes_may2022_2.tsv",col.names=TRUE,quote=FALSE,sep='\t')
421 | pdf("~/bing_ren_brain/sf_rna_module_adult_brain_heatmap_brain2.pdf",width=5,height=5)
422 | pheatmap(heatmap_stuff,scale="column",cluster_cols = TRUE,clustering_method = "ward.D",show_rownames = TRUE,show_colnames=TRUE)
423 | dev.off()
424 | dev.off()
425 | pdf("~/bing_ren_brain/sf_rna_module_adult_brain_heatmap_brain2.pdf",width=5,height=5)
426 | pheatmap(heatmap_stuff,scale="column",cluster_cols = TRUE,clustering_method = "ward.D",show_rownames = TRUE,show_colnames=TRUE)
427 | dev.off()
428 | read.delim(file="~/pasca_brain/GSE162170_atac_cell_metadata.txt",header=TRUE)
429 | library(GenomicRanges)
430 | library(data.table)
431 | library(Signac)
432 | library(Seurat)
433 | library(tibble)
434 | test1<-fread("~/Downloads/GSE141460_EPN_count_matrix_TPM.txt")
435 | #load("~/ep_seurat_object.Rdata")
436 | test1<-column_to_rownames(test1,var="V1")
437 | library(stringr)
438 | t1<-str_match(rownames(test1),"H3[A-Z-0-9]+")
439 | t1[!is.na(t1)]
440 | ?CreateSeuratObject
441 | #rm(atac_file)
442 | test2<-CreateSeuratObject(test1,"epe")
443 | test1
444 | test2<-ScaleData(test2)
445 | #need the genes of interest
446 | test2<-FindVariableFeatures(test2, selection.method = "vst")
447 | #test2<-CellCycleScoring(test2)
448 | test2 <- RunPCA(test2, features = VariableFeatures(test2), ndims.print = 6:10, nfeatures.print = 10)
449 | test2 <- RunTSNE(test2,perplexity=50,dims=2:10)
450 | FeaturePlot(test2, features=c("CTNNA3","CTNND2","LMNA","LAMA2"),min="q5",max="q95",order=TRUE)
451 | pdf("~/filbin_gojo_ctn.pdf",width=5,height=5)
452 | FeaturePlot(test2, features=c("CTNNA3","CTNND2","LMNA","LAMA2"),min="q5",max="q95",order=TRUE)
453 | dev.off()
454 | FeaturePlot(test2, features=c("CTNNA3","CTNND1"),min="q5",max="q95",order=TRUE)
455 | FeaturePlot(test2, features=c("CTNNA3","CTNND1","MUC1"),min="q5",max="q95",order=TRUE)
456 | FeaturePlot(test2, features=c("CTNNA3","CTNND1","MUC1","PDPN"),min="q5",max="q95",order=TRUE)
457 | FeaturePlot(test2, features=c("CTNNA3","CTNND2","LMNA","LAMA2"),min="q5",max="q95",order=TRUE)
458 | library(CopyscAT)
459 | library(MASS)
460 | sessionInfo()
461 | library("roxygen2")
462 | library("devtools")
463 | setwd("~/scATAC_CNV_TOOL")
464 | devtools::document()
465 | setwd("~/scATAC_CNV_TOOL")
466 | devtools::document()
467 | setwd("~/scATAC_CNV_TOOL")
468 | devtools::document()
469 | setwd("~/scATAC_CNV_TOOL")
470 | devtools::document()
471 | setwd("~/scATAC_CNV_TOOL")
472 | devtools::document()
473 | setwd("~/scATAC_CNV_TOOL")
474 | devtools::document()
475 | setwd("~/scATAC_CNV_TOOL")
476 | devtools::document()
477 | install("~/scATAC_CNV_TOOL")
478 | library(CopyscAT)
479 | initialiseEnvironment(genomeFile="~/hg38_chrom_sizes.tsv",
480 | cytobandFile="~/hg38_1e+06_cytoband_densities_granges.tsv",
481 | cpgFile="~/hg38_1e+06_cpg_densities.tsv",
482 | binSize=1e6,
483 | minFrags=1e4,
484 | cellSuffix=c("-1","-2"),
485 | lowerTrim=0.5,
486 | upperTrim=0.8)
487 | #for this tutorial we will use the sample data included in scData
488 | #to create your own use the process_fragment_file.py script included in the package and run it on a fragments.tsv.gz file of your choosing
489 | #SET OUTPUT DEFAULT DIRECTORY AND NAME
490 | setOutputFile("~","samp_dataset")
491 | #PART 1: INITIAL DATA NORMALIZATION
492 | #step 1 normalize the matrix
493 | #USING SAMPLE DATA FROM PACKAGE
494 | #option: if using your own file replace below with the following
495 | #scData<-readInputTable("myInputFile.tsv")
496 | scData<-scDataSamp
497 | scData_k_norm <- normalizeMatrixN(scData,logNorm = FALSE,maxZero=2000,imputeZeros = FALSE,blacklistProp = 0.8,blacklistCutoff=125,dividingFactor=1,upperFilterQuantile = 0.95)
498 | #when using your own data, please make sure you don't have any excess / alt chromosomes
499 | #collapse into chromosome arm level
500 | summaryFunction<-cutAverage
501 | scData_collapse<-collapseChrom3N(scData_k_norm,summaryFunction=summaryFunction,binExpand = 1,minimumChromValue = 100,logTrans = FALSE,tssEnrich = 1,logBase=2,minCPG=300,powVal=0.73)
502 | #apply additional filters
503 | scData_collapse<-filterCells(scData_collapse,minimumSegments = 40,minDensity = 0.1)
504 | nmf_results<-identifyNonNeoplastic(scData_collapse,methodHclust="ward.D",cutHeight = 0.4)
505 | #?identifyNonNeoplastic
506 | write.table(x=rownames_to_column(data.frame(nmf_results$cellAssigns),var="Barcode"),file=str_c(scCNVCaller$locPrefix,scCNVCaller$outPrefix,"_nmf_clusters.csv"),quote=FALSE,row.names = FALSE,sep=",")
507 | print(paste("Normal cluster is: ",nmf_results$clusterNormal))
508 | altered_segments<-getAlteredSegments(scData_k_norm,nmf_results,lossThreshold = 0.6)
509 | altered_segments
510 | library("roxygen2")
511 | setwd("~/scATAC_CNV_TOOL")
512 | devtools::document()
513 |
--------------------------------------------------------------------------------
/DESCRIPTION:
--------------------------------------------------------------------------------
1 | Package: CopyscAT
2 | Version: 0.40
3 | Depends:
4 | viridis (>= 0.5.1),
5 | NMF (>= 0.23.0),
6 | fastcluster (>= 1.1.25),
7 | biomaRt (>= 2.42.1),
8 | Rtsne (>= 0.15),
9 | FNN (>= 1.1.3),
10 | igraph (>= 1.2.5),
11 | data.table (>= 1.12.8),
12 | changepoint (>= 2.2.2),
13 | zoo (>= 1.8-8),
14 | mclust (>= 5.4.6),
15 | stringr (>= 1.4.0),
16 | edgeR (>= 3.28.1),
17 | limma (>= 3.42.2),
18 | tidyr (>= 1.1.0),
19 | tibble (>= 3.0.3),
20 | gplots (>= 3.0.4),
21 | dplyr (>= 1.0.0),
22 | rtracklayer (>= 1.46.0),
23 | sp (>= 1.4.0),
24 | ggplot2 (>= 3.3.0),
25 | jsonlite (>= 1.7.0),
26 | MASS (>= 7.3.54),
27 | R (>= 2.10)
28 | RoxygenNote: 7.1.2
29 | LazyData: true
30 |
--------------------------------------------------------------------------------
/NAMESPACE:
--------------------------------------------------------------------------------
1 | # Generated by roxygen2: do not edit by hand
2 |
3 | export(.onLoad)
4 | export(annotateCNV3)
5 | export(annotateCNV4)
6 | export(annotateCNV4B)
7 | export(annotateLosses)
8 | export(clusterCNV)
9 | export(collapseChrom3N)
10 | export(computeCenters)
11 | export(cutAverage)
12 | export(estimateCellCycleFraction)
13 | export(filterCells)
14 | export(generateReferences)
15 | export(getAlteredSegments)
16 | export(getDoubleMinutes)
17 | export(getLOHRegions)
18 | export(graphCNVDistribution)
19 | export(identifyCNVClusters)
20 | export(identifyDoubleMinutes)
21 | export(identifyNonNeoplastic)
22 | export(initialiseEnvironment)
23 | export(initializeStandards)
24 | export(makeFakeCells)
25 | export(normalizeMatrixN)
26 | export(readInputTable)
27 | export(saveSummaryStats)
28 | export(scCNVCaller)
29 | export(scaleMatrix)
30 | export(scaleMatrixBins)
31 | export(setOutputFile)
32 | export(smoothClusters)
33 | export(testOverlap)
34 |
--------------------------------------------------------------------------------
/R/.Rhistory:
--------------------------------------------------------------------------------
https://raw.githubusercontent.com/spcdot/CopyscAT/e785ed313cdcb64cf2f153c9e6cddf7f8351829d/R/.Rhistory
--------------------------------------------------------------------------------
/R/data.R:
--------------------------------------------------------------------------------
1 | #' Sample processed matrix for testing
2 | #' @format data.frame with 3103 columns and 1371 rows
3 | #' @source 1371 adult GBM cells
4 | "scDataSamp"
5 | #' Sample processed cluster data frame for testing
6 | #' @format data.frame
7 | #' @source adult GBM cells
8 | "scDataSampClusters"
9 |
--------------------------------------------------------------------------------
/README.md:
--------------------------------------------------------------------------------
1 | # CopyscAT
2 | Copy number variant inference with single-cell ATAC seq
3 |
4 | INTRODUCTION
5 | CopyscAT is designed to identify large-scale and local alterations in chromosomes without need for a control file. It is currently in early beta - documentation and testing are still works in progress. Development is ongoing with R 4.0.0, so please install within an R 4.0.0 environment.
6 |
7 | Update (Mar 2021):
8 | Now with semi-automated neoplastic vs non-neoplastic cell distinction and baseline correction (check tutorial for more details)
9 |
10 | INSTALLATION INSTRUCTIONS
11 | To install, please download copyscat_tutorial.R and follow the instructions within.
12 | To generate fragment matrices, use the process_fragment_file.py script (type python3 process_fragment_file.py for details regarding input parameters)
13 |
14 | ------------
15 |
16 | Copyright (C) 2020 University of Calgary
17 |
18 | This program is free software: you can redistribute it and/or modify
19 | it under the terms of the GNU General Public License as published by
20 | the Free Software Foundation, either version 3 of the License, or
21 | (at your option) any later version.
22 |
23 | This program is distributed in the hope that it will be useful,
24 | but WITHOUT ANY WARRANTY; without even the implied warranty of
25 | MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the
26 | GNU General Public License for more details.
27 |
28 | You should have received a copy of the GNU General Public License
29 | along with this program. If not, see .
30 |
--------------------------------------------------------------------------------
/copyscat_tutorial.R:
--------------------------------------------------------------------------------
1 | library("devtools")
2 | #####INITIAL ONE-TIME SETUP #####
3 | #STEP 1: replace "~/CopyscAT" with wherever you git cloned the repo to
4 | install("~/CopyscAT")
5 |
6 | #alternate option: devools install-github option
7 | #some versions of R throw an error because of code warnings with Github install, the below line should fix this issue
8 | Sys.setenv("R_REMOTES_NO_ERRORS_FROM_WARNINGS" = "true")
9 | install_github("spcdot/copyscat")
10 |
11 | #load the package
12 | library(CopyscAT)
13 |
14 |
15 | #load your favourite genome
16 | library(BSgenome.Hsapiens.UCSC.hg38)
17 | #use it to save references - this will create a genome chrom.sizes file, a cytobands file and a CpG file
18 | #NOTE: updated 21-Oct-2021 with a fallback to the REST API
19 | generateReferences(BSgenome.Hsapiens.UCSC.hg38,genomeText = "hg38",tileWidth = 1e6,outputDir = "~")
20 |
21 | ##### REGULAR WORKFLOW #####
22 | #initialize the environment (note: this needs to be done with every session in which you run Copy-scAT)
23 | initialiseEnvironment(genomeFile="~/hg38_chrom_sizes.tsv",
24 | cytobandFile="~/hg38_1e+06_cytoband_densities_granges.tsv",
25 | cpgFile="~/hg38_1e+06_cpg_densities.tsv",
26 | binSize=1e6,
27 | minFrags=1e4,
28 | cellSuffix=c("-1","-2"),
29 | lowerTrim=0.5,
30 | upperTrim=0.8)
31 |
32 | #for this tutorial we will use the sample data included in scData
33 | #to create your own use the process_fragment_file.py script included in the package and run it on a fragments.tsv.gz file of your choosing
34 |
35 | #SET OUTPUT DEFAULT DIRECTORY AND NAME
36 | setOutputFile("~","samp_dataset")
37 |
38 | #PART 1: INITIAL DATA NORMALIZATION
39 | #step 1 normalize the matrix
40 | #USING SAMPLE DATA FROM PACKAGE
41 | #option: if using your own file replace below with the following
42 | #scData<-readInputTable("myInputFile.tsv")
43 | scData<-scDataSamp
44 | scData_k_norm <- normalizeMatrixN(scData,logNorm = FALSE,maxZero=2000,imputeZeros = FALSE,blacklistProp = 0.8,blacklistCutoff=125,dividingFactor=1,upperFilterQuantile = 0.95)
45 | #when using your own data, please make sure you don't have any excess / alt chromosomes
46 |
47 | #collapse into chromosome arm level
48 | summaryFunction<-cutAverage
49 | scData_collapse<-collapseChrom3N(scData_k_norm,summaryFunction=summaryFunction,binExpand = 1,minimumChromValue = 100,logTrans = FALSE,tssEnrich = 1,logBase=2,minCPG=300,powVal=0.73)
50 | #apply additional filters
51 | scData_collapse<-filterCells(scData_collapse,minimumSegments = 40,minDensity = 0.1)
52 |
53 | #show unscaled chromosome list
54 | graphCNVDistribution(scData_collapse,outputSuffix = "test_violinsn2")
55 |
56 | #compute centers
57 | median_iqr <- computeCenters(scData_collapse,summaryFunction=summaryFunction)
58 |
59 | #PART 2: ASSESSMENT OF CHROMOSOME-LEVEL CNVs
60 | #OPTION 1: identify chromosome-level amplifications using all cells to generate 'normal' control
61 | #identify chromosome-level amplifications
62 | candidate_cnvs<-identifyCNVClusters(scData_collapse,median_iqr,useDummyCells = TRUE,propDummy=0.25,minMix=0.01,deltaMean = 0.03,deltaBIC2 = 0.25,bicMinimum = 0.1, subsetSize=600,fakeCellSD = 0.08, uncertaintyCutoff = 0.55,summaryFunction=summaryFunction,maxClust = 4,mergeCutoff = 3,IQRCutoff= 0.2,medianQuantileCutoff = 0.4)
63 | #cleanup step
64 | candidate_cnvs_clean<-clusterCNV(initialResultList = candidate_cnvs,medianIQR = candidate_cnvs[[3]],minDiff=1.5) #= 1.5)
65 | #final results and annotation
66 | final_cnv_list<-annotateCNV4(candidate_cnvs_clean, saveOutput=TRUE,outputSuffix = "clean_cnv",sdCNV = 0.5,filterResults=TRUE,filterRange=0.8)
67 |
68 |
69 |
70 | #OPTION 2: automatically identify non-neoplastic cells and use these for control
71 | #note: still somewhat experimental - use if the copy number calls from A don't make sense (e.g. baseline appears incorrect)
72 | #works best if tumor cellularity is <90% (very small populations of non-neoplastic cells may get missed)
73 | #run this after filterCells
74 | #this generates a heatmap in your working directory - check it and adjust parameters as needed
75 | #default parameters: estimatedCellularity=0.8,nmfComponents=5,outputHeatmap=TRUE,cutHeight=0.6
76 | #change cutHeight (height at which target dendrogram is cut) and nmfComponents as necessary to improve segeregation of clusters in your sample
77 |
78 | nmf_results<-identifyNonNeoplastic(scData_collapse,methodHclust="ward.D",cutHeight = 0.4)
79 | #?identifyNonNeoplastic
80 | write.table(x=rownames_to_column(data.frame(nmf_results$cellAssigns),var="Barcode"),file=str_c(scCNVCaller$locPrefix,scCNVCaller$outPrefix,"_nmf_clusters.csv"),quote=FALSE,row.names = FALSE,sep=",")
81 | print(paste("Normal cluster is: ",nmf_results$clusterNormal))
82 |
83 | #ALTERNATE METHOD FOR CNV CALLING (with normal cells as background)
84 | #you can use normals identified by NMF or known/suspected normals in the sample to refine the CNV calls (i.e. as a vector of barcode strings)
85 | #compute central tendencies based on normal cells only
86 | median_iqr <- computeCenters(scData_collapse %>% select(chrom,nmf_results$normalBarcodes),summaryFunction=summaryFunction)
87 | #setting medianQuantileCutoff to -1 and feeding non-neoplastic barcodes in as normalCells can improve accuracy of CNV calls
88 | candidate_cnvs<-identifyCNVClusters(scData_collapse,median_iqr,useDummyCells = TRUE,propDummy=0.25,minMix=0.01,deltaMean = 0.03,deltaBIC2 = 0.25,bicMinimum = 0.1, subsetSize=800,fakeCellSD = 0.09, uncertaintyCutoff = 0.65,summaryFunction=summaryFunction,maxClust = 4,mergeCutoff = 3,IQRCutoff = 0.25,medianQuantileCutoff = -1,normalCells=nmf_results$normalBarcodes)
89 | candidate_cnvs_clean<-clusterCNV(initialResultList = candidate_cnvs,medianIQR = candidate_cnvs[[3]],minDiff=1.0) #= 1.5)
90 |
91 | #to save this data you can use annotateCNV4 as per usual
92 | final_cnv_list<-annotateCNV4(candidate_cnvs_clean, saveOutput=TRUE,outputSuffix = "clean_cnv",sdCNV = 0.6,filterResults=TRUE,filterRange=0.4)
93 |
94 | #the other option is to use annotateCNV4B and feed in the normalBarcodes - this will set the "normal" population to 2 -- if the data is noisy it may lead to false positives so use with caution
95 | #you may also use this version if you have a list of normal barcodes generated elsewhere
96 | final_cnv_list<-annotateCNV4B(candidate_cnvs_clean, nmf_results$normalBarcodes, saveOutput=TRUE,outputSuffix = "clean_cnv_b2",sdCNV = 0.6,filterResults=TRUE,filterRange=0.4,minAlteredCellProp = 0.5)
97 |
98 | #PART 2B: smoothing CNV calls with clusters
99 | #data smoothing: can provide CNV as list or as an input file (CSV)
100 | smoothedCNVList<-smoothClusters(scDataSampClusters,inputCNVList = final_cnv_list[[3]],percentPositive = 0.4,removeEmpty = FALSE)
101 |
102 |
103 | #PART 3: identify double minutes / amplifications
104 | #note: this is slow, and may take ~5 minutes
105 | #if very large dataset, may run on subset of the data to estimate the amplifications in distinct clusters
106 | #option to compile this code
107 | library(compiler)
108 | dmRead<-cmpfun(identifyDoubleMinutes)
109 | #
110 | #minThreshold is a time-saving option that doesn't call changepoints on any cell with a maximum Z score less than 4 - you can adjust this to adjust sensitivity of double minute calls (note - lower value = slower)
111 | dm_candidates<-dmRead(scData_k_norm,minCells=100,qualityCutoff2 = 100,minThreshold = 4)
112 |
113 | write.table(x=dm_candidates,file=str_c(scCNVCaller$locPrefix,scCNVCaller$outPrefix,"samp_dm.csv"),quote=FALSE,row.names = FALSE,sep=",")
114 |
115 |
116 | #PART 4:
117 | #CALLING SEGMENTAL LOSSES/GAINS (on datasets with NMF-detected normals only)
118 | altered_segments<-getAlteredSegments(scData_k_norm,nmf_results,lossThreshold = 0.6)
119 | #output here are chromosomal segments and relative estimated copy number
120 | write.table(x=altered_segments,file=str_c(scCNVCaller$locPrefix,scCNVCaller$outPrefix,"samp_segments.csv"),quote=FALSE,row.names = FALSE,sep=",")
121 |
122 |
123 | #PART 5: quantify cycling cells
124 | #this uses the signal from a particular chromosome (we use chromosome X as typically not altered in our samples) to identify 2N versus 4N DNA content within cells
125 | #if there is a known alteration in X in your samples, try using a different chromosome
126 | barcodeCycling<-estimateCellCycleFraction(scData,sampName="sample",cutoff=1000)
127 | #take max as
128 | write.table(barcodeCycling[order(names(barcodeCycling))]==max(barcodeCycling),file=str_c(scCNVCaller$locPrefix,scCNVCaller$outPrefix,"_cycling_cells.tsv"),sep="\t",quote=FALSE,row.names=TRUE,col.names=FALSE)
129 |
130 |
--------------------------------------------------------------------------------
/data/scDataSamp.RData:
--------------------------------------------------------------------------------
https://raw.githubusercontent.com/spcdot/CopyscAT/e785ed313cdcb64cf2f153c9e6cddf7f8351829d/data/scDataSamp.RData
--------------------------------------------------------------------------------
/data/scDataSamp.rda:
--------------------------------------------------------------------------------
https://raw.githubusercontent.com/spcdot/CopyscAT/e785ed313cdcb64cf2f153c9e6cddf7f8351829d/data/scDataSamp.rda
--------------------------------------------------------------------------------
/data/scDataSampClusters.rda:
--------------------------------------------------------------------------------
https://raw.githubusercontent.com/spcdot/CopyscAT/e785ed313cdcb64cf2f153c9e6cddf7f8351829d/data/scDataSampClusters.rda
--------------------------------------------------------------------------------
/gpl_license.txt:
--------------------------------------------------------------------------------
1 | GNU GENERAL PUBLIC LICENSE
2 | Version 3, 29 June 2007
3 |
4 | Copyright (C) 2007 Free Software Foundation, Inc.
5 | Everyone is permitted to copy and distribute verbatim copies
6 | of this license document, but changing it is not allowed.
7 |
8 | Preamble
9 |
10 | The GNU General Public License is a free, copyleft license for
11 | software and other kinds of works.
12 |
13 | The licenses for most software and other practical works are designed
14 | to take away your freedom to share and change the works. By contrast,
15 | the GNU General Public License is intended to guarantee your freedom to
16 | share and change all versions of a program--to make sure it remains free
17 | software for all its users. We, the Free Software Foundation, use the
18 | GNU General Public License for most of our software; it applies also to
19 | any other work released this way by its authors. You can apply it to
20 | your programs, too.
21 |
22 | When we speak of free software, we are referring to freedom, not
23 | price. Our General Public Licenses are designed to make sure that you
24 | have the freedom to distribute copies of free software (and charge for
25 | them if you wish), that you receive source code or can get it if you
26 | want it, that you can change the software or use pieces of it in new
27 | free programs, and that you know you can do these things.
28 |
29 | To protect your rights, we need to prevent others from denying you
30 | these rights or asking you to surrender the rights. Therefore, you have
31 | certain responsibilities if you distribute copies of the software, or if
32 | you modify it: responsibilities to respect the freedom of others.
33 |
34 | For example, if you distribute copies of such a program, whether
35 | gratis or for a fee, you must pass on to the recipients the same
36 | freedoms that you received. You must make sure that they, too, receive
37 | or can get the source code. And you must show them these terms so they
38 | know their rights.
39 |
40 | Developers that use the GNU GPL protect your rights with two steps:
41 | (1) assert copyright on the software, and (2) offer you this License
42 | giving you legal permission to copy, distribute and/or modify it.
43 |
44 | For the developers' and authors' protection, the GPL clearly explains
45 | that there is no warranty for this free software. For both users' and
46 | authors' sake, the GPL requires that modified versions be marked as
47 | changed, so that their problems will not be attributed erroneously to
48 | authors of previous versions.
49 |
50 | Some devices are designed to deny users access to install or run
51 | modified versions of the software inside them, although the manufacturer
52 | can do so. This is fundamentally incompatible with the aim of
53 | protecting users' freedom to change the software. The systematic
54 | pattern of such abuse occurs in the area of products for individuals to
55 | use, which is precisely where it is most unacceptable. Therefore, we
56 | have designed this version of the GPL to prohibit the practice for those
57 | products. If such problems arise substantially in other domains, we
58 | stand ready to extend this provision to those domains in future versions
59 | of the GPL, as needed to protect the freedom of users.
60 |
61 | Finally, every program is threatened constantly by software patents.
62 | States should not allow patents to restrict development and use of
63 | software on general-purpose computers, but in those that do, we wish to
64 | avoid the special danger that patents applied to a free program could
65 | make it effectively proprietary. To prevent this, the GPL assures that
66 | patents cannot be used to render the program non-free.
67 |
68 | The precise terms and conditions for copying, distribution and
69 | modification follow.
70 |
71 | TERMS AND CONDITIONS
72 |
73 | 0. Definitions.
74 |
75 | "This License" refers to version 3 of the GNU General Public License.
76 |
77 | "Copyright" also means copyright-like laws that apply to other kinds of
78 | works, such as semiconductor masks.
79 |
80 | "The Program" refers to any copyrightable work licensed under this
81 | License. Each licensee is addressed as "you". "Licensees" and
82 | "recipients" may be individuals or organizations.
83 |
84 | To "modify" a work means to copy from or adapt all or part of the work
85 | in a fashion requiring copyright permission, other than the making of an
86 | exact copy. The resulting work is called a "modified version" of the
87 | earlier work or a work "based on" the earlier work.
88 |
89 | A "covered work" means either the unmodified Program or a work based
90 | on the Program.
91 |
92 | To "propagate" a work means to do anything with it that, without
93 | permission, would make you directly or secondarily liable for
94 | infringement under applicable copyright law, except executing it on a
95 | computer or modifying a private copy. Propagation includes copying,
96 | distribution (with or without modification), making available to the
97 | public, and in some countries other activities as well.
98 |
99 | To "convey" a work means any kind of propagation that enables other
100 | parties to make or receive copies. Mere interaction with a user through
101 | a computer network, with no transfer of a copy, is not conveying.
102 |
103 | An interactive user interface displays "Appropriate Legal Notices"
104 | to the extent that it includes a convenient and prominently visible
105 | feature that (1) displays an appropriate copyright notice, and (2)
106 | tells the user that there is no warranty for the work (except to the
107 | extent that warranties are provided), that licensees may convey the
108 | work under this License, and how to view a copy of this License. If
109 | the interface presents a list of user commands or options, such as a
110 | menu, a prominent item in the list meets this criterion.
111 |
112 | 1. Source Code.
113 |
114 | The "source code" for a work means the preferred form of the work
115 | for making modifications to it. "Object code" means any non-source
116 | form of a work.
117 |
118 | A "Standard Interface" means an interface that either is an official
119 | standard defined by a recognized standards body, or, in the case of
120 | interfaces specified for a particular programming language, one that
121 | is widely used among developers working in that language.
122 |
123 | The "System Libraries" of an executable work include anything, other
124 | than the work as a whole, that (a) is included in the normal form of
125 | packaging a Major Component, but which is not part of that Major
126 | Component, and (b) serves only to enable use of the work with that
127 | Major Component, or to implement a Standard Interface for which an
128 | implementation is available to the public in source code form. A
129 | "Major Component", in this context, means a major essential component
130 | (kernel, window system, and so on) of the specific operating system
131 | (if any) on which the executable work runs, or a compiler used to
132 | produce the work, or an object code interpreter used to run it.
133 |
134 | The "Corresponding Source" for a work in object code form means all
135 | the source code needed to generate, install, and (for an executable
136 | work) run the object code and to modify the work, including scripts to
137 | control those activities. However, it does not include the work's
138 | System Libraries, or general-purpose tools or generally available free
139 | programs which are used unmodified in performing those activities but
140 | which are not part of the work. For example, Corresponding Source
141 | includes interface definition files associated with source files for
142 | the work, and the source code for shared libraries and dynamically
143 | linked subprograms that the work is specifically designed to require,
144 | such as by intimate data communication or control flow between those
145 | subprograms and other parts of the work.
146 |
147 | The Corresponding Source need not include anything that users
148 | can regenerate automatically from other parts of the Corresponding
149 | Source.
150 |
151 | The Corresponding Source for a work in source code form is that
152 | same work.
153 |
154 | 2. Basic Permissions.
155 |
156 | All rights granted under this License are granted for the term of
157 | copyright on the Program, and are irrevocable provided the stated
158 | conditions are met. This License explicitly affirms your unlimited
159 | permission to run the unmodified Program. The output from running a
160 | covered work is covered by this License only if the output, given its
161 | content, constitutes a covered work. This License acknowledges your
162 | rights of fair use or other equivalent, as provided by copyright law.
163 |
164 | You may make, run and propagate covered works that you do not
165 | convey, without conditions so long as your license otherwise remains
166 | in force. You may convey covered works to others for the sole purpose
167 | of having them make modifications exclusively for you, or provide you
168 | with facilities for running those works, provided that you comply with
169 | the terms of this License in conveying all material for which you do
170 | not control copyright. Those thus making or running the covered works
171 | for you must do so exclusively on your behalf, under your direction
172 | and control, on terms that prohibit them from making any copies of
173 | your copyrighted material outside their relationship with you.
174 |
175 | Conveying under any other circumstances is permitted solely under
176 | the conditions stated below. Sublicensing is not allowed; section 10
177 | makes it unnecessary.
178 |
179 | 3. Protecting Users' Legal Rights From Anti-Circumvention Law.
180 |
181 | No covered work shall be deemed part of an effective technological
182 | measure under any applicable law fulfilling obligations under article
183 | 11 of the WIPO copyright treaty adopted on 20 December 1996, or
184 | similar laws prohibiting or restricting circumvention of such
185 | measures.
186 |
187 | When you convey a covered work, you waive any legal power to forbid
188 | circumvention of technological measures to the extent such circumvention
189 | is effected by exercising rights under this License with respect to
190 | the covered work, and you disclaim any intention to limit operation or
191 | modification of the work as a means of enforcing, against the work's
192 | users, your or third parties' legal rights to forbid circumvention of
193 | technological measures.
194 |
195 | 4. Conveying Verbatim Copies.
196 |
197 | You may convey verbatim copies of the Program's source code as you
198 | receive it, in any medium, provided that you conspicuously and
199 | appropriately publish on each copy an appropriate copyright notice;
200 | keep intact all notices stating that this License and any
201 | non-permissive terms added in accord with section 7 apply to the code;
202 | keep intact all notices of the absence of any warranty; and give all
203 | recipients a copy of this License along with the Program.
204 |
205 | You may charge any price or no price for each copy that you convey,
206 | and you may offer support or warranty protection for a fee.
207 |
208 | 5. Conveying Modified Source Versions.
209 |
210 | You may convey a work based on the Program, or the modifications to
211 | produce it from the Program, in the form of source code under the
212 | terms of section 4, provided that you also meet all of these conditions:
213 |
214 | a) The work must carry prominent notices stating that you modified
215 | it, and giving a relevant date.
216 |
217 | b) The work must carry prominent notices stating that it is
218 | released under this License and any conditions added under section
219 | 7. This requirement modifies the requirement in section 4 to
220 | "keep intact all notices".
221 |
222 | c) You must license the entire work, as a whole, under this
223 | License to anyone who comes into possession of a copy. This
224 | License will therefore apply, along with any applicable section 7
225 | additional terms, to the whole of the work, and all its parts,
226 | regardless of how they are packaged. This License gives no
227 | permission to license the work in any other way, but it does not
228 | invalidate such permission if you have separately received it.
229 |
230 | d) If the work has interactive user interfaces, each must display
231 | Appropriate Legal Notices; however, if the Program has interactive
232 | interfaces that do not display Appropriate Legal Notices, your
233 | work need not make them do so.
234 |
235 | A compilation of a covered work with other separate and independent
236 | works, which are not by their nature extensions of the covered work,
237 | and which are not combined with it such as to form a larger program,
238 | in or on a volume of a storage or distribution medium, is called an
239 | "aggregate" if the compilation and its resulting copyright are not
240 | used to limit the access or legal rights of the compilation's users
241 | beyond what the individual works permit. Inclusion of a covered work
242 | in an aggregate does not cause this License to apply to the other
243 | parts of the aggregate.
244 |
245 | 6. Conveying Non-Source Forms.
246 |
247 | You may convey a covered work in object code form under the terms
248 | of sections 4 and 5, provided that you also convey the
249 | machine-readable Corresponding Source under the terms of this License,
250 | in one of these ways:
251 |
252 | a) Convey the object code in, or embodied in, a physical product
253 | (including a physical distribution medium), accompanied by the
254 | Corresponding Source fixed on a durable physical medium
255 | customarily used for software interchange.
256 |
257 | b) Convey the object code in, or embodied in, a physical product
258 | (including a physical distribution medium), accompanied by a
259 | written offer, valid for at least three years and valid for as
260 | long as you offer spare parts or customer support for that product
261 | model, to give anyone who possesses the object code either (1) a
262 | copy of the Corresponding Source for all the software in the
263 | product that is covered by this License, on a durable physical
264 | medium customarily used for software interchange, for a price no
265 | more than your reasonable cost of physically performing this
266 | conveying of source, or (2) access to copy the
267 | Corresponding Source from a network server at no charge.
268 |
269 | c) Convey individual copies of the object code with a copy of the
270 | written offer to provide the Corresponding Source. This
271 | alternative is allowed only occasionally and noncommercially, and
272 | only if you received the object code with such an offer, in accord
273 | with subsection 6b.
274 |
275 | d) Convey the object code by offering access from a designated
276 | place (gratis or for a charge), and offer equivalent access to the
277 | Corresponding Source in the same way through the same place at no
278 | further charge. You need not require recipients to copy the
279 | Corresponding Source along with the object code. If the place to
280 | copy the object code is a network server, the Corresponding Source
281 | may be on a different server (operated by you or a third party)
282 | that supports equivalent copying facilities, provided you maintain
283 | clear directions next to the object code saying where to find the
284 | Corresponding Source. Regardless of what server hosts the
285 | Corresponding Source, you remain obligated to ensure that it is
286 | available for as long as needed to satisfy these requirements.
287 |
288 | e) Convey the object code using peer-to-peer transmission, provided
289 | you inform other peers where the object code and Corresponding
290 | Source of the work are being offered to the general public at no
291 | charge under subsection 6d.
292 |
293 | A separable portion of the object code, whose source code is excluded
294 | from the Corresponding Source as a System Library, need not be
295 | included in conveying the object code work.
296 |
297 | A "User Product" is either (1) a "consumer product", which means any
298 | tangible personal property which is normally used for personal, family,
299 | or household purposes, or (2) anything designed or sold for incorporation
300 | into a dwelling. In determining whether a product is a consumer product,
301 | doubtful cases shall be resolved in favor of coverage. For a particular
302 | product received by a particular user, "normally used" refers to a
303 | typical or common use of that class of product, regardless of the status
304 | of the particular user or of the way in which the particular user
305 | actually uses, or expects or is expected to use, the product. A product
306 | is a consumer product regardless of whether the product has substantial
307 | commercial, industrial or non-consumer uses, unless such uses represent
308 | the only significant mode of use of the product.
309 |
310 | "Installation Information" for a User Product means any methods,
311 | procedures, authorization keys, or other information required to install
312 | and execute modified versions of a covered work in that User Product from
313 | a modified version of its Corresponding Source. The information must
314 | suffice to ensure that the continued functioning of the modified object
315 | code is in no case prevented or interfered with solely because
316 | modification has been made.
317 |
318 | If you convey an object code work under this section in, or with, or
319 | specifically for use in, a User Product, and the conveying occurs as
320 | part of a transaction in which the right of possession and use of the
321 | User Product is transferred to the recipient in perpetuity or for a
322 | fixed term (regardless of how the transaction is characterized), the
323 | Corresponding Source conveyed under this section must be accompanied
324 | by the Installation Information. But this requirement does not apply
325 | if neither you nor any third party retains the ability to install
326 | modified object code on the User Product (for example, the work has
327 | been installed in ROM).
328 |
329 | The requirement to provide Installation Information does not include a
330 | requirement to continue to provide support service, warranty, or updates
331 | for a work that has been modified or installed by the recipient, or for
332 | the User Product in which it has been modified or installed. Access to a
333 | network may be denied when the modification itself materially and
334 | adversely affects the operation of the network or violates the rules and
335 | protocols for communication across the network.
336 |
337 | Corresponding Source conveyed, and Installation Information provided,
338 | in accord with this section must be in a format that is publicly
339 | documented (and with an implementation available to the public in
340 | source code form), and must require no special password or key for
341 | unpacking, reading or copying.
342 |
343 | 7. Additional Terms.
344 |
345 | "Additional permissions" are terms that supplement the terms of this
346 | License by making exceptions from one or more of its conditions.
347 | Additional permissions that are applicable to the entire Program shall
348 | be treated as though they were included in this License, to the extent
349 | that they are valid under applicable law. If additional permissions
350 | apply only to part of the Program, that part may be used separately
351 | under those permissions, but the entire Program remains governed by
352 | this License without regard to the additional permissions.
353 |
354 | When you convey a copy of a covered work, you may at your option
355 | remove any additional permissions from that copy, or from any part of
356 | it. (Additional permissions may be written to require their own
357 | removal in certain cases when you modify the work.) You may place
358 | additional permissions on material, added by you to a covered work,
359 | for which you have or can give appropriate copyright permission.
360 |
361 | Notwithstanding any other provision of this License, for material you
362 | add to a covered work, you may (if authorized by the copyright holders of
363 | that material) supplement the terms of this License with terms:
364 |
365 | a) Disclaiming warranty or limiting liability differently from the
366 | terms of sections 15 and 16 of this License; or
367 |
368 | b) Requiring preservation of specified reasonable legal notices or
369 | author attributions in that material or in the Appropriate Legal
370 | Notices displayed by works containing it; or
371 |
372 | c) Prohibiting misrepresentation of the origin of that material, or
373 | requiring that modified versions of such material be marked in
374 | reasonable ways as different from the original version; or
375 |
376 | d) Limiting the use for publicity purposes of names of licensors or
377 | authors of the material; or
378 |
379 | e) Declining to grant rights under trademark law for use of some
380 | trade names, trademarks, or service marks; or
381 |
382 | f) Requiring indemnification of licensors and authors of that
383 | material by anyone who conveys the material (or modified versions of
384 | it) with contractual assumptions of liability to the recipient, for
385 | any liability that these contractual assumptions directly impose on
386 | those licensors and authors.
387 |
388 | All other non-permissive additional terms are considered "further
389 | restrictions" within the meaning of section 10. If the Program as you
390 | received it, or any part of it, contains a notice stating that it is
391 | governed by this License along with a term that is a further
392 | restriction, you may remove that term. If a license document contains
393 | a further restriction but permits relicensing or conveying under this
394 | License, you may add to a covered work material governed by the terms
395 | of that license document, provided that the further restriction does
396 | not survive such relicensing or conveying.
397 |
398 | If you add terms to a covered work in accord with this section, you
399 | must place, in the relevant source files, a statement of the
400 | additional terms that apply to those files, or a notice indicating
401 | where to find the applicable terms.
402 |
403 | Additional terms, permissive or non-permissive, may be stated in the
404 | form of a separately written license, or stated as exceptions;
405 | the above requirements apply either way.
406 |
407 | 8. Termination.
408 |
409 | You may not propagate or modify a covered work except as expressly
410 | provided under this License. Any attempt otherwise to propagate or
411 | modify it is void, and will automatically terminate your rights under
412 | this License (including any patent licenses granted under the third
413 | paragraph of section 11).
414 |
415 | However, if you cease all violation of this License, then your
416 | license from a particular copyright holder is reinstated (a)
417 | provisionally, unless and until the copyright holder explicitly and
418 | finally terminates your license, and (b) permanently, if the copyright
419 | holder fails to notify you of the violation by some reasonable means
420 | prior to 60 days after the cessation.
421 |
422 | Moreover, your license from a particular copyright holder is
423 | reinstated permanently if the copyright holder notifies you of the
424 | violation by some reasonable means, this is the first time you have
425 | received notice of violation of this License (for any work) from that
426 | copyright holder, and you cure the violation prior to 30 days after
427 | your receipt of the notice.
428 |
429 | Termination of your rights under this section does not terminate the
430 | licenses of parties who have received copies or rights from you under
431 | this License. If your rights have been terminated and not permanently
432 | reinstated, you do not qualify to receive new licenses for the same
433 | material under section 10.
434 |
435 | 9. Acceptance Not Required for Having Copies.
436 |
437 | You are not required to accept this License in order to receive or
438 | run a copy of the Program. Ancillary propagation of a covered work
439 | occurring solely as a consequence of using peer-to-peer transmission
440 | to receive a copy likewise does not require acceptance. However,
441 | nothing other than this License grants you permission to propagate or
442 | modify any covered work. These actions infringe copyright if you do
443 | not accept this License. Therefore, by modifying or propagating a
444 | covered work, you indicate your acceptance of this License to do so.
445 |
446 | 10. Automatic Licensing of Downstream Recipients.
447 |
448 | Each time you convey a covered work, the recipient automatically
449 | receives a license from the original licensors, to run, modify and
450 | propagate that work, subject to this License. You are not responsible
451 | for enforcing compliance by third parties with this License.
452 |
453 | An "entity transaction" is a transaction transferring control of an
454 | organization, or substantially all assets of one, or subdividing an
455 | organization, or merging organizations. If propagation of a covered
456 | work results from an entity transaction, each party to that
457 | transaction who receives a copy of the work also receives whatever
458 | licenses to the work the party's predecessor in interest had or could
459 | give under the previous paragraph, plus a right to possession of the
460 | Corresponding Source of the work from the predecessor in interest, if
461 | the predecessor has it or can get it with reasonable efforts.
462 |
463 | You may not impose any further restrictions on the exercise of the
464 | rights granted or affirmed under this License. For example, you may
465 | not impose a license fee, royalty, or other charge for exercise of
466 | rights granted under this License, and you may not initiate litigation
467 | (including a cross-claim or counterclaim in a lawsuit) alleging that
468 | any patent claim is infringed by making, using, selling, offering for
469 | sale, or importing the Program or any portion of it.
470 |
471 | 11. Patents.
472 |
473 | A "contributor" is a copyright holder who authorizes use under this
474 | License of the Program or a work on which the Program is based. The
475 | work thus licensed is called the contributor's "contributor version".
476 |
477 | A contributor's "essential patent claims" are all patent claims
478 | owned or controlled by the contributor, whether already acquired or
479 | hereafter acquired, that would be infringed by some manner, permitted
480 | by this License, of making, using, or selling its contributor version,
481 | but do not include claims that would be infringed only as a
482 | consequence of further modification of the contributor version. For
483 | purposes of this definition, "control" includes the right to grant
484 | patent sublicenses in a manner consistent with the requirements of
485 | this License.
486 |
487 | Each contributor grants you a non-exclusive, worldwide, royalty-free
488 | patent license under the contributor's essential patent claims, to
489 | make, use, sell, offer for sale, import and otherwise run, modify and
490 | propagate the contents of its contributor version.
491 |
492 | In the following three paragraphs, a "patent license" is any express
493 | agreement or commitment, however denominated, not to enforce a patent
494 | (such as an express permission to practice a patent or covenant not to
495 | sue for patent infringement). To "grant" such a patent license to a
496 | party means to make such an agreement or commitment not to enforce a
497 | patent against the party.
498 |
499 | If you convey a covered work, knowingly relying on a patent license,
500 | and the Corresponding Source of the work is not available for anyone
501 | to copy, free of charge and under the terms of this License, through a
502 | publicly available network server or other readily accessible means,
503 | then you must either (1) cause the Corresponding Source to be so
504 | available, or (2) arrange to deprive yourself of the benefit of the
505 | patent license for this particular work, or (3) arrange, in a manner
506 | consistent with the requirements of this License, to extend the patent
507 | license to downstream recipients. "Knowingly relying" means you have
508 | actual knowledge that, but for the patent license, your conveying the
509 | covered work in a country, or your recipient's use of the covered work
510 | in a country, would infringe one or more identifiable patents in that
511 | country that you have reason to believe are valid.
512 |
513 | If, pursuant to or in connection with a single transaction or
514 | arrangement, you convey, or propagate by procuring conveyance of, a
515 | covered work, and grant a patent license to some of the parties
516 | receiving the covered work authorizing them to use, propagate, modify
517 | or convey a specific copy of the covered work, then the patent license
518 | you grant is automatically extended to all recipients of the covered
519 | work and works based on it.
520 |
521 | A patent license is "discriminatory" if it does not include within
522 | the scope of its coverage, prohibits the exercise of, or is
523 | conditioned on the non-exercise of one or more of the rights that are
524 | specifically granted under this License. You may not convey a covered
525 | work if you are a party to an arrangement with a third party that is
526 | in the business of distributing software, under which you make payment
527 | to the third party based on the extent of your activity of conveying
528 | the work, and under which the third party grants, to any of the
529 | parties who would receive the covered work from you, a discriminatory
530 | patent license (a) in connection with copies of the covered work
531 | conveyed by you (or copies made from those copies), or (b) primarily
532 | for and in connection with specific products or compilations that
533 | contain the covered work, unless you entered into that arrangement,
534 | or that patent license was granted, prior to 28 March 2007.
535 |
536 | Nothing in this License shall be construed as excluding or limiting
537 | any implied license or other defenses to infringement that may
538 | otherwise be available to you under applicable patent law.
539 |
540 | 12. No Surrender of Others' Freedom.
541 |
542 | If conditions are imposed on you (whether by court order, agreement or
543 | otherwise) that contradict the conditions of this License, they do not
544 | excuse you from the conditions of this License. If you cannot convey a
545 | covered work so as to satisfy simultaneously your obligations under this
546 | License and any other pertinent obligations, then as a consequence you may
547 | not convey it at all. For example, if you agree to terms that obligate you
548 | to collect a royalty for further conveying from those to whom you convey
549 | the Program, the only way you could satisfy both those terms and this
550 | License would be to refrain entirely from conveying the Program.
551 |
552 | 13. Use with the GNU Affero General Public License.
553 |
554 | Notwithstanding any other provision of this License, you have
555 | permission to link or combine any covered work with a work licensed
556 | under version 3 of the GNU Affero General Public License into a single
557 | combined work, and to convey the resulting work. The terms of this
558 | License will continue to apply to the part which is the covered work,
559 | but the special requirements of the GNU Affero General Public License,
560 | section 13, concerning interaction through a network will apply to the
561 | combination as such.
562 |
563 | 14. Revised Versions of this License.
564 |
565 | The Free Software Foundation may publish revised and/or new versions of
566 | the GNU General Public License from time to time. Such new versions will
567 | be similar in spirit to the present version, but may differ in detail to
568 | address new problems or concerns.
569 |
570 | Each version is given a distinguishing version number. If the
571 | Program specifies that a certain numbered version of the GNU General
572 | Public License "or any later version" applies to it, you have the
573 | option of following the terms and conditions either of that numbered
574 | version or of any later version published by the Free Software
575 | Foundation. If the Program does not specify a version number of the
576 | GNU General Public License, you may choose any version ever published
577 | by the Free Software Foundation.
578 |
579 | If the Program specifies that a proxy can decide which future
580 | versions of the GNU General Public License can be used, that proxy's
581 | public statement of acceptance of a version permanently authorizes you
582 | to choose that version for the Program.
583 |
584 | Later license versions may give you additional or different
585 | permissions. However, no additional obligations are imposed on any
586 | author or copyright holder as a result of your choosing to follow a
587 | later version.
588 |
589 | 15. Disclaimer of Warranty.
590 |
591 | THERE IS NO WARRANTY FOR THE PROGRAM, TO THE EXTENT PERMITTED BY
592 | APPLICABLE LAW. EXCEPT WHEN OTHERWISE STATED IN WRITING THE COPYRIGHT
593 | HOLDERS AND/OR OTHER PARTIES PROVIDE THE PROGRAM "AS IS" WITHOUT WARRANTY
594 | OF ANY KIND, EITHER EXPRESSED OR IMPLIED, INCLUDING, BUT NOT LIMITED TO,
595 | THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR A PARTICULAR
596 | PURPOSE. THE ENTIRE RISK AS TO THE QUALITY AND PERFORMANCE OF THE PROGRAM
597 | IS WITH YOU. SHOULD THE PROGRAM PROVE DEFECTIVE, YOU ASSUME THE COST OF
598 | ALL NECESSARY SERVICING, REPAIR OR CORRECTION.
599 |
600 | 16. Limitation of Liability.
601 |
602 | IN NO EVENT UNLESS REQUIRED BY APPLICABLE LAW OR AGREED TO IN WRITING
603 | WILL ANY COPYRIGHT HOLDER, OR ANY OTHER PARTY WHO MODIFIES AND/OR CONVEYS
604 | THE PROGRAM AS PERMITTED ABOVE, BE LIABLE TO YOU FOR DAMAGES, INCLUDING ANY
605 | GENERAL, SPECIAL, INCIDENTAL OR CONSEQUENTIAL DAMAGES ARISING OUT OF THE
606 | USE OR INABILITY TO USE THE PROGRAM (INCLUDING BUT NOT LIMITED TO LOSS OF
607 | DATA OR DATA BEING RENDERED INACCURATE OR LOSSES SUSTAINED BY YOU OR THIRD
608 | PARTIES OR A FAILURE OF THE PROGRAM TO OPERATE WITH ANY OTHER PROGRAMS),
609 | EVEN IF SUCH HOLDER OR OTHER PARTY HAS BEEN ADVISED OF THE POSSIBILITY OF
610 | SUCH DAMAGES.
611 |
612 | 17. Interpretation of Sections 15 and 16.
613 |
614 | If the disclaimer of warranty and limitation of liability provided
615 | above cannot be given local legal effect according to their terms,
616 | reviewing courts shall apply local law that most closely approximates
617 | an absolute waiver of all civil liability in connection with the
618 | Program, unless a warranty or assumption of liability accompanies a
619 | copy of the Program in return for a fee.
620 |
621 | END OF TERMS AND CONDITIONS
622 |
623 | How to Apply These Terms to Your New Programs
624 |
625 | If you develop a new program, and you want it to be of the greatest
626 | possible use to the public, the best way to achieve this is to make it
627 | free software which everyone can redistribute and change under these terms.
628 |
629 | To do so, attach the following notices to the program. It is safest
630 | to attach them to the start of each source file to most effectively
631 | state the exclusion of warranty; and each file should have at least
632 | the "copyright" line and a pointer to where the full notice is found.
633 |
634 |
635 | Copyright (C)
636 |
637 | This program is free software: you can redistribute it and/or modify
638 | it under the terms of the GNU General Public License as published by
639 | the Free Software Foundation, either version 3 of the License, or
640 | (at your option) any later version.
641 |
642 | This program is distributed in the hope that it will be useful,
643 | but WITHOUT ANY WARRANTY; without even the implied warranty of
644 | MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the
645 | GNU General Public License for more details.
646 |
647 | You should have received a copy of the GNU General Public License
648 | along with this program. If not, see .
649 |
650 | Also add information on how to contact you by electronic and paper mail.
651 |
652 | If the program does terminal interaction, make it output a short
653 | notice like this when it starts in an interactive mode:
654 |
655 | Copyright (C)
656 | This program comes with ABSOLUTELY NO WARRANTY; for details type `show w'.
657 | This is free software, and you are welcome to redistribute it
658 | under certain conditions; type `show c' for details.
659 |
660 | The hypothetical commands `show w' and `show c' should show the appropriate
661 | parts of the General Public License. Of course, your program's commands
662 | might be different; for a GUI interface, you would use an "about box".
663 |
664 | You should also get your employer (if you work as a programmer) or school,
665 | if any, to sign a "copyright disclaimer" for the program, if necessary.
666 | For more information on this, and how to apply and follow the GNU GPL, see
667 | .
668 |
669 | The GNU General Public License does not permit incorporating your program
670 | into proprietary programs. If your program is a subroutine library, you
671 | may consider it more useful to permit linking proprietary applications with
672 | the library. If this is what you want to do, use the GNU Lesser General
673 | Public License instead of this License. But first, please read
674 | .
675 |
--------------------------------------------------------------------------------
/hg19_references/hg19_chrom_sizes.tsv:
--------------------------------------------------------------------------------
1 | chr1 249250621
2 | chr2 243199373
3 | chr3 198022430
4 | chr4 191154276
5 | chr5 180915260
6 | chr6 171115067
7 | chr7 159138663
8 | chr8 146364022
9 | chr9 141213431
10 | chr10 135534747
11 | chr11 135006516
12 | chr12 133851895
13 | chr13 115169878
14 | chr14 107349540
15 | chr15 102531392
16 | chr16 90354753
17 | chr17 81195210
18 | chr18 78077248
19 | chr19 59128983
20 | chr20 63025520
21 | chr21 48129895
22 | chr22 51304566
23 | chrX 155270560
24 | chrY 59373566
25 | chrM 16571
26 |
--------------------------------------------------------------------------------
/hg38_references/hg38_1e+06_cytoband_densities_granges.tsv:
--------------------------------------------------------------------------------
1 | chr1 1 1000000 p
2 | chr1 1000001 2000000 p
3 | chr1 2000001 3000000 p
4 | chr1 3000001 4000000 p
5 | chr1 4000001 5000000 p
6 | chr1 5000001 6000000 p
7 | chr1 6000001 7000000 p
8 | chr1 7000001 8000000 p
9 | chr1 8000001 9000000 p
10 | chr1 9000001 10000000 p
11 | chr1 10000001 11000000 p
12 | chr1 11000001 12000000 p
13 | chr1 12000001 13000000 p
14 | chr1 13000001 14000000 p
15 | chr1 14000001 15000000 p
16 | chr1 15000001 16000000 p
17 | chr1 16000001 17000000 p
18 | chr1 17000001 18000000 p
19 | chr1 18000001 19000000 p
20 | chr1 19000001 20000000 p
21 | chr1 20000001 21000000 p
22 | chr1 21000001 22000000 p
23 | chr1 22000001 23000000 p
24 | chr1 23000001 24000000 p
25 | chr1 24000001 25000000 p
26 | chr1 25000001 26000000 p
27 | chr1 26000001 27000000 p
28 | chr1 27000001 28000000 p
29 | chr1 28000001 29000000 p
30 | chr1 29000001 30000000 p
31 | chr1 30000001 31000000 p
32 | chr1 31000001 32000000 p
33 | chr1 32000001 33000000 p
34 | chr1 33000001 34000000 p
35 | chr1 34000001 35000000 p
36 | chr1 35000001 36000000 p
37 | chr1 36000001 37000000 p
38 | chr1 37000001 38000000 p
39 | chr1 38000001 39000000 p
40 | chr1 39000001 40000000 p
41 | chr1 40000001 41000000 p
42 | chr1 41000001 42000000 p
43 | chr1 42000001 43000000 p
44 | chr1 43000001 44000000 p
45 | chr1 44000001 45000000 p
46 | chr1 45000001 46000000 p
47 | chr1 46000001 47000000 p
48 | chr1 47000001 48000000 p
49 | chr1 48000001 49000000 p
50 | chr1 49000001 50000000 p
51 | chr1 50000001 51000000 p
52 | chr1 51000001 52000000 p
53 | chr1 52000001 53000000 p
54 | chr1 53000001 54000000 p
55 | chr1 54000001 55000000 p
56 | chr1 55000001 56000000 p
57 | chr1 56000001 57000000 p
58 | chr1 57000001 58000000 p
59 | chr1 58000001 59000000 p
60 | chr1 59000001 60000000 p
61 | chr1 60000001 61000000 p
62 | chr1 61000001 62000000 p
63 | chr1 62000001 63000000 p
64 | chr1 63000001 64000000 p
65 | chr1 64000001 65000000 p
66 | chr1 65000001 66000000 p
67 | chr1 66000001 67000000 p
68 | chr1 67000001 68000000 p
69 | chr1 68000001 69000000 p
70 | chr1 69000001 70000000 p
71 | chr1 70000001 71000000 p
72 | chr1 71000001 72000000 p
73 | chr1 72000001 73000000 p
74 | chr1 73000001 74000000 p
75 | chr1 74000001 75000000 p
76 | chr1 75000001 76000000 p
77 | chr1 76000001 77000000 p
78 | chr1 77000001 78000000 p
79 | chr1 78000001 79000000 p
80 | chr1 79000001 80000000 p
81 | chr1 80000001 81000000 p
82 | chr1 81000001 82000000 p
83 | chr1 82000001 83000000 p
84 | chr1 83000001 84000000 p
85 | chr1 84000001 85000000 p
86 | chr1 85000001 86000000 p
87 | chr1 86000001 87000000 p
88 | chr1 87000001 88000000 p
89 | chr1 88000001 89000000 p
90 | chr1 89000001 90000000 p
91 | chr1 90000001 91000000 p
92 | chr1 91000001 92000000 p
93 | chr1 92000001 93000000 p
94 | chr1 93000001 94000000 p
95 | chr1 94000001 95000000 p
96 | chr1 95000001 96000000 p
97 | chr1 96000001 97000000 p
98 | chr1 97000001 98000000 p
99 | chr1 98000001 99000000 p
100 | chr1 99000001 100000000 p
101 | chr1 100000001 101000000 p
102 | chr1 101000001 102000000 p
103 | chr1 102000001 103000000 p
104 | chr1 103000001 104000000 p
105 | chr1 104000001 105000000 p
106 | chr1 105000001 106000000 p
107 | chr1 106000001 107000000 p
108 | chr1 107000001 108000000 p
109 | chr1 108000001 109000000 p
110 | chr1 109000001 110000000 p
111 | chr1 110000001 111000000 p
112 | chr1 111000001 112000000 p
113 | chr1 112000001 113000000 p
114 | chr1 113000001 114000000 p
115 | chr1 114000001 115000000 p
116 | chr1 115000001 116000000 p
117 | chr1 116000001 117000000 p
118 | chr1 117000001 118000000 p
119 | chr1 118000001 119000000 p
120 | chr1 119000001 120000000 p
121 | chr1 120000001 121000000 p
122 | chr1 121000001 122000000 p
123 | chr1 122000001 123000000 cen
124 | chr1 123000001 124000000 cen
125 | chr1 124000001 125000000 cen
126 | chr1 125000001 126000000 cen
127 | chr1 126000001 127000000 q
128 | chr1 127000001 128000000 q
129 | chr1 128000001 129000000 q
130 | chr1 129000001 130000000 q
131 | chr1 130000001 131000000 q
132 | chr1 131000001 132000000 q
133 | chr1 132000001 133000000 q
134 | chr1 133000001 134000000 q
135 | chr1 134000001 135000000 q
136 | chr1 135000001 136000000 q
137 | chr1 136000001 137000000 q
138 | chr1 137000001 138000000 q
139 | chr1 138000001 139000000 q
140 | chr1 139000001 140000000 q
141 | chr1 140000001 141000000 q
142 | chr1 141000001 142000000 q
143 | chr1 142000001 143000000 q
144 | chr1 143000001 144000000 q
145 | chr1 144000001 145000000 q
146 | chr1 145000001 146000000 q
147 | chr1 146000001 147000000 q
148 | chr1 147000001 148000000 q
149 | chr1 148000001 149000000 q
150 | chr1 149000001 150000000 q
151 | chr1 150000001 151000000 q
152 | chr1 151000001 152000000 q
153 | chr1 152000001 153000000 q
154 | chr1 153000001 154000000 q
155 | chr1 154000001 155000000 q
156 | chr1 155000001 156000000 q
157 | chr1 156000001 157000000 q
158 | chr1 157000001 158000000 q
159 | chr1 158000001 159000000 q
160 | chr1 159000001 160000000 q
161 | chr1 160000001 161000000 q
162 | chr1 161000001 162000000 q
163 | chr1 162000001 163000000 q
164 | chr1 163000001 164000000 q
165 | chr1 164000001 165000000 q
166 | chr1 165000001 166000000 q
167 | chr1 166000001 167000000 q
168 | chr1 167000001 168000000 q
169 | chr1 168000001 169000000 q
170 | chr1 169000001 170000000 q
171 | chr1 170000001 171000000 q
172 | chr1 171000001 172000000 q
173 | chr1 172000001 173000000 q
174 | chr1 173000001 174000000 q
175 | chr1 174000001 175000000 q
176 | chr1 175000001 176000000 q
177 | chr1 176000001 177000000 q
178 | chr1 177000001 178000000 q
179 | chr1 178000001 179000000 q
180 | chr1 179000001 180000000 q
181 | chr1 180000001 181000000 q
182 | chr1 181000001 182000000 q
183 | chr1 182000001 183000000 q
184 | chr1 183000001 184000000 q
185 | chr1 184000001 185000000 q
186 | chr1 185000001 186000000 q
187 | chr1 186000001 187000000 q
188 | chr1 187000001 188000000 q
189 | chr1 188000001 189000000 q
190 | chr1 189000001 190000000 q
191 | chr1 190000001 191000000 q
192 | chr1 191000001 192000000 q
193 | chr1 192000001 193000000 q
194 | chr1 193000001 194000000 q
195 | chr1 194000001 195000000 q
196 | chr1 195000001 196000000 q
197 | chr1 196000001 197000000 q
198 | chr1 197000001 198000000 q
199 | chr1 198000001 199000000 q
200 | chr1 199000001 200000000 q
201 | chr1 200000001 201000000 q
202 | chr1 201000001 202000000 q
203 | chr1 202000001 203000000 q
204 | chr1 203000001 204000000 q
205 | chr1 204000001 205000000 q
206 | chr1 205000001 206000000 q
207 | chr1 206000001 207000000 q
208 | chr1 207000001 208000000 q
209 | chr1 208000001 209000000 q
210 | chr1 209000001 210000000 q
211 | chr1 210000001 211000000 q
212 | chr1 211000001 212000000 q
213 | chr1 212000001 213000000 q
214 | chr1 213000001 214000000 q
215 | chr1 214000001 215000000 q
216 | chr1 215000001 216000000 q
217 | chr1 216000001 217000000 q
218 | chr1 217000001 218000000 q
219 | chr1 218000001 219000000 q
220 | chr1 219000001 220000000 q
221 | chr1 220000001 221000000 q
222 | chr1 221000001 222000000 q
223 | chr1 222000001 223000000 q
224 | chr1 223000001 224000000 q
225 | chr1 224000001 225000000 q
226 | chr1 225000001 226000000 q
227 | chr1 226000001 227000000 q
228 | chr1 227000001 228000000 q
229 | chr1 228000001 229000000 q
230 | chr1 229000001 230000000 q
231 | chr1 230000001 231000000 q
232 | chr1 231000001 232000000 q
233 | chr1 232000001 233000000 q
234 | chr1 233000001 234000000 q
235 | chr1 234000001 235000000 q
236 | chr1 235000001 236000000 q
237 | chr1 236000001 237000000 q
238 | chr1 237000001 238000000 q
239 | chr1 238000001 239000000 q
240 | chr1 239000001 240000000 q
241 | chr1 240000001 241000000 q
242 | chr1 241000001 242000000 q
243 | chr1 242000001 243000000 q
244 | chr1 243000001 244000000 q
245 | chr1 244000001 245000000 q
246 | chr1 245000001 246000000 q
247 | chr1 246000001 247000000 q
248 | chr1 247000001 248000000 q
249 | chr1 248000001 248956422 q
250 | chr2 1 1000000 p
251 | chr2 1000001 2000000 p
252 | chr2 2000001 3000000 p
253 | chr2 3000001 4000000 p
254 | chr2 4000001 5000000 p
255 | chr2 5000001 6000000 p
256 | chr2 6000001 7000000 p
257 | chr2 7000001 8000000 p
258 | chr2 8000001 9000000 p
259 | chr2 9000001 10000000 p
260 | chr2 10000001 11000000 p
261 | chr2 11000001 12000000 p
262 | chr2 12000001 13000000 p
263 | chr2 13000001 14000000 p
264 | chr2 14000001 15000000 p
265 | chr2 15000001 16000000 p
266 | chr2 16000001 17000000 p
267 | chr2 17000001 18000000 p
268 | chr2 18000001 19000000 p
269 | chr2 19000001 20000000 p
270 | chr2 20000001 21000000 p
271 | chr2 21000001 22000000 p
272 | chr2 22000001 23000000 p
273 | chr2 23000001 24000000 p
274 | chr2 24000001 25000000 p
275 | chr2 25000001 26000000 p
276 | chr2 26000001 27000000 p
277 | chr2 27000001 28000000 p
278 | chr2 28000001 29000000 p
279 | chr2 29000001 30000000 p
280 | chr2 30000001 31000000 p
281 | chr2 31000001 32000000 p
282 | chr2 32000001 33000000 p
283 | chr2 33000001 34000000 p
284 | chr2 34000001 35000000 p
285 | chr2 35000001 36000000 p
286 | chr2 36000001 37000000 p
287 | chr2 37000001 38000000 p
288 | chr2 38000001 39000000 p
289 | chr2 39000001 40000000 p
290 | chr2 40000001 41000000 p
291 | chr2 41000001 42000000 p
292 | chr2 42000001 43000000 p
293 | chr2 43000001 44000000 p
294 | chr2 44000001 45000000 p
295 | chr2 45000001 46000000 p
296 | chr2 46000001 47000000 p
297 | chr2 47000001 48000000 p
298 | chr2 48000001 49000000 p
299 | chr2 49000001 50000000 p
300 | chr2 50000001 51000000 p
301 | chr2 51000001 52000000 p
302 | chr2 52000001 53000000 p
303 | chr2 53000001 54000000 p
304 | chr2 54000001 55000000 p
305 | chr2 55000001 56000000 p
306 | chr2 56000001 57000000 p
307 | chr2 57000001 58000000 p
308 | chr2 58000001 59000000 p
309 | chr2 59000001 60000000 p
310 | chr2 60000001 61000000 p
311 | chr2 61000001 62000000 p
312 | chr2 62000001 63000000 p
313 | chr2 63000001 64000000 p
314 | chr2 64000001 65000000 p
315 | chr2 65000001 66000000 p
316 | chr2 66000001 67000000 p
317 | chr2 67000001 68000000 p
318 | chr2 68000001 69000000 p
319 | chr2 69000001 70000000 p
320 | chr2 70000001 71000000 p
321 | chr2 71000001 72000000 p
322 | chr2 72000001 73000000 p
323 | chr2 73000001 74000000 p
324 | chr2 74000001 75000000 p
325 | chr2 75000001 76000000 p
326 | chr2 76000001 77000000 p
327 | chr2 77000001 78000000 p
328 | chr2 78000001 79000000 p
329 | chr2 79000001 80000000 p
330 | chr2 80000001 81000000 p
331 | chr2 81000001 82000000 p
332 | chr2 82000001 83000000 p
333 | chr2 83000001 84000000 p
334 | chr2 84000001 85000000 p
335 | chr2 85000001 86000000 p
336 | chr2 86000001 87000000 p
337 | chr2 87000001 88000000 p
338 | chr2 88000001 89000000 p
339 | chr2 89000001 90000000 p
340 | chr2 90000001 91000000 p
341 | chr2 91000001 92000000 p
342 | chr2 92000001 93000000 cen
343 | chr2 93000001 94000000 cen
344 | chr2 94000001 95000000 cen
345 | chr2 95000001 96000000 cen
346 | chr2 96000001 97000000 q
347 | chr2 97000001 98000000 q
348 | chr2 98000001 99000000 q
349 | chr2 99000001 100000000 q
350 | chr2 100000001 101000000 q
351 | chr2 101000001 102000000 q
352 | chr2 102000001 103000000 q
353 | chr2 103000001 104000000 q
354 | chr2 104000001 105000000 q
355 | chr2 105000001 106000000 q
356 | chr2 106000001 107000000 q
357 | chr2 107000001 108000000 q
358 | chr2 108000001 109000000 q
359 | chr2 109000001 110000000 q
360 | chr2 110000001 111000000 q
361 | chr2 111000001 112000000 q
362 | chr2 112000001 113000000 q
363 | chr2 113000001 114000000 q
364 | chr2 114000001 115000000 q
365 | chr2 115000001 116000000 q
366 | chr2 116000001 117000000 q
367 | chr2 117000001 118000000 q
368 | chr2 118000001 119000000 q
369 | chr2 119000001 120000000 q
370 | chr2 120000001 121000000 q
371 | chr2 121000001 122000000 q
372 | chr2 122000001 123000000 q
373 | chr2 123000001 124000000 q
374 | chr2 124000001 125000000 q
375 | chr2 125000001 126000000 q
376 | chr2 126000001 127000000 q
377 | chr2 127000001 128000000 q
378 | chr2 128000001 129000000 q
379 | chr2 129000001 130000000 q
380 | chr2 130000001 131000000 q
381 | chr2 131000001 132000000 q
382 | chr2 132000001 133000000 q
383 | chr2 133000001 134000000 q
384 | chr2 134000001 135000000 q
385 | chr2 135000001 136000000 q
386 | chr2 136000001 137000000 q
387 | chr2 137000001 138000000 q
388 | chr2 138000001 139000000 q
389 | chr2 139000001 140000000 q
390 | chr2 140000001 141000000 q
391 | chr2 141000001 142000000 q
392 | chr2 142000001 143000000 q
393 | chr2 143000001 144000000 q
394 | chr2 144000001 145000000 q
395 | chr2 145000001 146000000 q
396 | chr2 146000001 147000000 q
397 | chr2 147000001 148000000 q
398 | chr2 148000001 149000000 q
399 | chr2 149000001 150000000 q
400 | chr2 150000001 151000000 q
401 | chr2 151000001 152000000 q
402 | chr2 152000001 153000000 q
403 | chr2 153000001 154000000 q
404 | chr2 154000001 155000000 q
405 | chr2 155000001 156000000 q
406 | chr2 156000001 157000000 q
407 | chr2 157000001 158000000 q
408 | chr2 158000001 159000000 q
409 | chr2 159000001 160000000 q
410 | chr2 160000001 161000000 q
411 | chr2 161000001 162000000 q
412 | chr2 162000001 163000000 q
413 | chr2 163000001 164000000 q
414 | chr2 164000001 165000000 q
415 | chr2 165000001 166000000 q
416 | chr2 166000001 167000000 q
417 | chr2 167000001 168000000 q
418 | chr2 168000001 169000000 q
419 | chr2 169000001 170000000 q
420 | chr2 170000001 171000000 q
421 | chr2 171000001 172000000 q
422 | chr2 172000001 173000000 q
423 | chr2 173000001 174000000 q
424 | chr2 174000001 175000000 q
425 | chr2 175000001 176000000 q
426 | chr2 176000001 177000000 q
427 | chr2 177000001 178000000 q
428 | chr2 178000001 179000000 q
429 | chr2 179000001 180000000 q
430 | chr2 180000001 181000000 q
431 | chr2 181000001 182000000 q
432 | chr2 182000001 183000000 q
433 | chr2 183000001 184000000 q
434 | chr2 184000001 185000000 q
435 | chr2 185000001 186000000 q
436 | chr2 186000001 187000000 q
437 | chr2 187000001 188000000 q
438 | chr2 188000001 189000000 q
439 | chr2 189000001 190000000 q
440 | chr2 190000001 191000000 q
441 | chr2 191000001 192000000 q
442 | chr2 192000001 193000000 q
443 | chr2 193000001 194000000 q
444 | chr2 194000001 195000000 q
445 | chr2 195000001 196000000 q
446 | chr2 196000001 197000000 q
447 | chr2 197000001 198000000 q
448 | chr2 198000001 199000000 q
449 | chr2 199000001 200000000 q
450 | chr2 200000001 201000000 q
451 | chr2 201000001 202000000 q
452 | chr2 202000001 203000000 q
453 | chr2 203000001 204000000 q
454 | chr2 204000001 205000000 q
455 | chr2 205000001 206000000 q
456 | chr2 206000001 207000000 q
457 | chr2 207000001 208000000 q
458 | chr2 208000001 209000000 q
459 | chr2 209000001 210000000 q
460 | chr2 210000001 211000000 q
461 | chr2 211000001 212000000 q
462 | chr2 212000001 213000000 q
463 | chr2 213000001 214000000 q
464 | chr2 214000001 215000000 q
465 | chr2 215000001 216000000 q
466 | chr2 216000001 217000000 q
467 | chr2 217000001 218000000 q
468 | chr2 218000001 219000000 q
469 | chr2 219000001 220000000 q
470 | chr2 220000001 221000000 q
471 | chr2 221000001 222000000 q
472 | chr2 222000001 223000000 q
473 | chr2 223000001 224000000 q
474 | chr2 224000001 225000000 q
475 | chr2 225000001 226000000 q
476 | chr2 226000001 227000000 q
477 | chr2 227000001 228000000 q
478 | chr2 228000001 229000000 q
479 | chr2 229000001 230000000 q
480 | chr2 230000001 231000000 q
481 | chr2 231000001 232000000 q
482 | chr2 232000001 233000000 q
483 | chr2 233000001 234000000 q
484 | chr2 234000001 235000000 q
485 | chr2 235000001 236000000 q
486 | chr2 236000001 237000000 q
487 | chr2 237000001 238000000 q
488 | chr2 238000001 239000000 q
489 | chr2 239000001 240000000 q
490 | chr2 240000001 241000000 q
491 | chr2 241000001 242000000 q
492 | chr2 242000001 242193529 q
493 | chr3 1 1000000 p
494 | chr3 1000001 2000000 p
495 | chr3 2000001 3000000 p
496 | chr3 3000001 4000000 p
497 | chr3 4000001 5000000 p
498 | chr3 5000001 6000000 p
499 | chr3 6000001 7000000 p
500 | chr3 7000001 8000000 p
501 | chr3 8000001 9000000 p
502 | chr3 9000001 10000000 p
503 | chr3 10000001 11000000 p
504 | chr3 11000001 12000000 p
505 | chr3 12000001 13000000 p
506 | chr3 13000001 14000000 p
507 | chr3 14000001 15000000 p
508 | chr3 15000001 16000000 p
509 | chr3 16000001 17000000 p
510 | chr3 17000001 18000000 p
511 | chr3 18000001 19000000 p
512 | chr3 19000001 20000000 p
513 | chr3 20000001 21000000 p
514 | chr3 21000001 22000000 p
515 | chr3 22000001 23000000 p
516 | chr3 23000001 24000000 p
517 | chr3 24000001 25000000 p
518 | chr3 25000001 26000000 p
519 | chr3 26000001 27000000 p
520 | chr3 27000001 28000000 p
521 | chr3 28000001 29000000 p
522 | chr3 29000001 30000000 p
523 | chr3 30000001 31000000 p
524 | chr3 31000001 32000000 p
525 | chr3 32000001 33000000 p
526 | chr3 33000001 34000000 p
527 | chr3 34000001 35000000 p
528 | chr3 35000001 36000000 p
529 | chr3 36000001 37000000 p
530 | chr3 37000001 38000000 p
531 | chr3 38000001 39000000 p
532 | chr3 39000001 40000000 p
533 | chr3 40000001 41000000 p
534 | chr3 41000001 42000000 p
535 | chr3 42000001 43000000 p
536 | chr3 43000001 44000000 p
537 | chr3 44000001 45000000 p
538 | chr3 45000001 46000000 p
539 | chr3 46000001 47000000 p
540 | chr3 47000001 48000000 p
541 | chr3 48000001 49000000 p
542 | chr3 49000001 50000000 p
543 | chr3 50000001 51000000 p
544 | chr3 51000001 52000000 p
545 | chr3 52000001 53000000 p
546 | chr3 53000001 54000000 p
547 | chr3 54000001 55000000 p
548 | chr3 55000001 56000000 p
549 | chr3 56000001 57000000 p
550 | chr3 57000001 58000000 p
551 | chr3 58000001 59000000 p
552 | chr3 59000001 60000000 p
553 | chr3 60000001 61000000 p
554 | chr3 61000001 62000000 p
555 | chr3 62000001 63000000 p
556 | chr3 63000001 64000000 p
557 | chr3 64000001 65000000 p
558 | chr3 65000001 66000000 p
559 | chr3 66000001 67000000 p
560 | chr3 67000001 68000000 p
561 | chr3 68000001 69000000 p
562 | chr3 69000001 70000000 p
563 | chr3 70000001 71000000 p
564 | chr3 71000001 72000000 p
565 | chr3 72000001 73000000 p
566 | chr3 73000001 74000000 p
567 | chr3 74000001 75000000 p
568 | chr3 75000001 76000000 p
569 | chr3 76000001 77000000 p
570 | chr3 77000001 78000000 p
571 | chr3 78000001 79000000 p
572 | chr3 79000001 80000000 p
573 | chr3 80000001 81000000 p
574 | chr3 81000001 82000000 p
575 | chr3 82000001 83000000 p
576 | chr3 83000001 84000000 p
577 | chr3 84000001 85000000 p
578 | chr3 85000001 86000000 p
579 | chr3 86000001 87000000 p
580 | chr3 87000001 88000000 p
581 | chr3 88000001 89000000 cen
582 | chr3 89000001 90000000 cen
583 | chr3 90000001 91000000 cen
584 | chr3 91000001 92000000 cen
585 | chr3 92000001 93000000 cen
586 | chr3 93000001 94000000 cen
587 | chr3 94000001 95000000 q
588 | chr3 95000001 96000000 q
589 | chr3 96000001 97000000 q
590 | chr3 97000001 98000000 q
591 | chr3 98000001 99000000 q
592 | chr3 99000001 100000000 q
593 | chr3 100000001 101000000 q
594 | chr3 101000001 102000000 q
595 | chr3 102000001 103000000 q
596 | chr3 103000001 104000000 q
597 | chr3 104000001 105000000 q
598 | chr3 105000001 106000000 q
599 | chr3 106000001 107000000 q
600 | chr3 107000001 108000000 q
601 | chr3 108000001 109000000 q
602 | chr3 109000001 110000000 q
603 | chr3 110000001 111000000 q
604 | chr3 111000001 112000000 q
605 | chr3 112000001 113000000 q
606 | chr3 113000001 114000000 q
607 | chr3 114000001 115000000 q
608 | chr3 115000001 116000000 q
609 | chr3 116000001 117000000 q
610 | chr3 117000001 118000000 q
611 | chr3 118000001 119000000 q
612 | chr3 119000001 120000000 q
613 | chr3 120000001 121000000 q
614 | chr3 121000001 122000000 q
615 | chr3 122000001 123000000 q
616 | chr3 123000001 124000000 q
617 | chr3 124000001 125000000 q
618 | chr3 125000001 126000000 q
619 | chr3 126000001 127000000 q
620 | chr3 127000001 128000000 q
621 | chr3 128000001 129000000 q
622 | chr3 129000001 130000000 q
623 | chr3 130000001 131000000 q
624 | chr3 131000001 132000000 q
625 | chr3 132000001 133000000 q
626 | chr3 133000001 134000000 q
627 | chr3 134000001 135000000 q
628 | chr3 135000001 136000000 q
629 | chr3 136000001 137000000 q
630 | chr3 137000001 138000000 q
631 | chr3 138000001 139000000 q
632 | chr3 139000001 140000000 q
633 | chr3 140000001 141000000 q
634 | chr3 141000001 142000000 q
635 | chr3 142000001 143000000 q
636 | chr3 143000001 144000000 q
637 | chr3 144000001 145000000 q
638 | chr3 145000001 146000000 q
639 | chr3 146000001 147000000 q
640 | chr3 147000001 148000000 q
641 | chr3 148000001 149000000 q
642 | chr3 149000001 150000000 q
643 | chr3 150000001 151000000 q
644 | chr3 151000001 152000000 q
645 | chr3 152000001 153000000 q
646 | chr3 153000001 154000000 q
647 | chr3 154000001 155000000 q
648 | chr3 155000001 156000000 q
649 | chr3 156000001 157000000 q
650 | chr3 157000001 158000000 q
651 | chr3 158000001 159000000 q
652 | chr3 159000001 160000000 q
653 | chr3 160000001 161000000 q
654 | chr3 161000001 162000000 q
655 | chr3 162000001 163000000 q
656 | chr3 163000001 164000000 q
657 | chr3 164000001 165000000 q
658 | chr3 165000001 166000000 q
659 | chr3 166000001 167000000 q
660 | chr3 167000001 168000000 q
661 | chr3 168000001 169000000 q
662 | chr3 169000001 170000000 q
663 | chr3 170000001 171000000 q
664 | chr3 171000001 172000000 q
665 | chr3 172000001 173000000 q
666 | chr3 173000001 174000000 q
667 | chr3 174000001 175000000 q
668 | chr3 175000001 176000000 q
669 | chr3 176000001 177000000 q
670 | chr3 177000001 178000000 q
671 | chr3 178000001 179000000 q
672 | chr3 179000001 180000000 q
673 | chr3 180000001 181000000 q
674 | chr3 181000001 182000000 q
675 | chr3 182000001 183000000 q
676 | chr3 183000001 184000000 q
677 | chr3 184000001 185000000 q
678 | chr3 185000001 186000000 q
679 | chr3 186000001 187000000 q
680 | chr3 187000001 188000000 q
681 | chr3 188000001 189000000 q
682 | chr3 189000001 190000000 q
683 | chr3 190000001 191000000 q
684 | chr3 191000001 192000000 q
685 | chr3 192000001 193000000 q
686 | chr3 193000001 194000000 q
687 | chr3 194000001 195000000 q
688 | chr3 195000001 196000000 q
689 | chr3 196000001 197000000 q
690 | chr3 197000001 198000000 q
691 | chr3 198000001 198295559 q
692 | chr4 1 1000000 p
693 | chr4 1000001 2000000 p
694 | chr4 2000001 3000000 p
695 | chr4 3000001 4000000 p
696 | chr4 4000001 5000000 p
697 | chr4 5000001 6000000 p
698 | chr4 6000001 7000000 p
699 | chr4 7000001 8000000 p
700 | chr4 8000001 9000000 p
701 | chr4 9000001 10000000 p
702 | chr4 10000001 11000000 p
703 | chr4 11000001 12000000 p
704 | chr4 12000001 13000000 p
705 | chr4 13000001 14000000 p
706 | chr4 14000001 15000000 p
707 | chr4 15000001 16000000 p
708 | chr4 16000001 17000000 p
709 | chr4 17000001 18000000 p
710 | chr4 18000001 19000000 p
711 | chr4 19000001 20000000 p
712 | chr4 20000001 21000000 p
713 | chr4 21000001 22000000 p
714 | chr4 22000001 23000000 p
715 | chr4 23000001 24000000 p
716 | chr4 24000001 25000000 p
717 | chr4 25000001 26000000 p
718 | chr4 26000001 27000000 p
719 | chr4 27000001 28000000 p
720 | chr4 28000001 29000000 p
721 | chr4 29000001 30000000 p
722 | chr4 30000001 31000000 p
723 | chr4 31000001 32000000 p
724 | chr4 32000001 33000000 p
725 | chr4 33000001 34000000 p
726 | chr4 34000001 35000000 p
727 | chr4 35000001 36000000 p
728 | chr4 36000001 37000000 p
729 | chr4 37000001 38000000 p
730 | chr4 38000001 39000000 p
731 | chr4 39000001 40000000 p
732 | chr4 40000001 41000000 p
733 | chr4 41000001 42000000 p
734 | chr4 42000001 43000000 p
735 | chr4 43000001 44000000 p
736 | chr4 44000001 45000000 p
737 | chr4 45000001 46000000 p
738 | chr4 46000001 47000000 p
739 | chr4 47000001 48000000 p
740 | chr4 48000001 49000000 p
741 | chr4 49000001 50000000 cen
742 | chr4 50000001 51000000 cen
743 | chr4 51000001 52000000 cen
744 | chr4 52000001 53000000 q
745 | chr4 53000001 54000000 q
746 | chr4 54000001 55000000 q
747 | chr4 55000001 56000000 q
748 | chr4 56000001 57000000 q
749 | chr4 57000001 58000000 q
750 | chr4 58000001 59000000 q
751 | chr4 59000001 60000000 q
752 | chr4 60000001 61000000 q
753 | chr4 61000001 62000000 q
754 | chr4 62000001 63000000 q
755 | chr4 63000001 64000000 q
756 | chr4 64000001 65000000 q
757 | chr4 65000001 66000000 q
758 | chr4 66000001 67000000 q
759 | chr4 67000001 68000000 q
760 | chr4 68000001 69000000 q
761 | chr4 69000001 70000000 q
762 | chr4 70000001 71000000 q
763 | chr4 71000001 72000000 q
764 | chr4 72000001 73000000 q
765 | chr4 73000001 74000000 q
766 | chr4 74000001 75000000 q
767 | chr4 75000001 76000000 q
768 | chr4 76000001 77000000 q
769 | chr4 77000001 78000000 q
770 | chr4 78000001 79000000 q
771 | chr4 79000001 80000000 q
772 | chr4 80000001 81000000 q
773 | chr4 81000001 82000000 q
774 | chr4 82000001 83000000 q
775 | chr4 83000001 84000000 q
776 | chr4 84000001 85000000 q
777 | chr4 85000001 86000000 q
778 | chr4 86000001 87000000 q
779 | chr4 87000001 88000000 q
780 | chr4 88000001 89000000 q
781 | chr4 89000001 90000000 q
782 | chr4 90000001 91000000 q
783 | chr4 91000001 92000000 q
784 | chr4 92000001 93000000 q
785 | chr4 93000001 94000000 q
786 | chr4 94000001 95000000 q
787 | chr4 95000001 96000000 q
788 | chr4 96000001 97000000 q
789 | chr4 97000001 98000000 q
790 | chr4 98000001 99000000 q
791 | chr4 99000001 100000000 q
792 | chr4 100000001 101000000 q
793 | chr4 101000001 102000000 q
794 | chr4 102000001 103000000 q
795 | chr4 103000001 104000000 q
796 | chr4 104000001 105000000 q
797 | chr4 105000001 106000000 q
798 | chr4 106000001 107000000 q
799 | chr4 107000001 108000000 q
800 | chr4 108000001 109000000 q
801 | chr4 109000001 110000000 q
802 | chr4 110000001 111000000 q
803 | chr4 111000001 112000000 q
804 | chr4 112000001 113000000 q
805 | chr4 113000001 114000000 q
806 | chr4 114000001 115000000 q
807 | chr4 115000001 116000000 q
808 | chr4 116000001 117000000 q
809 | chr4 117000001 118000000 q
810 | chr4 118000001 119000000 q
811 | chr4 119000001 120000000 q
812 | chr4 120000001 121000000 q
813 | chr4 121000001 122000000 q
814 | chr4 122000001 123000000 q
815 | chr4 123000001 124000000 q
816 | chr4 124000001 125000000 q
817 | chr4 125000001 126000000 q
818 | chr4 126000001 127000000 q
819 | chr4 127000001 128000000 q
820 | chr4 128000001 129000000 q
821 | chr4 129000001 130000000 q
822 | chr4 130000001 131000000 q
823 | chr4 131000001 132000000 q
824 | chr4 132000001 133000000 q
825 | chr4 133000001 134000000 q
826 | chr4 134000001 135000000 q
827 | chr4 135000001 136000000 q
828 | chr4 136000001 137000000 q
829 | chr4 137000001 138000000 q
830 | chr4 138000001 139000000 q
831 | chr4 139000001 140000000 q
832 | chr4 140000001 141000000 q
833 | chr4 141000001 142000000 q
834 | chr4 142000001 143000000 q
835 | chr4 143000001 144000000 q
836 | chr4 144000001 145000000 q
837 | chr4 145000001 146000000 q
838 | chr4 146000001 147000000 q
839 | chr4 147000001 148000000 q
840 | chr4 148000001 149000000 q
841 | chr4 149000001 150000000 q
842 | chr4 150000001 151000000 q
843 | chr4 151000001 152000000 q
844 | chr4 152000001 153000000 q
845 | chr4 153000001 154000000 q
846 | chr4 154000001 155000000 q
847 | chr4 155000001 156000000 q
848 | chr4 156000001 157000000 q
849 | chr4 157000001 158000000 q
850 | chr4 158000001 159000000 q
851 | chr4 159000001 160000000 q
852 | chr4 160000001 161000000 q
853 | chr4 161000001 162000000 q
854 | chr4 162000001 163000000 q
855 | chr4 163000001 164000000 q
856 | chr4 164000001 165000000 q
857 | chr4 165000001 166000000 q
858 | chr4 166000001 167000000 q
859 | chr4 167000001 168000000 q
860 | chr4 168000001 169000000 q
861 | chr4 169000001 170000000 q
862 | chr4 170000001 171000000 q
863 | chr4 171000001 172000000 q
864 | chr4 172000001 173000000 q
865 | chr4 173000001 174000000 q
866 | chr4 174000001 175000000 q
867 | chr4 175000001 176000000 q
868 | chr4 176000001 177000000 q
869 | chr4 177000001 178000000 q
870 | chr4 178000001 179000000 q
871 | chr4 179000001 180000000 q
872 | chr4 180000001 181000000 q
873 | chr4 181000001 182000000 q
874 | chr4 182000001 183000000 q
875 | chr4 183000001 184000000 q
876 | chr4 184000001 185000000 q
877 | chr4 185000001 186000000 q
878 | chr4 186000001 187000000 q
879 | chr4 187000001 188000000 q
880 | chr4 188000001 189000000 q
881 | chr4 189000001 190000000 q
882 | chr4 190000001 190214555 q
883 | chr5 1 1000000 p
884 | chr5 1000001 2000000 p
885 | chr5 2000001 3000000 p
886 | chr5 3000001 4000000 p
887 | chr5 4000001 5000000 p
888 | chr5 5000001 6000000 p
889 | chr5 6000001 7000000 p
890 | chr5 7000001 8000000 p
891 | chr5 8000001 9000000 p
892 | chr5 9000001 10000000 p
893 | chr5 10000001 11000000 p
894 | chr5 11000001 12000000 p
895 | chr5 12000001 13000000 p
896 | chr5 13000001 14000000 p
897 | chr5 14000001 15000000 p
898 | chr5 15000001 16000000 p
899 | chr5 16000001 17000000 p
900 | chr5 17000001 18000000 p
901 | chr5 18000001 19000000 p
902 | chr5 19000001 20000000 p
903 | chr5 20000001 21000000 p
904 | chr5 21000001 22000000 p
905 | chr5 22000001 23000000 p
906 | chr5 23000001 24000000 p
907 | chr5 24000001 25000000 p
908 | chr5 25000001 26000000 p
909 | chr5 26000001 27000000 p
910 | chr5 27000001 28000000 p
911 | chr5 28000001 29000000 p
912 | chr5 29000001 30000000 p
913 | chr5 30000001 31000000 p
914 | chr5 31000001 32000000 p
915 | chr5 32000001 33000000 p
916 | chr5 33000001 34000000 p
917 | chr5 34000001 35000000 p
918 | chr5 35000001 36000000 p
919 | chr5 36000001 37000000 p
920 | chr5 37000001 38000000 p
921 | chr5 38000001 39000000 p
922 | chr5 39000001 40000000 p
923 | chr5 40000001 41000000 p
924 | chr5 41000001 42000000 p
925 | chr5 42000001 43000000 p
926 | chr5 43000001 44000000 p
927 | chr5 44000001 45000000 p
928 | chr5 45000001 46000000 p
929 | chr5 46000001 47000000 p
930 | chr5 47000001 48000000 cen
931 | chr5 48000001 49000000 cen
932 | chr5 49000001 50000000 cen
933 | chr5 50000001 51000000 cen
934 | chr5 51000001 52000000 cen
935 | chr5 52000001 53000000 q
936 | chr5 53000001 54000000 q
937 | chr5 54000001 55000000 q
938 | chr5 55000001 56000000 q
939 | chr5 56000001 57000000 q
940 | chr5 57000001 58000000 q
941 | chr5 58000001 59000000 q
942 | chr5 59000001 60000000 q
943 | chr5 60000001 61000000 q
944 | chr5 61000001 62000000 q
945 | chr5 62000001 63000000 q
946 | chr5 63000001 64000000 q
947 | chr5 64000001 65000000 q
948 | chr5 65000001 66000000 q
949 | chr5 66000001 67000000 q
950 | chr5 67000001 68000000 q
951 | chr5 68000001 69000000 q
952 | chr5 69000001 70000000 q
953 | chr5 70000001 71000000 q
954 | chr5 71000001 72000000 q
955 | chr5 72000001 73000000 q
956 | chr5 73000001 74000000 q
957 | chr5 74000001 75000000 q
958 | chr5 75000001 76000000 q
959 | chr5 76000001 77000000 q
960 | chr5 77000001 78000000 q
961 | chr5 78000001 79000000 q
962 | chr5 79000001 80000000 q
963 | chr5 80000001 81000000 q
964 | chr5 81000001 82000000 q
965 | chr5 82000001 83000000 q
966 | chr5 83000001 84000000 q
967 | chr5 84000001 85000000 q
968 | chr5 85000001 86000000 q
969 | chr5 86000001 87000000 q
970 | chr5 87000001 88000000 q
971 | chr5 88000001 89000000 q
972 | chr5 89000001 90000000 q
973 | chr5 90000001 91000000 q
974 | chr5 91000001 92000000 q
975 | chr5 92000001 93000000 q
976 | chr5 93000001 94000000 q
977 | chr5 94000001 95000000 q
978 | chr5 95000001 96000000 q
979 | chr5 96000001 97000000 q
980 | chr5 97000001 98000000 q
981 | chr5 98000001 99000000 q
982 | chr5 99000001 100000000 q
983 | chr5 100000001 101000000 q
984 | chr5 101000001 102000000 q
985 | chr5 102000001 103000000 q
986 | chr5 103000001 104000000 q
987 | chr5 104000001 105000000 q
988 | chr5 105000001 106000000 q
989 | chr5 106000001 107000000 q
990 | chr5 107000001 108000000 q
991 | chr5 108000001 109000000 q
992 | chr5 109000001 110000000 q
993 | chr5 110000001 111000000 q
994 | chr5 111000001 112000000 q
995 | chr5 112000001 113000000 q
996 | chr5 113000001 114000000 q
997 | chr5 114000001 115000000 q
998 | chr5 115000001 116000000 q
999 | chr5 116000001 117000000 q
1000 | chr5 117000001 118000000 q
1001 | chr5 118000001 119000000 q
1002 | chr5 119000001 120000000 q
1003 | chr5 120000001 121000000 q
1004 | chr5 121000001 122000000 q
1005 | chr5 122000001 123000000 q
1006 | chr5 123000001 124000000 q
1007 | chr5 124000001 125000000 q
1008 | chr5 125000001 126000000 q
1009 | chr5 126000001 127000000 q
1010 | chr5 127000001 128000000 q
1011 | chr5 128000001 129000000 q
1012 | chr5 129000001 130000000 q
1013 | chr5 130000001 131000000 q
1014 | chr5 131000001 132000000 q
1015 | chr5 132000001 133000000 q
1016 | chr5 133000001 134000000 q
1017 | chr5 134000001 135000000 q
1018 | chr5 135000001 136000000 q
1019 | chr5 136000001 137000000 q
1020 | chr5 137000001 138000000 q
1021 | chr5 138000001 139000000 q
1022 | chr5 139000001 140000000 q
1023 | chr5 140000001 141000000 q
1024 | chr5 141000001 142000000 q
1025 | chr5 142000001 143000000 q
1026 | chr5 143000001 144000000 q
1027 | chr5 144000001 145000000 q
1028 | chr5 145000001 146000000 q
1029 | chr5 146000001 147000000 q
1030 | chr5 147000001 148000000 q
1031 | chr5 148000001 149000000 q
1032 | chr5 149000001 150000000 q
1033 | chr5 150000001 151000000 q
1034 | chr5 151000001 152000000 q
1035 | chr5 152000001 153000000 q
1036 | chr5 153000001 154000000 q
1037 | chr5 154000001 155000000 q
1038 | chr5 155000001 156000000 q
1039 | chr5 156000001 157000000 q
1040 | chr5 157000001 158000000 q
1041 | chr5 158000001 159000000 q
1042 | chr5 159000001 160000000 q
1043 | chr5 160000001 161000000 q
1044 | chr5 161000001 162000000 q
1045 | chr5 162000001 163000000 q
1046 | chr5 163000001 164000000 q
1047 | chr5 164000001 165000000 q
1048 | chr5 165000001 166000000 q
1049 | chr5 166000001 167000000 q
1050 | chr5 167000001 168000000 q
1051 | chr5 168000001 169000000 q
1052 | chr5 169000001 170000000 q
1053 | chr5 170000001 171000000 q
1054 | chr5 171000001 172000000 q
1055 | chr5 172000001 173000000 q
1056 | chr5 173000001 174000000 q
1057 | chr5 174000001 175000000 q
1058 | chr5 175000001 176000000 q
1059 | chr5 176000001 177000000 q
1060 | chr5 177000001 178000000 q
1061 | chr5 178000001 179000000 q
1062 | chr5 179000001 180000000 q
1063 | chr5 180000001 181000000 q
1064 | chr5 181000001 181538259 q
1065 | chr6 1 1000000 p
1066 | chr6 1000001 2000000 p
1067 | chr6 2000001 3000000 p
1068 | chr6 3000001 4000000 p
1069 | chr6 4000001 5000000 p
1070 | chr6 5000001 6000000 p
1071 | chr6 6000001 7000000 p
1072 | chr6 7000001 8000000 p
1073 | chr6 8000001 9000000 p
1074 | chr6 9000001 10000000 p
1075 | chr6 10000001 11000000 p
1076 | chr6 11000001 12000000 p
1077 | chr6 12000001 13000000 p
1078 | chr6 13000001 14000000 p
1079 | chr6 14000001 15000000 p
1080 | chr6 15000001 16000000 p
1081 | chr6 16000001 17000000 p
1082 | chr6 17000001 18000000 p
1083 | chr6 18000001 19000000 p
1084 | chr6 19000001 20000000 p
1085 | chr6 20000001 21000000 p
1086 | chr6 21000001 22000000 p
1087 | chr6 22000001 23000000 p
1088 | chr6 23000001 24000000 p
1089 | chr6 24000001 25000000 p
1090 | chr6 25000001 26000000 p
1091 | chr6 26000001 27000000 p
1092 | chr6 27000001 28000000 p
1093 | chr6 28000001 29000000 p
1094 | chr6 29000001 30000000 p
1095 | chr6 30000001 31000000 p
1096 | chr6 31000001 32000000 p
1097 | chr6 32000001 33000000 p
1098 | chr6 33000001 34000000 p
1099 | chr6 34000001 35000000 p
1100 | chr6 35000001 36000000 p
1101 | chr6 36000001 37000000 p
1102 | chr6 37000001 38000000 p
1103 | chr6 38000001 39000000 p
1104 | chr6 39000001 40000000 p
1105 | chr6 40000001 41000000 p
1106 | chr6 41000001 42000000 p
1107 | chr6 42000001 43000000 p
1108 | chr6 43000001 44000000 p
1109 | chr6 44000001 45000000 p
1110 | chr6 45000001 46000000 p
1111 | chr6 46000001 47000000 p
1112 | chr6 47000001 48000000 p
1113 | chr6 48000001 49000000 p
1114 | chr6 49000001 50000000 p
1115 | chr6 50000001 51000000 p
1116 | chr6 51000001 52000000 p
1117 | chr6 52000001 53000000 p
1118 | chr6 53000001 54000000 p
1119 | chr6 54000001 55000000 p
1120 | chr6 55000001 56000000 p
1121 | chr6 56000001 57000000 p
1122 | chr6 57000001 58000000 p
1123 | chr6 58000001 59000000 p
1124 | chr6 59000001 60000000 cen
1125 | chr6 60000001 61000000 cen
1126 | chr6 61000001 62000000 cen
1127 | chr6 62000001 63000000 cen
1128 | chr6 63000001 64000000 q
1129 | chr6 64000001 65000000 q
1130 | chr6 65000001 66000000 q
1131 | chr6 66000001 67000000 q
1132 | chr6 67000001 68000000 q
1133 | chr6 68000001 69000000 q
1134 | chr6 69000001 70000000 q
1135 | chr6 70000001 71000000 q
1136 | chr6 71000001 72000000 q
1137 | chr6 72000001 73000000 q
1138 | chr6 73000001 74000000 q
1139 | chr6 74000001 75000000 q
1140 | chr6 75000001 76000000 q
1141 | chr6 76000001 77000000 q
1142 | chr6 77000001 78000000 q
1143 | chr6 78000001 79000000 q
1144 | chr6 79000001 80000000 q
1145 | chr6 80000001 81000000 q
1146 | chr6 81000001 82000000 q
1147 | chr6 82000001 83000000 q
1148 | chr6 83000001 84000000 q
1149 | chr6 84000001 85000000 q
1150 | chr6 85000001 86000000 q
1151 | chr6 86000001 87000000 q
1152 | chr6 87000001 88000000 q
1153 | chr6 88000001 89000000 q
1154 | chr6 89000001 90000000 q
1155 | chr6 90000001 91000000 q
1156 | chr6 91000001 92000000 q
1157 | chr6 92000001 93000000 q
1158 | chr6 93000001 94000000 q
1159 | chr6 94000001 95000000 q
1160 | chr6 95000001 96000000 q
1161 | chr6 96000001 97000000 q
1162 | chr6 97000001 98000000 q
1163 | chr6 98000001 99000000 q
1164 | chr6 99000001 100000000 q
1165 | chr6 100000001 101000000 q
1166 | chr6 101000001 102000000 q
1167 | chr6 102000001 103000000 q
1168 | chr6 103000001 104000000 q
1169 | chr6 104000001 105000000 q
1170 | chr6 105000001 106000000 q
1171 | chr6 106000001 107000000 q
1172 | chr6 107000001 108000000 q
1173 | chr6 108000001 109000000 q
1174 | chr6 109000001 110000000 q
1175 | chr6 110000001 111000000 q
1176 | chr6 111000001 112000000 q
1177 | chr6 112000001 113000000 q
1178 | chr6 113000001 114000000 q
1179 | chr6 114000001 115000000 q
1180 | chr6 115000001 116000000 q
1181 | chr6 116000001 117000000 q
1182 | chr6 117000001 118000000 q
1183 | chr6 118000001 119000000 q
1184 | chr6 119000001 120000000 q
1185 | chr6 120000001 121000000 q
1186 | chr6 121000001 122000000 q
1187 | chr6 122000001 123000000 q
1188 | chr6 123000001 124000000 q
1189 | chr6 124000001 125000000 q
1190 | chr6 125000001 126000000 q
1191 | chr6 126000001 127000000 q
1192 | chr6 127000001 128000000 q
1193 | chr6 128000001 129000000 q
1194 | chr6 129000001 130000000 q
1195 | chr6 130000001 131000000 q
1196 | chr6 131000001 132000000 q
1197 | chr6 132000001 133000000 q
1198 | chr6 133000001 134000000 q
1199 | chr6 134000001 135000000 q
1200 | chr6 135000001 136000000 q
1201 | chr6 136000001 137000000 q
1202 | chr6 137000001 138000000 q
1203 | chr6 138000001 139000000 q
1204 | chr6 139000001 140000000 q
1205 | chr6 140000001 141000000 q
1206 | chr6 141000001 142000000 q
1207 | chr6 142000001 143000000 q
1208 | chr6 143000001 144000000 q
1209 | chr6 144000001 145000000 q
1210 | chr6 145000001 146000000 q
1211 | chr6 146000001 147000000 q
1212 | chr6 147000001 148000000 q
1213 | chr6 148000001 149000000 q
1214 | chr6 149000001 150000000 q
1215 | chr6 150000001 151000000 q
1216 | chr6 151000001 152000000 q
1217 | chr6 152000001 153000000 q
1218 | chr6 153000001 154000000 q
1219 | chr6 154000001 155000000 q
1220 | chr6 155000001 156000000 q
1221 | chr6 156000001 157000000 q
1222 | chr6 157000001 158000000 q
1223 | chr6 158000001 159000000 q
1224 | chr6 159000001 160000000 q
1225 | chr6 160000001 161000000 q
1226 | chr6 161000001 162000000 q
1227 | chr6 162000001 163000000 q
1228 | chr6 163000001 164000000 q
1229 | chr6 164000001 165000000 q
1230 | chr6 165000001 166000000 q
1231 | chr6 166000001 167000000 q
1232 | chr6 167000001 168000000 q
1233 | chr6 168000001 169000000 q
1234 | chr6 169000001 170000000 q
1235 | chr6 170000001 170805979 q
1236 | chr7 1 1000000 p
1237 | chr7 1000001 2000000 p
1238 | chr7 2000001 3000000 p
1239 | chr7 3000001 4000000 p
1240 | chr7 4000001 5000000 p
1241 | chr7 5000001 6000000 p
1242 | chr7 6000001 7000000 p
1243 | chr7 7000001 8000000 p
1244 | chr7 8000001 9000000 p
1245 | chr7 9000001 10000000 p
1246 | chr7 10000001 11000000 p
1247 | chr7 11000001 12000000 p
1248 | chr7 12000001 13000000 p
1249 | chr7 13000001 14000000 p
1250 | chr7 14000001 15000000 p
1251 | chr7 15000001 16000000 p
1252 | chr7 16000001 17000000 p
1253 | chr7 17000001 18000000 p
1254 | chr7 18000001 19000000 p
1255 | chr7 19000001 20000000 p
1256 | chr7 20000001 21000000 p
1257 | chr7 21000001 22000000 p
1258 | chr7 22000001 23000000 p
1259 | chr7 23000001 24000000 p
1260 | chr7 24000001 25000000 p
1261 | chr7 25000001 26000000 p
1262 | chr7 26000001 27000000 p
1263 | chr7 27000001 28000000 p
1264 | chr7 28000001 29000000 p
1265 | chr7 29000001 30000000 p
1266 | chr7 30000001 31000000 p
1267 | chr7 31000001 32000000 p
1268 | chr7 32000001 33000000 p
1269 | chr7 33000001 34000000 p
1270 | chr7 34000001 35000000 p
1271 | chr7 35000001 36000000 p
1272 | chr7 36000001 37000000 p
1273 | chr7 37000001 38000000 p
1274 | chr7 38000001 39000000 p
1275 | chr7 39000001 40000000 p
1276 | chr7 40000001 41000000 p
1277 | chr7 41000001 42000000 p
1278 | chr7 42000001 43000000 p
1279 | chr7 43000001 44000000 p
1280 | chr7 44000001 45000000 p
1281 | chr7 45000001 46000000 p
1282 | chr7 46000001 47000000 p
1283 | chr7 47000001 48000000 p
1284 | chr7 48000001 49000000 p
1285 | chr7 49000001 50000000 p
1286 | chr7 50000001 51000000 p
1287 | chr7 51000001 52000000 p
1288 | chr7 52000001 53000000 p
1289 | chr7 53000001 54000000 p
1290 | chr7 54000001 55000000 p
1291 | chr7 55000001 56000000 p
1292 | chr7 56000001 57000000 p
1293 | chr7 57000001 58000000 p
1294 | chr7 58000001 59000000 p
1295 | chr7 59000001 60000000 cen
1296 | chr7 60000001 61000000 cen
1297 | chr7 61000001 62000000 cen
1298 | chr7 62000001 63000000 cen
1299 | chr7 63000001 64000000 q
1300 | chr7 64000001 65000000 q
1301 | chr7 65000001 66000000 q
1302 | chr7 66000001 67000000 q
1303 | chr7 67000001 68000000 q
1304 | chr7 68000001 69000000 q
1305 | chr7 69000001 70000000 q
1306 | chr7 70000001 71000000 q
1307 | chr7 71000001 72000000 q
1308 | chr7 72000001 73000000 q
1309 | chr7 73000001 74000000 q
1310 | chr7 74000001 75000000 q
1311 | chr7 75000001 76000000 q
1312 | chr7 76000001 77000000 q
1313 | chr7 77000001 78000000 q
1314 | chr7 78000001 79000000 q
1315 | chr7 79000001 80000000 q
1316 | chr7 80000001 81000000 q
1317 | chr7 81000001 82000000 q
1318 | chr7 82000001 83000000 q
1319 | chr7 83000001 84000000 q
1320 | chr7 84000001 85000000 q
1321 | chr7 85000001 86000000 q
1322 | chr7 86000001 87000000 q
1323 | chr7 87000001 88000000 q
1324 | chr7 88000001 89000000 q
1325 | chr7 89000001 90000000 q
1326 | chr7 90000001 91000000 q
1327 | chr7 91000001 92000000 q
1328 | chr7 92000001 93000000 q
1329 | chr7 93000001 94000000 q
1330 | chr7 94000001 95000000 q
1331 | chr7 95000001 96000000 q
1332 | chr7 96000001 97000000 q
1333 | chr7 97000001 98000000 q
1334 | chr7 98000001 99000000 q
1335 | chr7 99000001 100000000 q
1336 | chr7 100000001 101000000 q
1337 | chr7 101000001 102000000 q
1338 | chr7 102000001 103000000 q
1339 | chr7 103000001 104000000 q
1340 | chr7 104000001 105000000 q
1341 | chr7 105000001 106000000 q
1342 | chr7 106000001 107000000 q
1343 | chr7 107000001 108000000 q
1344 | chr7 108000001 109000000 q
1345 | chr7 109000001 110000000 q
1346 | chr7 110000001 111000000 q
1347 | chr7 111000001 112000000 q
1348 | chr7 112000001 113000000 q
1349 | chr7 113000001 114000000 q
1350 | chr7 114000001 115000000 q
1351 | chr7 115000001 116000000 q
1352 | chr7 116000001 117000000 q
1353 | chr7 117000001 118000000 q
1354 | chr7 118000001 119000000 q
1355 | chr7 119000001 120000000 q
1356 | chr7 120000001 121000000 q
1357 | chr7 121000001 122000000 q
1358 | chr7 122000001 123000000 q
1359 | chr7 123000001 124000000 q
1360 | chr7 124000001 125000000 q
1361 | chr7 125000001 126000000 q
1362 | chr7 126000001 127000000 q
1363 | chr7 127000001 128000000 q
1364 | chr7 128000001 129000000 q
1365 | chr7 129000001 130000000 q
1366 | chr7 130000001 131000000 q
1367 | chr7 131000001 132000000 q
1368 | chr7 132000001 133000000 q
1369 | chr7 133000001 134000000 q
1370 | chr7 134000001 135000000 q
1371 | chr7 135000001 136000000 q
1372 | chr7 136000001 137000000 q
1373 | chr7 137000001 138000000 q
1374 | chr7 138000001 139000000 q
1375 | chr7 139000001 140000000 q
1376 | chr7 140000001 141000000 q
1377 | chr7 141000001 142000000 q
1378 | chr7 142000001 143000000 q
1379 | chr7 143000001 144000000 q
1380 | chr7 144000001 145000000 q
1381 | chr7 145000001 146000000 q
1382 | chr7 146000001 147000000 q
1383 | chr7 147000001 148000000 q
1384 | chr7 148000001 149000000 q
1385 | chr7 149000001 150000000 q
1386 | chr7 150000001 151000000 q
1387 | chr7 151000001 152000000 q
1388 | chr7 152000001 153000000 q
1389 | chr7 153000001 154000000 q
1390 | chr7 154000001 155000000 q
1391 | chr7 155000001 156000000 q
1392 | chr7 156000001 157000000 q
1393 | chr7 157000001 158000000 q
1394 | chr7 158000001 159000000 q
1395 | chr7 159000001 159345973 q
1396 | chr8 1 1000000 p
1397 | chr8 1000001 2000000 p
1398 | chr8 2000001 3000000 p
1399 | chr8 3000001 4000000 p
1400 | chr8 4000001 5000000 p
1401 | chr8 5000001 6000000 p
1402 | chr8 6000001 7000000 p
1403 | chr8 7000001 8000000 p
1404 | chr8 8000001 9000000 p
1405 | chr8 9000001 10000000 p
1406 | chr8 10000001 11000000 p
1407 | chr8 11000001 12000000 p
1408 | chr8 12000001 13000000 p
1409 | chr8 13000001 14000000 p
1410 | chr8 14000001 15000000 p
1411 | chr8 15000001 16000000 p
1412 | chr8 16000001 17000000 p
1413 | chr8 17000001 18000000 p
1414 | chr8 18000001 19000000 p
1415 | chr8 19000001 20000000 p
1416 | chr8 20000001 21000000 p
1417 | chr8 21000001 22000000 p
1418 | chr8 22000001 23000000 p
1419 | chr8 23000001 24000000 p
1420 | chr8 24000001 25000000 p
1421 | chr8 25000001 26000000 p
1422 | chr8 26000001 27000000 p
1423 | chr8 27000001 28000000 p
1424 | chr8 28000001 29000000 p
1425 | chr8 29000001 30000000 p
1426 | chr8 30000001 31000000 p
1427 | chr8 31000001 32000000 p
1428 | chr8 32000001 33000000 p
1429 | chr8 33000001 34000000 p
1430 | chr8 34000001 35000000 p
1431 | chr8 35000001 36000000 p
1432 | chr8 36000001 37000000 p
1433 | chr8 37000001 38000000 p
1434 | chr8 38000001 39000000 p
1435 | chr8 39000001 40000000 p
1436 | chr8 40000001 41000000 p
1437 | chr8 41000001 42000000 p
1438 | chr8 42000001 43000000 p
1439 | chr8 43000001 44000000 p
1440 | chr8 44000001 45000000 cen
1441 | chr8 45000001 46000000 cen
1442 | chr8 46000001 47000000 cen
1443 | chr8 47000001 48000000 cen
1444 | chr8 48000001 49000000 q
1445 | chr8 49000001 50000000 q
1446 | chr8 50000001 51000000 q
1447 | chr8 51000001 52000000 q
1448 | chr8 52000001 53000000 q
1449 | chr8 53000001 54000000 q
1450 | chr8 54000001 55000000 q
1451 | chr8 55000001 56000000 q
1452 | chr8 56000001 57000000 q
1453 | chr8 57000001 58000000 q
1454 | chr8 58000001 59000000 q
1455 | chr8 59000001 60000000 q
1456 | chr8 60000001 61000000 q
1457 | chr8 61000001 62000000 q
1458 | chr8 62000001 63000000 q
1459 | chr8 63000001 64000000 q
1460 | chr8 64000001 65000000 q
1461 | chr8 65000001 66000000 q
1462 | chr8 66000001 67000000 q
1463 | chr8 67000001 68000000 q
1464 | chr8 68000001 69000000 q
1465 | chr8 69000001 70000000 q
1466 | chr8 70000001 71000000 q
1467 | chr8 71000001 72000000 q
1468 | chr8 72000001 73000000 q
1469 | chr8 73000001 74000000 q
1470 | chr8 74000001 75000000 q
1471 | chr8 75000001 76000000 q
1472 | chr8 76000001 77000000 q
1473 | chr8 77000001 78000000 q
1474 | chr8 78000001 79000000 q
1475 | chr8 79000001 80000000 q
1476 | chr8 80000001 81000000 q
1477 | chr8 81000001 82000000 q
1478 | chr8 82000001 83000000 q
1479 | chr8 83000001 84000000 q
1480 | chr8 84000001 85000000 q
1481 | chr8 85000001 86000000 q
1482 | chr8 86000001 87000000 q
1483 | chr8 87000001 88000000 q
1484 | chr8 88000001 89000000 q
1485 | chr8 89000001 90000000 q
1486 | chr8 90000001 91000000 q
1487 | chr8 91000001 92000000 q
1488 | chr8 92000001 93000000 q
1489 | chr8 93000001 94000000 q
1490 | chr8 94000001 95000000 q
1491 | chr8 95000001 96000000 q
1492 | chr8 96000001 97000000 q
1493 | chr8 97000001 98000000 q
1494 | chr8 98000001 99000000 q
1495 | chr8 99000001 100000000 q
1496 | chr8 100000001 101000000 q
1497 | chr8 101000001 102000000 q
1498 | chr8 102000001 103000000 q
1499 | chr8 103000001 104000000 q
1500 | chr8 104000001 105000000 q
1501 | chr8 105000001 106000000 q
1502 | chr8 106000001 107000000 q
1503 | chr8 107000001 108000000 q
1504 | chr8 108000001 109000000 q
1505 | chr8 109000001 110000000 q
1506 | chr8 110000001 111000000 q
1507 | chr8 111000001 112000000 q
1508 | chr8 112000001 113000000 q
1509 | chr8 113000001 114000000 q
1510 | chr8 114000001 115000000 q
1511 | chr8 115000001 116000000 q
1512 | chr8 116000001 117000000 q
1513 | chr8 117000001 118000000 q
1514 | chr8 118000001 119000000 q
1515 | chr8 119000001 120000000 q
1516 | chr8 120000001 121000000 q
1517 | chr8 121000001 122000000 q
1518 | chr8 122000001 123000000 q
1519 | chr8 123000001 124000000 q
1520 | chr8 124000001 125000000 q
1521 | chr8 125000001 126000000 q
1522 | chr8 126000001 127000000 q
1523 | chr8 127000001 128000000 q
1524 | chr8 128000001 129000000 q
1525 | chr8 129000001 130000000 q
1526 | chr8 130000001 131000000 q
1527 | chr8 131000001 132000000 q
1528 | chr8 132000001 133000000 q
1529 | chr8 133000001 134000000 q
1530 | chr8 134000001 135000000 q
1531 | chr8 135000001 136000000 q
1532 | chr8 136000001 137000000 q
1533 | chr8 137000001 138000000 q
1534 | chr8 138000001 139000000 q
1535 | chr8 139000001 140000000 q
1536 | chr8 140000001 141000000 q
1537 | chr8 141000001 142000000 q
1538 | chr8 142000001 143000000 q
1539 | chr8 143000001 144000000 q
1540 | chr8 144000001 145000000 q
1541 | chr8 145000001 145138636 q
1542 | chr9 1 1000000 p
1543 | chr9 1000001 2000000 p
1544 | chr9 2000001 3000000 p
1545 | chr9 3000001 4000000 p
1546 | chr9 4000001 5000000 p
1547 | chr9 5000001 6000000 p
1548 | chr9 6000001 7000000 p
1549 | chr9 7000001 8000000 p
1550 | chr9 8000001 9000000 p
1551 | chr9 9000001 10000000 p
1552 | chr9 10000001 11000000 p
1553 | chr9 11000001 12000000 p
1554 | chr9 12000001 13000000 p
1555 | chr9 13000001 14000000 p
1556 | chr9 14000001 15000000 p
1557 | chr9 15000001 16000000 p
1558 | chr9 16000001 17000000 p
1559 | chr9 17000001 18000000 p
1560 | chr9 18000001 19000000 p
1561 | chr9 19000001 20000000 p
1562 | chr9 20000001 21000000 p
1563 | chr9 21000001 22000000 p
1564 | chr9 22000001 23000000 p
1565 | chr9 23000001 24000000 p
1566 | chr9 24000001 25000000 p
1567 | chr9 25000001 26000000 p
1568 | chr9 26000001 27000000 p
1569 | chr9 27000001 28000000 p
1570 | chr9 28000001 29000000 p
1571 | chr9 29000001 30000000 p
1572 | chr9 30000001 31000000 p
1573 | chr9 31000001 32000000 p
1574 | chr9 32000001 33000000 p
1575 | chr9 33000001 34000000 p
1576 | chr9 34000001 35000000 p
1577 | chr9 35000001 36000000 p
1578 | chr9 36000001 37000000 p
1579 | chr9 37000001 38000000 p
1580 | chr9 38000001 39000000 p
1581 | chr9 39000001 40000000 p
1582 | chr9 40000001 41000000 p
1583 | chr9 41000001 42000000 p
1584 | chr9 42000001 43000000 p
1585 | chr9 43000001 44000000 cen
1586 | chr9 44000001 45000000 cen
1587 | chr9 45000001 46000000 cen
1588 | chr9 46000001 47000000 q
1589 | chr9 47000001 48000000 q
1590 | chr9 48000001 49000000 q
1591 | chr9 49000001 50000000 q
1592 | chr9 50000001 51000000 q
1593 | chr9 51000001 52000000 q
1594 | chr9 52000001 53000000 q
1595 | chr9 53000001 54000000 q
1596 | chr9 54000001 55000000 q
1597 | chr9 55000001 56000000 q
1598 | chr9 56000001 57000000 q
1599 | chr9 57000001 58000000 q
1600 | chr9 58000001 59000000 q
1601 | chr9 59000001 60000000 q
1602 | chr9 60000001 61000000 q
1603 | chr9 61000001 62000000 q
1604 | chr9 62000001 63000000 q
1605 | chr9 63000001 64000000 q
1606 | chr9 64000001 65000000 q
1607 | chr9 65000001 66000000 q
1608 | chr9 66000001 67000000 q
1609 | chr9 67000001 68000000 q
1610 | chr9 68000001 69000000 q
1611 | chr9 69000001 70000000 q
1612 | chr9 70000001 71000000 q
1613 | chr9 71000001 72000000 q
1614 | chr9 72000001 73000000 q
1615 | chr9 73000001 74000000 q
1616 | chr9 74000001 75000000 q
1617 | chr9 75000001 76000000 q
1618 | chr9 76000001 77000000 q
1619 | chr9 77000001 78000000 q
1620 | chr9 78000001 79000000 q
1621 | chr9 79000001 80000000 q
1622 | chr9 80000001 81000000 q
1623 | chr9 81000001 82000000 q
1624 | chr9 82000001 83000000 q
1625 | chr9 83000001 84000000 q
1626 | chr9 84000001 85000000 q
1627 | chr9 85000001 86000000 q
1628 | chr9 86000001 87000000 q
1629 | chr9 87000001 88000000 q
1630 | chr9 88000001 89000000 q
1631 | chr9 89000001 90000000 q
1632 | chr9 90000001 91000000 q
1633 | chr9 91000001 92000000 q
1634 | chr9 92000001 93000000 q
1635 | chr9 93000001 94000000 q
1636 | chr9 94000001 95000000 q
1637 | chr9 95000001 96000000 q
1638 | chr9 96000001 97000000 q
1639 | chr9 97000001 98000000 q
1640 | chr9 98000001 99000000 q
1641 | chr9 99000001 100000000 q
1642 | chr9 100000001 101000000 q
1643 | chr9 101000001 102000000 q
1644 | chr9 102000001 103000000 q
1645 | chr9 103000001 104000000 q
1646 | chr9 104000001 105000000 q
1647 | chr9 105000001 106000000 q
1648 | chr9 106000001 107000000 q
1649 | chr9 107000001 108000000 q
1650 | chr9 108000001 109000000 q
1651 | chr9 109000001 110000000 q
1652 | chr9 110000001 111000000 q
1653 | chr9 111000001 112000000 q
1654 | chr9 112000001 113000000 q
1655 | chr9 113000001 114000000 q
1656 | chr9 114000001 115000000 q
1657 | chr9 115000001 116000000 q
1658 | chr9 116000001 117000000 q
1659 | chr9 117000001 118000000 q
1660 | chr9 118000001 119000000 q
1661 | chr9 119000001 120000000 q
1662 | chr9 120000001 121000000 q
1663 | chr9 121000001 122000000 q
1664 | chr9 122000001 123000000 q
1665 | chr9 123000001 124000000 q
1666 | chr9 124000001 125000000 q
1667 | chr9 125000001 126000000 q
1668 | chr9 126000001 127000000 q
1669 | chr9 127000001 128000000 q
1670 | chr9 128000001 129000000 q
1671 | chr9 129000001 130000000 q
1672 | chr9 130000001 131000000 q
1673 | chr9 131000001 132000000 q
1674 | chr9 132000001 133000000 q
1675 | chr9 133000001 134000000 q
1676 | chr9 134000001 135000000 q
1677 | chr9 135000001 136000000 q
1678 | chr9 136000001 137000000 q
1679 | chr9 137000001 138000000 q
1680 | chr9 138000001 138394717 q
1681 | chr10 1 1000000 p
1682 | chr10 1000001 2000000 p
1683 | chr10 2000001 3000000 p
1684 | chr10 3000001 4000000 p
1685 | chr10 4000001 5000000 p
1686 | chr10 5000001 6000000 p
1687 | chr10 6000001 7000000 p
1688 | chr10 7000001 8000000 p
1689 | chr10 8000001 9000000 p
1690 | chr10 9000001 10000000 p
1691 | chr10 10000001 11000000 p
1692 | chr10 11000001 12000000 p
1693 | chr10 12000001 13000000 p
1694 | chr10 13000001 14000000 p
1695 | chr10 14000001 15000000 p
1696 | chr10 15000001 16000000 p
1697 | chr10 16000001 17000000 p
1698 | chr10 17000001 18000000 p
1699 | chr10 18000001 19000000 p
1700 | chr10 19000001 20000000 p
1701 | chr10 20000001 21000000 p
1702 | chr10 21000001 22000000 p
1703 | chr10 22000001 23000000 p
1704 | chr10 23000001 24000000 p
1705 | chr10 24000001 25000000 p
1706 | chr10 25000001 26000000 p
1707 | chr10 26000001 27000000 p
1708 | chr10 27000001 28000000 p
1709 | chr10 28000001 29000000 p
1710 | chr10 29000001 30000000 p
1711 | chr10 30000001 31000000 p
1712 | chr10 31000001 32000000 p
1713 | chr10 32000001 33000000 p
1714 | chr10 33000001 34000000 p
1715 | chr10 34000001 35000000 p
1716 | chr10 35000001 36000000 p
1717 | chr10 36000001 37000000 p
1718 | chr10 37000001 38000000 p
1719 | chr10 38000001 39000000 cen
1720 | chr10 39000001 40000000 cen
1721 | chr10 40000001 41000000 cen
1722 | chr10 41000001 42000000 cen
1723 | chr10 42000001 43000000 q
1724 | chr10 43000001 44000000 q
1725 | chr10 44000001 45000000 q
1726 | chr10 45000001 46000000 q
1727 | chr10 46000001 47000000 q
1728 | chr10 47000001 48000000 q
1729 | chr10 48000001 49000000 q
1730 | chr10 49000001 50000000 q
1731 | chr10 50000001 51000000 q
1732 | chr10 51000001 52000000 q
1733 | chr10 52000001 53000000 q
1734 | chr10 53000001 54000000 q
1735 | chr10 54000001 55000000 q
1736 | chr10 55000001 56000000 q
1737 | chr10 56000001 57000000 q
1738 | chr10 57000001 58000000 q
1739 | chr10 58000001 59000000 q
1740 | chr10 59000001 60000000 q
1741 | chr10 60000001 61000000 q
1742 | chr10 61000001 62000000 q
1743 | chr10 62000001 63000000 q
1744 | chr10 63000001 64000000 q
1745 | chr10 64000001 65000000 q
1746 | chr10 65000001 66000000 q
1747 | chr10 66000001 67000000 q
1748 | chr10 67000001 68000000 q
1749 | chr10 68000001 69000000 q
1750 | chr10 69000001 70000000 q
1751 | chr10 70000001 71000000 q
1752 | chr10 71000001 72000000 q
1753 | chr10 72000001 73000000 q
1754 | chr10 73000001 74000000 q
1755 | chr10 74000001 75000000 q
1756 | chr10 75000001 76000000 q
1757 | chr10 76000001 77000000 q
1758 | chr10 77000001 78000000 q
1759 | chr10 78000001 79000000 q
1760 | chr10 79000001 80000000 q
1761 | chr10 80000001 81000000 q
1762 | chr10 81000001 82000000 q
1763 | chr10 82000001 83000000 q
1764 | chr10 83000001 84000000 q
1765 | chr10 84000001 85000000 q
1766 | chr10 85000001 86000000 q
1767 | chr10 86000001 87000000 q
1768 | chr10 87000001 88000000 q
1769 | chr10 88000001 89000000 q
1770 | chr10 89000001 90000000 q
1771 | chr10 90000001 91000000 q
1772 | chr10 91000001 92000000 q
1773 | chr10 92000001 93000000 q
1774 | chr10 93000001 94000000 q
1775 | chr10 94000001 95000000 q
1776 | chr10 95000001 96000000 q
1777 | chr10 96000001 97000000 q
1778 | chr10 97000001 98000000 q
1779 | chr10 98000001 99000000 q
1780 | chr10 99000001 100000000 q
1781 | chr10 100000001 101000000 q
1782 | chr10 101000001 102000000 q
1783 | chr10 102000001 103000000 q
1784 | chr10 103000001 104000000 q
1785 | chr10 104000001 105000000 q
1786 | chr10 105000001 106000000 q
1787 | chr10 106000001 107000000 q
1788 | chr10 107000001 108000000 q
1789 | chr10 108000001 109000000 q
1790 | chr10 109000001 110000000 q
1791 | chr10 110000001 111000000 q
1792 | chr10 111000001 112000000 q
1793 | chr10 112000001 113000000 q
1794 | chr10 113000001 114000000 q
1795 | chr10 114000001 115000000 q
1796 | chr10 115000001 116000000 q
1797 | chr10 116000001 117000000 q
1798 | chr10 117000001 118000000 q
1799 | chr10 118000001 119000000 q
1800 | chr10 119000001 120000000 q
1801 | chr10 120000001 121000000 q
1802 | chr10 121000001 122000000 q
1803 | chr10 122000001 123000000 q
1804 | chr10 123000001 124000000 q
1805 | chr10 124000001 125000000 q
1806 | chr10 125000001 126000000 q
1807 | chr10 126000001 127000000 q
1808 | chr10 127000001 128000000 q
1809 | chr10 128000001 129000000 q
1810 | chr10 129000001 130000000 q
1811 | chr10 130000001 131000000 q
1812 | chr10 131000001 132000000 q
1813 | chr10 132000001 133000000 q
1814 | chr10 133000001 133797422 q
1815 | chr11 1 1000000 p
1816 | chr11 1000001 2000000 p
1817 | chr11 2000001 3000000 p
1818 | chr11 3000001 4000000 p
1819 | chr11 4000001 5000000 p
1820 | chr11 5000001 6000000 p
1821 | chr11 6000001 7000000 p
1822 | chr11 7000001 8000000 p
1823 | chr11 8000001 9000000 p
1824 | chr11 9000001 10000000 p
1825 | chr11 10000001 11000000 p
1826 | chr11 11000001 12000000 p
1827 | chr11 12000001 13000000 p
1828 | chr11 13000001 14000000 p
1829 | chr11 14000001 15000000 p
1830 | chr11 15000001 16000000 p
1831 | chr11 16000001 17000000 p
1832 | chr11 17000001 18000000 p
1833 | chr11 18000001 19000000 p
1834 | chr11 19000001 20000000 p
1835 | chr11 20000001 21000000 p
1836 | chr11 21000001 22000000 p
1837 | chr11 22000001 23000000 p
1838 | chr11 23000001 24000000 p
1839 | chr11 24000001 25000000 p
1840 | chr11 25000001 26000000 p
1841 | chr11 26000001 27000000 p
1842 | chr11 27000001 28000000 p
1843 | chr11 28000001 29000000 p
1844 | chr11 29000001 30000000 p
1845 | chr11 30000001 31000000 p
1846 | chr11 31000001 32000000 p
1847 | chr11 32000001 33000000 p
1848 | chr11 33000001 34000000 p
1849 | chr11 34000001 35000000 p
1850 | chr11 35000001 36000000 p
1851 | chr11 36000001 37000000 p
1852 | chr11 37000001 38000000 p
1853 | chr11 38000001 39000000 p
1854 | chr11 39000001 40000000 p
1855 | chr11 40000001 41000000 p
1856 | chr11 41000001 42000000 p
1857 | chr11 42000001 43000000 p
1858 | chr11 43000001 44000000 p
1859 | chr11 44000001 45000000 p
1860 | chr11 45000001 46000000 p
1861 | chr11 46000001 47000000 p
1862 | chr11 47000001 48000000 p
1863 | chr11 48000001 49000000 p
1864 | chr11 49000001 50000000 p
1865 | chr11 50000001 51000000 p
1866 | chr11 51000001 52000000 cen
1867 | chr11 52000001 53000000 cen
1868 | chr11 53000001 54000000 cen
1869 | chr11 54000001 55000000 cen
1870 | chr11 55000001 56000000 cen
1871 | chr11 56000001 57000000 q
1872 | chr11 57000001 58000000 q
1873 | chr11 58000001 59000000 q
1874 | chr11 59000001 60000000 q
1875 | chr11 60000001 61000000 q
1876 | chr11 61000001 62000000 q
1877 | chr11 62000001 63000000 q
1878 | chr11 63000001 64000000 q
1879 | chr11 64000001 65000000 q
1880 | chr11 65000001 66000000 q
1881 | chr11 66000001 67000000 q
1882 | chr11 67000001 68000000 q
1883 | chr11 68000001 69000000 q
1884 | chr11 69000001 70000000 q
1885 | chr11 70000001 71000000 q
1886 | chr11 71000001 72000000 q
1887 | chr11 72000001 73000000 q
1888 | chr11 73000001 74000000 q
1889 | chr11 74000001 75000000 q
1890 | chr11 75000001 76000000 q
1891 | chr11 76000001 77000000 q
1892 | chr11 77000001 78000000 q
1893 | chr11 78000001 79000000 q
1894 | chr11 79000001 80000000 q
1895 | chr11 80000001 81000000 q
1896 | chr11 81000001 82000000 q
1897 | chr11 82000001 83000000 q
1898 | chr11 83000001 84000000 q
1899 | chr11 84000001 85000000 q
1900 | chr11 85000001 86000000 q
1901 | chr11 86000001 87000000 q
1902 | chr11 87000001 88000000 q
1903 | chr11 88000001 89000000 q
1904 | chr11 89000001 90000000 q
1905 | chr11 90000001 91000000 q
1906 | chr11 91000001 92000000 q
1907 | chr11 92000001 93000000 q
1908 | chr11 93000001 94000000 q
1909 | chr11 94000001 95000000 q
1910 | chr11 95000001 96000000 q
1911 | chr11 96000001 97000000 q
1912 | chr11 97000001 98000000 q
1913 | chr11 98000001 99000000 q
1914 | chr11 99000001 100000000 q
1915 | chr11 100000001 101000000 q
1916 | chr11 101000001 102000000 q
1917 | chr11 102000001 103000000 q
1918 | chr11 103000001 104000000 q
1919 | chr11 104000001 105000000 q
1920 | chr11 105000001 106000000 q
1921 | chr11 106000001 107000000 q
1922 | chr11 107000001 108000000 q
1923 | chr11 108000001 109000000 q
1924 | chr11 109000001 110000000 q
1925 | chr11 110000001 111000000 q
1926 | chr11 111000001 112000000 q
1927 | chr11 112000001 113000000 q
1928 | chr11 113000001 114000000 q
1929 | chr11 114000001 115000000 q
1930 | chr11 115000001 116000000 q
1931 | chr11 116000001 117000000 q
1932 | chr11 117000001 118000000 q
1933 | chr11 118000001 119000000 q
1934 | chr11 119000001 120000000 q
1935 | chr11 120000001 121000000 q
1936 | chr11 121000001 122000000 q
1937 | chr11 122000001 123000000 q
1938 | chr11 123000001 124000000 q
1939 | chr11 124000001 125000000 q
1940 | chr11 125000001 126000000 q
1941 | chr11 126000001 127000000 q
1942 | chr11 127000001 128000000 q
1943 | chr11 128000001 129000000 q
1944 | chr11 129000001 130000000 q
1945 | chr11 130000001 131000000 q
1946 | chr11 131000001 132000000 q
1947 | chr11 132000001 133000000 q
1948 | chr11 133000001 134000000 q
1949 | chr11 134000001 135000000 q
1950 | chr11 135000001 135086622 q
1951 | chr12 1 1000000 p
1952 | chr12 1000001 2000000 p
1953 | chr12 2000001 3000000 p
1954 | chr12 3000001 4000000 p
1955 | chr12 4000001 5000000 p
1956 | chr12 5000001 6000000 p
1957 | chr12 6000001 7000000 p
1958 | chr12 7000001 8000000 p
1959 | chr12 8000001 9000000 p
1960 | chr12 9000001 10000000 p
1961 | chr12 10000001 11000000 p
1962 | chr12 11000001 12000000 p
1963 | chr12 12000001 13000000 p
1964 | chr12 13000001 14000000 p
1965 | chr12 14000001 15000000 p
1966 | chr12 15000001 16000000 p
1967 | chr12 16000001 17000000 p
1968 | chr12 17000001 18000000 p
1969 | chr12 18000001 19000000 p
1970 | chr12 19000001 20000000 p
1971 | chr12 20000001 21000000 p
1972 | chr12 21000001 22000000 p
1973 | chr12 22000001 23000000 p
1974 | chr12 23000001 24000000 p
1975 | chr12 24000001 25000000 p
1976 | chr12 25000001 26000000 p
1977 | chr12 26000001 27000000 p
1978 | chr12 27000001 28000000 p
1979 | chr12 28000001 29000000 p
1980 | chr12 29000001 30000000 p
1981 | chr12 30000001 31000000 p
1982 | chr12 31000001 32000000 p
1983 | chr12 32000001 33000000 p
1984 | chr12 33000001 34000000 p
1985 | chr12 34000001 35000000 cen
1986 | chr12 35000001 36000000 cen
1987 | chr12 36000001 37000000 cen
1988 | chr12 37000001 38000000 cen
1989 | chr12 38000001 39000000 q
1990 | chr12 39000001 40000000 q
1991 | chr12 40000001 41000000 q
1992 | chr12 41000001 42000000 q
1993 | chr12 42000001 43000000 q
1994 | chr12 43000001 44000000 q
1995 | chr12 44000001 45000000 q
1996 | chr12 45000001 46000000 q
1997 | chr12 46000001 47000000 q
1998 | chr12 47000001 48000000 q
1999 | chr12 48000001 49000000 q
2000 | chr12 49000001 50000000 q
2001 | chr12 50000001 51000000 q
2002 | chr12 51000001 52000000 q
2003 | chr12 52000001 53000000 q
2004 | chr12 53000001 54000000 q
2005 | chr12 54000001 55000000 q
2006 | chr12 55000001 56000000 q
2007 | chr12 56000001 57000000 q
2008 | chr12 57000001 58000000 q
2009 | chr12 58000001 59000000 q
2010 | chr12 59000001 60000000 q
2011 | chr12 60000001 61000000 q
2012 | chr12 61000001 62000000 q
2013 | chr12 62000001 63000000 q
2014 | chr12 63000001 64000000 q
2015 | chr12 64000001 65000000 q
2016 | chr12 65000001 66000000 q
2017 | chr12 66000001 67000000 q
2018 | chr12 67000001 68000000 q
2019 | chr12 68000001 69000000 q
2020 | chr12 69000001 70000000 q
2021 | chr12 70000001 71000000 q
2022 | chr12 71000001 72000000 q
2023 | chr12 72000001 73000000 q
2024 | chr12 73000001 74000000 q
2025 | chr12 74000001 75000000 q
2026 | chr12 75000001 76000000 q
2027 | chr12 76000001 77000000 q
2028 | chr12 77000001 78000000 q
2029 | chr12 78000001 79000000 q
2030 | chr12 79000001 80000000 q
2031 | chr12 80000001 81000000 q
2032 | chr12 81000001 82000000 q
2033 | chr12 82000001 83000000 q
2034 | chr12 83000001 84000000 q
2035 | chr12 84000001 85000000 q
2036 | chr12 85000001 86000000 q
2037 | chr12 86000001 87000000 q
2038 | chr12 87000001 88000000 q
2039 | chr12 88000001 89000000 q
2040 | chr12 89000001 90000000 q
2041 | chr12 90000001 91000000 q
2042 | chr12 91000001 92000000 q
2043 | chr12 92000001 93000000 q
2044 | chr12 93000001 94000000 q
2045 | chr12 94000001 95000000 q
2046 | chr12 95000001 96000000 q
2047 | chr12 96000001 97000000 q
2048 | chr12 97000001 98000000 q
2049 | chr12 98000001 99000000 q
2050 | chr12 99000001 100000000 q
2051 | chr12 100000001 101000000 q
2052 | chr12 101000001 102000000 q
2053 | chr12 102000001 103000000 q
2054 | chr12 103000001 104000000 q
2055 | chr12 104000001 105000000 q
2056 | chr12 105000001 106000000 q
2057 | chr12 106000001 107000000 q
2058 | chr12 107000001 108000000 q
2059 | chr12 108000001 109000000 q
2060 | chr12 109000001 110000000 q
2061 | chr12 110000001 111000000 q
2062 | chr12 111000001 112000000 q
2063 | chr12 112000001 113000000 q
2064 | chr12 113000001 114000000 q
2065 | chr12 114000001 115000000 q
2066 | chr12 115000001 116000000 q
2067 | chr12 116000001 117000000 q
2068 | chr12 117000001 118000000 q
2069 | chr12 118000001 119000000 q
2070 | chr12 119000001 120000000 q
2071 | chr12 120000001 121000000 q
2072 | chr12 121000001 122000000 q
2073 | chr12 122000001 123000000 q
2074 | chr12 123000001 124000000 q
2075 | chr12 124000001 125000000 q
2076 | chr12 125000001 126000000 q
2077 | chr12 126000001 127000000 q
2078 | chr12 127000001 128000000 q
2079 | chr12 128000001 129000000 q
2080 | chr12 129000001 130000000 q
2081 | chr12 130000001 131000000 q
2082 | chr12 131000001 132000000 q
2083 | chr12 132000001 133000000 q
2084 | chr12 133000001 133275309 q
2085 | chr13 1 1000000 p
2086 | chr13 1000001 2000000 p
2087 | chr13 2000001 3000000 p
2088 | chr13 3000001 4000000 p
2089 | chr13 4000001 5000000 p
2090 | chr13 5000001 6000000 p
2091 | chr13 6000001 7000000 p
2092 | chr13 7000001 8000000 p
2093 | chr13 8000001 9000000 p
2094 | chr13 9000001 10000000 p
2095 | chr13 10000001 11000000 p
2096 | chr13 11000001 12000000 p
2097 | chr13 12000001 13000000 p
2098 | chr13 13000001 14000000 p
2099 | chr13 14000001 15000000 p
2100 | chr13 15000001 16000000 p
2101 | chr13 16000001 17000000 p
2102 | chr13 17000001 18000000 cen
2103 | chr13 18000001 19000000 cen
2104 | chr13 19000001 20000000 q
2105 | chr13 20000001 21000000 q
2106 | chr13 21000001 22000000 q
2107 | chr13 22000001 23000000 q
2108 | chr13 23000001 24000000 q
2109 | chr13 24000001 25000000 q
2110 | chr13 25000001 26000000 q
2111 | chr13 26000001 27000000 q
2112 | chr13 27000001 28000000 q
2113 | chr13 28000001 29000000 q
2114 | chr13 29000001 30000000 q
2115 | chr13 30000001 31000000 q
2116 | chr13 31000001 32000000 q
2117 | chr13 32000001 33000000 q
2118 | chr13 33000001 34000000 q
2119 | chr13 34000001 35000000 q
2120 | chr13 35000001 36000000 q
2121 | chr13 36000001 37000000 q
2122 | chr13 37000001 38000000 q
2123 | chr13 38000001 39000000 q
2124 | chr13 39000001 40000000 q
2125 | chr13 40000001 41000000 q
2126 | chr13 41000001 42000000 q
2127 | chr13 42000001 43000000 q
2128 | chr13 43000001 44000000 q
2129 | chr13 44000001 45000000 q
2130 | chr13 45000001 46000000 q
2131 | chr13 46000001 47000000 q
2132 | chr13 47000001 48000000 q
2133 | chr13 48000001 49000000 q
2134 | chr13 49000001 50000000 q
2135 | chr13 50000001 51000000 q
2136 | chr13 51000001 52000000 q
2137 | chr13 52000001 53000000 q
2138 | chr13 53000001 54000000 q
2139 | chr13 54000001 55000000 q
2140 | chr13 55000001 56000000 q
2141 | chr13 56000001 57000000 q
2142 | chr13 57000001 58000000 q
2143 | chr13 58000001 59000000 q
2144 | chr13 59000001 60000000 q
2145 | chr13 60000001 61000000 q
2146 | chr13 61000001 62000000 q
2147 | chr13 62000001 63000000 q
2148 | chr13 63000001 64000000 q
2149 | chr13 64000001 65000000 q
2150 | chr13 65000001 66000000 q
2151 | chr13 66000001 67000000 q
2152 | chr13 67000001 68000000 q
2153 | chr13 68000001 69000000 q
2154 | chr13 69000001 70000000 q
2155 | chr13 70000001 71000000 q
2156 | chr13 71000001 72000000 q
2157 | chr13 72000001 73000000 q
2158 | chr13 73000001 74000000 q
2159 | chr13 74000001 75000000 q
2160 | chr13 75000001 76000000 q
2161 | chr13 76000001 77000000 q
2162 | chr13 77000001 78000000 q
2163 | chr13 78000001 79000000 q
2164 | chr13 79000001 80000000 q
2165 | chr13 80000001 81000000 q
2166 | chr13 81000001 82000000 q
2167 | chr13 82000001 83000000 q
2168 | chr13 83000001 84000000 q
2169 | chr13 84000001 85000000 q
2170 | chr13 85000001 86000000 q
2171 | chr13 86000001 87000000 q
2172 | chr13 87000001 88000000 q
2173 | chr13 88000001 89000000 q
2174 | chr13 89000001 90000000 q
2175 | chr13 90000001 91000000 q
2176 | chr13 91000001 92000000 q
2177 | chr13 92000001 93000000 q
2178 | chr13 93000001 94000000 q
2179 | chr13 94000001 95000000 q
2180 | chr13 95000001 96000000 q
2181 | chr13 96000001 97000000 q
2182 | chr13 97000001 98000000 q
2183 | chr13 98000001 99000000 q
2184 | chr13 99000001 100000000 q
2185 | chr13 100000001 101000000 q
2186 | chr13 101000001 102000000 q
2187 | chr13 102000001 103000000 q
2188 | chr13 103000001 104000000 q
2189 | chr13 104000001 105000000 q
2190 | chr13 105000001 106000000 q
2191 | chr13 106000001 107000000 q
2192 | chr13 107000001 108000000 q
2193 | chr13 108000001 109000000 q
2194 | chr13 109000001 110000000 q
2195 | chr13 110000001 111000000 q
2196 | chr13 111000001 112000000 q
2197 | chr13 112000001 113000000 q
2198 | chr13 113000001 114000000 q
2199 | chr13 114000001 114364328 q
2200 | chr14 1 1000000 p
2201 | chr14 1000001 2000000 p
2202 | chr14 2000001 3000000 p
2203 | chr14 3000001 4000000 p
2204 | chr14 4000001 5000000 p
2205 | chr14 5000001 6000000 p
2206 | chr14 6000001 7000000 p
2207 | chr14 7000001 8000000 p
2208 | chr14 8000001 9000000 p
2209 | chr14 9000001 10000000 p
2210 | chr14 10000001 11000000 p
2211 | chr14 11000001 12000000 p
2212 | chr14 12000001 13000000 p
2213 | chr14 13000001 14000000 p
2214 | chr14 14000001 15000000 p
2215 | chr14 15000001 16000000 p
2216 | chr14 16000001 17000000 p
2217 | chr14 17000001 18000000 cen
2218 | chr14 18000001 19000000 cen
2219 | chr14 19000001 20000000 q
2220 | chr14 20000001 21000000 q
2221 | chr14 21000001 22000000 q
2222 | chr14 22000001 23000000 q
2223 | chr14 23000001 24000000 q
2224 | chr14 24000001 25000000 q
2225 | chr14 25000001 26000000 q
2226 | chr14 26000001 27000000 q
2227 | chr14 27000001 28000000 q
2228 | chr14 28000001 29000000 q
2229 | chr14 29000001 30000000 q
2230 | chr14 30000001 31000000 q
2231 | chr14 31000001 32000000 q
2232 | chr14 32000001 33000000 q
2233 | chr14 33000001 34000000 q
2234 | chr14 34000001 35000000 q
2235 | chr14 35000001 36000000 q
2236 | chr14 36000001 37000000 q
2237 | chr14 37000001 38000000 q
2238 | chr14 38000001 39000000 q
2239 | chr14 39000001 40000000 q
2240 | chr14 40000001 41000000 q
2241 | chr14 41000001 42000000 q
2242 | chr14 42000001 43000000 q
2243 | chr14 43000001 44000000 q
2244 | chr14 44000001 45000000 q
2245 | chr14 45000001 46000000 q
2246 | chr14 46000001 47000000 q
2247 | chr14 47000001 48000000 q
2248 | chr14 48000001 49000000 q
2249 | chr14 49000001 50000000 q
2250 | chr14 50000001 51000000 q
2251 | chr14 51000001 52000000 q
2252 | chr14 52000001 53000000 q
2253 | chr14 53000001 54000000 q
2254 | chr14 54000001 55000000 q
2255 | chr14 55000001 56000000 q
2256 | chr14 56000001 57000000 q
2257 | chr14 57000001 58000000 q
2258 | chr14 58000001 59000000 q
2259 | chr14 59000001 60000000 q
2260 | chr14 60000001 61000000 q
2261 | chr14 61000001 62000000 q
2262 | chr14 62000001 63000000 q
2263 | chr14 63000001 64000000 q
2264 | chr14 64000001 65000000 q
2265 | chr14 65000001 66000000 q
2266 | chr14 66000001 67000000 q
2267 | chr14 67000001 68000000 q
2268 | chr14 68000001 69000000 q
2269 | chr14 69000001 70000000 q
2270 | chr14 70000001 71000000 q
2271 | chr14 71000001 72000000 q
2272 | chr14 72000001 73000000 q
2273 | chr14 73000001 74000000 q
2274 | chr14 74000001 75000000 q
2275 | chr14 75000001 76000000 q
2276 | chr14 76000001 77000000 q
2277 | chr14 77000001 78000000 q
2278 | chr14 78000001 79000000 q
2279 | chr14 79000001 80000000 q
2280 | chr14 80000001 81000000 q
2281 | chr14 81000001 82000000 q
2282 | chr14 82000001 83000000 q
2283 | chr14 83000001 84000000 q
2284 | chr14 84000001 85000000 q
2285 | chr14 85000001 86000000 q
2286 | chr14 86000001 87000000 q
2287 | chr14 87000001 88000000 q
2288 | chr14 88000001 89000000 q
2289 | chr14 89000001 90000000 q
2290 | chr14 90000001 91000000 q
2291 | chr14 91000001 92000000 q
2292 | chr14 92000001 93000000 q
2293 | chr14 93000001 94000000 q
2294 | chr14 94000001 95000000 q
2295 | chr14 95000001 96000000 q
2296 | chr14 96000001 97000000 q
2297 | chr14 97000001 98000000 q
2298 | chr14 98000001 99000000 q
2299 | chr14 99000001 100000000 q
2300 | chr14 100000001 101000000 q
2301 | chr14 101000001 102000000 q
2302 | chr14 102000001 103000000 q
2303 | chr14 103000001 104000000 q
2304 | chr14 104000001 105000000 q
2305 | chr14 105000001 106000000 q
2306 | chr14 106000001 107000000 q
2307 | chr14 107000001 107043718 q
2308 | chr15 1 1000000 p
2309 | chr15 1000001 2000000 p
2310 | chr15 2000001 3000000 p
2311 | chr15 3000001 4000000 p
2312 | chr15 4000001 5000000 p
2313 | chr15 5000001 6000000 p
2314 | chr15 6000001 7000000 p
2315 | chr15 7000001 8000000 p
2316 | chr15 8000001 9000000 p
2317 | chr15 9000001 10000000 p
2318 | chr15 10000001 11000000 p
2319 | chr15 11000001 12000000 p
2320 | chr15 12000001 13000000 p
2321 | chr15 13000001 14000000 p
2322 | chr15 14000001 15000000 p
2323 | chr15 15000001 16000000 p
2324 | chr15 16000001 17000000 p
2325 | chr15 17000001 18000000 p
2326 | chr15 18000001 19000000 cen
2327 | chr15 19000001 20000000 cen
2328 | chr15 20000001 21000000 cen
2329 | chr15 21000001 22000000 q
2330 | chr15 22000001 23000000 q
2331 | chr15 23000001 24000000 q
2332 | chr15 24000001 25000000 q
2333 | chr15 25000001 26000000 q
2334 | chr15 26000001 27000000 q
2335 | chr15 27000001 28000000 q
2336 | chr15 28000001 29000000 q
2337 | chr15 29000001 30000000 q
2338 | chr15 30000001 31000000 q
2339 | chr15 31000001 32000000 q
2340 | chr15 32000001 33000000 q
2341 | chr15 33000001 34000000 q
2342 | chr15 34000001 35000000 q
2343 | chr15 35000001 36000000 q
2344 | chr15 36000001 37000000 q
2345 | chr15 37000001 38000000 q
2346 | chr15 38000001 39000000 q
2347 | chr15 39000001 40000000 q
2348 | chr15 40000001 41000000 q
2349 | chr15 41000001 42000000 q
2350 | chr15 42000001 43000000 q
2351 | chr15 43000001 44000000 q
2352 | chr15 44000001 45000000 q
2353 | chr15 45000001 46000000 q
2354 | chr15 46000001 47000000 q
2355 | chr15 47000001 48000000 q
2356 | chr15 48000001 49000000 q
2357 | chr15 49000001 50000000 q
2358 | chr15 50000001 51000000 q
2359 | chr15 51000001 52000000 q
2360 | chr15 52000001 53000000 q
2361 | chr15 53000001 54000000 q
2362 | chr15 54000001 55000000 q
2363 | chr15 55000001 56000000 q
2364 | chr15 56000001 57000000 q
2365 | chr15 57000001 58000000 q
2366 | chr15 58000001 59000000 q
2367 | chr15 59000001 60000000 q
2368 | chr15 60000001 61000000 q
2369 | chr15 61000001 62000000 q
2370 | chr15 62000001 63000000 q
2371 | chr15 63000001 64000000 q
2372 | chr15 64000001 65000000 q
2373 | chr15 65000001 66000000 q
2374 | chr15 66000001 67000000 q
2375 | chr15 67000001 68000000 q
2376 | chr15 68000001 69000000 q
2377 | chr15 69000001 70000000 q
2378 | chr15 70000001 71000000 q
2379 | chr15 71000001 72000000 q
2380 | chr15 72000001 73000000 q
2381 | chr15 73000001 74000000 q
2382 | chr15 74000001 75000000 q
2383 | chr15 75000001 76000000 q
2384 | chr15 76000001 77000000 q
2385 | chr15 77000001 78000000 q
2386 | chr15 78000001 79000000 q
2387 | chr15 79000001 80000000 q
2388 | chr15 80000001 81000000 q
2389 | chr15 81000001 82000000 q
2390 | chr15 82000001 83000000 q
2391 | chr15 83000001 84000000 q
2392 | chr15 84000001 85000000 q
2393 | chr15 85000001 86000000 q
2394 | chr15 86000001 87000000 q
2395 | chr15 87000001 88000000 q
2396 | chr15 88000001 89000000 q
2397 | chr15 89000001 90000000 q
2398 | chr15 90000001 91000000 q
2399 | chr15 91000001 92000000 q
2400 | chr15 92000001 93000000 q
2401 | chr15 93000001 94000000 q
2402 | chr15 94000001 95000000 q
2403 | chr15 95000001 96000000 q
2404 | chr15 96000001 97000000 q
2405 | chr15 97000001 98000000 q
2406 | chr15 98000001 99000000 q
2407 | chr15 99000001 100000000 q
2408 | chr15 100000001 101000000 q
2409 | chr15 101000001 101991189 q
2410 | chr16 1 1000000 p
2411 | chr16 1000001 2000000 p
2412 | chr16 2000001 3000000 p
2413 | chr16 3000001 4000000 p
2414 | chr16 4000001 5000000 p
2415 | chr16 5000001 6000000 p
2416 | chr16 6000001 7000000 p
2417 | chr16 7000001 8000000 p
2418 | chr16 8000001 9000000 p
2419 | chr16 9000001 10000000 p
2420 | chr16 10000001 11000000 p
2421 | chr16 11000001 12000000 p
2422 | chr16 12000001 13000000 p
2423 | chr16 13000001 14000000 p
2424 | chr16 14000001 15000000 p
2425 | chr16 15000001 16000000 p
2426 | chr16 16000001 17000000 p
2427 | chr16 17000001 18000000 p
2428 | chr16 18000001 19000000 p
2429 | chr16 19000001 20000000 p
2430 | chr16 20000001 21000000 p
2431 | chr16 21000001 22000000 p
2432 | chr16 22000001 23000000 p
2433 | chr16 23000001 24000000 p
2434 | chr16 24000001 25000000 p
2435 | chr16 25000001 26000000 p
2436 | chr16 26000001 27000000 p
2437 | chr16 27000001 28000000 p
2438 | chr16 28000001 29000000 p
2439 | chr16 29000001 30000000 p
2440 | chr16 30000001 31000000 p
2441 | chr16 31000001 32000000 p
2442 | chr16 32000001 33000000 p
2443 | chr16 33000001 34000000 p
2444 | chr16 34000001 35000000 p
2445 | chr16 35000001 36000000 p
2446 | chr16 36000001 37000000 cen
2447 | chr16 37000001 38000000 cen
2448 | chr16 38000001 39000000 cen
2449 | chr16 39000001 40000000 q
2450 | chr16 40000001 41000000 q
2451 | chr16 41000001 42000000 q
2452 | chr16 42000001 43000000 q
2453 | chr16 43000001 44000000 q
2454 | chr16 44000001 45000000 q
2455 | chr16 45000001 46000000 q
2456 | chr16 46000001 47000000 q
2457 | chr16 47000001 48000000 q
2458 | chr16 48000001 49000000 q
2459 | chr16 49000001 50000000 q
2460 | chr16 50000001 51000000 q
2461 | chr16 51000001 52000000 q
2462 | chr16 52000001 53000000 q
2463 | chr16 53000001 54000000 q
2464 | chr16 54000001 55000000 q
2465 | chr16 55000001 56000000 q
2466 | chr16 56000001 57000000 q
2467 | chr16 57000001 58000000 q
2468 | chr16 58000001 59000000 q
2469 | chr16 59000001 60000000 q
2470 | chr16 60000001 61000000 q
2471 | chr16 61000001 62000000 q
2472 | chr16 62000001 63000000 q
2473 | chr16 63000001 64000000 q
2474 | chr16 64000001 65000000 q
2475 | chr16 65000001 66000000 q
2476 | chr16 66000001 67000000 q
2477 | chr16 67000001 68000000 q
2478 | chr16 68000001 69000000 q
2479 | chr16 69000001 70000000 q
2480 | chr16 70000001 71000000 q
2481 | chr16 71000001 72000000 q
2482 | chr16 72000001 73000000 q
2483 | chr16 73000001 74000000 q
2484 | chr16 74000001 75000000 q
2485 | chr16 75000001 76000000 q
2486 | chr16 76000001 77000000 q
2487 | chr16 77000001 78000000 q
2488 | chr16 78000001 79000000 q
2489 | chr16 79000001 80000000 q
2490 | chr16 80000001 81000000 q
2491 | chr16 81000001 82000000 q
2492 | chr16 82000001 83000000 q
2493 | chr16 83000001 84000000 q
2494 | chr16 84000001 85000000 q
2495 | chr16 85000001 86000000 q
2496 | chr16 86000001 87000000 q
2497 | chr16 87000001 88000000 q
2498 | chr16 88000001 89000000 q
2499 | chr16 89000001 90000000 q
2500 | chr16 90000001 90338345 q
2501 | chr17 1 1000000 p
2502 | chr17 1000001 2000000 p
2503 | chr17 2000001 3000000 p
2504 | chr17 3000001 4000000 p
2505 | chr17 4000001 5000000 p
2506 | chr17 5000001 6000000 p
2507 | chr17 6000001 7000000 p
2508 | chr17 7000001 8000000 p
2509 | chr17 8000001 9000000 p
2510 | chr17 9000001 10000000 p
2511 | chr17 10000001 11000000 p
2512 | chr17 11000001 12000000 p
2513 | chr17 12000001 13000000 p
2514 | chr17 13000001 14000000 p
2515 | chr17 14000001 15000000 p
2516 | chr17 15000001 16000000 p
2517 | chr17 16000001 17000000 p
2518 | chr17 17000001 18000000 p
2519 | chr17 18000001 19000000 p
2520 | chr17 19000001 20000000 p
2521 | chr17 20000001 21000000 p
2522 | chr17 21000001 22000000 p
2523 | chr17 22000001 23000000 p
2524 | chr17 23000001 24000000 cen
2525 | chr17 24000001 25000000 cen
2526 | chr17 25000001 26000000 cen
2527 | chr17 26000001 27000000 cen
2528 | chr17 27000001 28000000 cen
2529 | chr17 28000001 29000000 q
2530 | chr17 29000001 30000000 q
2531 | chr17 30000001 31000000 q
2532 | chr17 31000001 32000000 q
2533 | chr17 32000001 33000000 q
2534 | chr17 33000001 34000000 q
2535 | chr17 34000001 35000000 q
2536 | chr17 35000001 36000000 q
2537 | chr17 36000001 37000000 q
2538 | chr17 37000001 38000000 q
2539 | chr17 38000001 39000000 q
2540 | chr17 39000001 40000000 q
2541 | chr17 40000001 41000000 q
2542 | chr17 41000001 42000000 q
2543 | chr17 42000001 43000000 q
2544 | chr17 43000001 44000000 q
2545 | chr17 44000001 45000000 q
2546 | chr17 45000001 46000000 q
2547 | chr17 46000001 47000000 q
2548 | chr17 47000001 48000000 q
2549 | chr17 48000001 49000000 q
2550 | chr17 49000001 50000000 q
2551 | chr17 50000001 51000000 q
2552 | chr17 51000001 52000000 q
2553 | chr17 52000001 53000000 q
2554 | chr17 53000001 54000000 q
2555 | chr17 54000001 55000000 q
2556 | chr17 55000001 56000000 q
2557 | chr17 56000001 57000000 q
2558 | chr17 57000001 58000000 q
2559 | chr17 58000001 59000000 q
2560 | chr17 59000001 60000000 q
2561 | chr17 60000001 61000000 q
2562 | chr17 61000001 62000000 q
2563 | chr17 62000001 63000000 q
2564 | chr17 63000001 64000000 q
2565 | chr17 64000001 65000000 q
2566 | chr17 65000001 66000000 q
2567 | chr17 66000001 67000000 q
2568 | chr17 67000001 68000000 q
2569 | chr17 68000001 69000000 q
2570 | chr17 69000001 70000000 q
2571 | chr17 70000001 71000000 q
2572 | chr17 71000001 72000000 q
2573 | chr17 72000001 73000000 q
2574 | chr17 73000001 74000000 q
2575 | chr17 74000001 75000000 q
2576 | chr17 75000001 76000000 q
2577 | chr17 76000001 77000000 q
2578 | chr17 77000001 78000000 q
2579 | chr17 78000001 79000000 q
2580 | chr17 79000001 80000000 q
2581 | chr17 80000001 81000000 q
2582 | chr17 81000001 82000000 q
2583 | chr17 82000001 83000000 q
2584 | chr17 83000001 83257441 q
2585 | chr18 1 1000000 p
2586 | chr18 1000001 2000000 p
2587 | chr18 2000001 3000000 p
2588 | chr18 3000001 4000000 p
2589 | chr18 4000001 5000000 p
2590 | chr18 5000001 6000000 p
2591 | chr18 6000001 7000000 p
2592 | chr18 7000001 8000000 p
2593 | chr18 8000001 9000000 p
2594 | chr18 9000001 10000000 p
2595 | chr18 10000001 11000000 p
2596 | chr18 11000001 12000000 p
2597 | chr18 12000001 13000000 p
2598 | chr18 13000001 14000000 p
2599 | chr18 14000001 15000000 p
2600 | chr18 15000001 16000000 p
2601 | chr18 16000001 17000000 cen
2602 | chr18 17000001 18000000 cen
2603 | chr18 18000001 19000000 cen
2604 | chr18 19000001 20000000 cen
2605 | chr18 20000001 21000000 cen
2606 | chr18 21000001 22000000 cen
2607 | chr18 22000001 23000000 q
2608 | chr18 23000001 24000000 q
2609 | chr18 24000001 25000000 q
2610 | chr18 25000001 26000000 q
2611 | chr18 26000001 27000000 q
2612 | chr18 27000001 28000000 q
2613 | chr18 28000001 29000000 q
2614 | chr18 29000001 30000000 q
2615 | chr18 30000001 31000000 q
2616 | chr18 31000001 32000000 q
2617 | chr18 32000001 33000000 q
2618 | chr18 33000001 34000000 q
2619 | chr18 34000001 35000000 q
2620 | chr18 35000001 36000000 q
2621 | chr18 36000001 37000000 q
2622 | chr18 37000001 38000000 q
2623 | chr18 38000001 39000000 q
2624 | chr18 39000001 40000000 q
2625 | chr18 40000001 41000000 q
2626 | chr18 41000001 42000000 q
2627 | chr18 42000001 43000000 q
2628 | chr18 43000001 44000000 q
2629 | chr18 44000001 45000000 q
2630 | chr18 45000001 46000000 q
2631 | chr18 46000001 47000000 q
2632 | chr18 47000001 48000000 q
2633 | chr18 48000001 49000000 q
2634 | chr18 49000001 50000000 q
2635 | chr18 50000001 51000000 q
2636 | chr18 51000001 52000000 q
2637 | chr18 52000001 53000000 q
2638 | chr18 53000001 54000000 q
2639 | chr18 54000001 55000000 q
2640 | chr18 55000001 56000000 q
2641 | chr18 56000001 57000000 q
2642 | chr18 57000001 58000000 q
2643 | chr18 58000001 59000000 q
2644 | chr18 59000001 60000000 q
2645 | chr18 60000001 61000000 q
2646 | chr18 61000001 62000000 q
2647 | chr18 62000001 63000000 q
2648 | chr18 63000001 64000000 q
2649 | chr18 64000001 65000000 q
2650 | chr18 65000001 66000000 q
2651 | chr18 66000001 67000000 q
2652 | chr18 67000001 68000000 q
2653 | chr18 68000001 69000000 q
2654 | chr18 69000001 70000000 q
2655 | chr18 70000001 71000000 q
2656 | chr18 71000001 72000000 q
2657 | chr18 72000001 73000000 q
2658 | chr18 73000001 74000000 q
2659 | chr18 74000001 75000000 q
2660 | chr18 75000001 76000000 q
2661 | chr18 76000001 77000000 q
2662 | chr18 77000001 78000000 q
2663 | chr18 78000001 79000000 q
2664 | chr18 79000001 80000000 q
2665 | chr18 80000001 80373285 q
2666 | chr19 1 1000000 p
2667 | chr19 1000001 2000000 p
2668 | chr19 2000001 3000000 p
2669 | chr19 3000001 4000000 p
2670 | chr19 4000001 5000000 p
2671 | chr19 5000001 6000000 p
2672 | chr19 6000001 7000000 p
2673 | chr19 7000001 8000000 p
2674 | chr19 8000001 9000000 p
2675 | chr19 9000001 10000000 p
2676 | chr19 10000001 11000000 p
2677 | chr19 11000001 12000000 p
2678 | chr19 12000001 13000000 p
2679 | chr19 13000001 14000000 p
2680 | chr19 14000001 15000000 p
2681 | chr19 15000001 16000000 p
2682 | chr19 16000001 17000000 p
2683 | chr19 17000001 18000000 p
2684 | chr19 18000001 19000000 p
2685 | chr19 19000001 20000000 p
2686 | chr19 20000001 21000000 p
2687 | chr19 21000001 22000000 p
2688 | chr19 22000001 23000000 p
2689 | chr19 23000001 24000000 p
2690 | chr19 24000001 25000000 p
2691 | chr19 25000001 26000000 cen
2692 | chr19 26000001 27000000 cen
2693 | chr19 27000001 28000000 cen
2694 | chr19 28000001 29000000 cen
2695 | chr19 29000001 30000000 q
2696 | chr19 30000001 31000000 q
2697 | chr19 31000001 32000000 q
2698 | chr19 32000001 33000000 q
2699 | chr19 33000001 34000000 q
2700 | chr19 34000001 35000000 q
2701 | chr19 35000001 36000000 q
2702 | chr19 36000001 37000000 q
2703 | chr19 37000001 38000000 q
2704 | chr19 38000001 39000000 q
2705 | chr19 39000001 40000000 q
2706 | chr19 40000001 41000000 q
2707 | chr19 41000001 42000000 q
2708 | chr19 42000001 43000000 q
2709 | chr19 43000001 44000000 q
2710 | chr19 44000001 45000000 q
2711 | chr19 45000001 46000000 q
2712 | chr19 46000001 47000000 q
2713 | chr19 47000001 48000000 q
2714 | chr19 48000001 49000000 q
2715 | chr19 49000001 50000000 q
2716 | chr19 50000001 51000000 q
2717 | chr19 51000001 52000000 q
2718 | chr19 52000001 53000000 q
2719 | chr19 53000001 54000000 q
2720 | chr19 54000001 55000000 q
2721 | chr19 55000001 56000000 q
2722 | chr19 56000001 57000000 q
2723 | chr19 57000001 58000000 q
2724 | chr19 58000001 58617616 q
2725 | chr20 1 1000000 p
2726 | chr20 1000001 2000000 p
2727 | chr20 2000001 3000000 p
2728 | chr20 3000001 4000000 p
2729 | chr20 4000001 5000000 p
2730 | chr20 5000001 6000000 p
2731 | chr20 6000001 7000000 p
2732 | chr20 7000001 8000000 p
2733 | chr20 8000001 9000000 p
2734 | chr20 9000001 10000000 p
2735 | chr20 10000001 11000000 p
2736 | chr20 11000001 12000000 p
2737 | chr20 12000001 13000000 p
2738 | chr20 13000001 14000000 p
2739 | chr20 14000001 15000000 p
2740 | chr20 15000001 16000000 p
2741 | chr20 16000001 17000000 p
2742 | chr20 17000001 18000000 p
2743 | chr20 18000001 19000000 p
2744 | chr20 19000001 20000000 p
2745 | chr20 20000001 21000000 p
2746 | chr20 21000001 22000000 p
2747 | chr20 22000001 23000000 p
2748 | chr20 23000001 24000000 p
2749 | chr20 24000001 25000000 p
2750 | chr20 25000001 26000000 p
2751 | chr20 26000001 27000000 cen
2752 | chr20 27000001 28000000 cen
2753 | chr20 28000001 29000000 cen
2754 | chr20 29000001 30000000 cen
2755 | chr20 30000001 31000000 cen
2756 | chr20 31000001 32000000 q
2757 | chr20 32000001 33000000 q
2758 | chr20 33000001 34000000 q
2759 | chr20 34000001 35000000 q
2760 | chr20 35000001 36000000 q
2761 | chr20 36000001 37000000 q
2762 | chr20 37000001 38000000 q
2763 | chr20 38000001 39000000 q
2764 | chr20 39000001 40000000 q
2765 | chr20 40000001 41000000 q
2766 | chr20 41000001 42000000 q
2767 | chr20 42000001 43000000 q
2768 | chr20 43000001 44000000 q
2769 | chr20 44000001 45000000 q
2770 | chr20 45000001 46000000 q
2771 | chr20 46000001 47000000 q
2772 | chr20 47000001 48000000 q
2773 | chr20 48000001 49000000 q
2774 | chr20 49000001 50000000 q
2775 | chr20 50000001 51000000 q
2776 | chr20 51000001 52000000 q
2777 | chr20 52000001 53000000 q
2778 | chr20 53000001 54000000 q
2779 | chr20 54000001 55000000 q
2780 | chr20 55000001 56000000 q
2781 | chr20 56000001 57000000 q
2782 | chr20 57000001 58000000 q
2783 | chr20 58000001 59000000 q
2784 | chr20 59000001 60000000 q
2785 | chr20 60000001 61000000 q
2786 | chr20 61000001 62000000 q
2787 | chr20 62000001 63000000 q
2788 | chr20 63000001 64000000 q
2789 | chr20 64000001 64444167 q
2790 | chr21 1 1000000 p
2791 | chr21 1000001 2000000 p
2792 | chr21 2000001 3000000 p
2793 | chr21 3000001 4000000 p
2794 | chr21 4000001 5000000 p
2795 | chr21 5000001 6000000 p
2796 | chr21 6000001 7000000 p
2797 | chr21 7000001 8000000 p
2798 | chr21 8000001 9000000 p
2799 | chr21 9000001 10000000 p
2800 | chr21 10000001 11000000 p
2801 | chr21 11000001 12000000 cen
2802 | chr21 12000001 13000000 cen
2803 | chr21 13000001 14000000 q
2804 | chr21 14000001 15000000 q
2805 | chr21 15000001 16000000 q
2806 | chr21 16000001 17000000 q
2807 | chr21 17000001 18000000 q
2808 | chr21 18000001 19000000 q
2809 | chr21 19000001 20000000 q
2810 | chr21 20000001 21000000 q
2811 | chr21 21000001 22000000 q
2812 | chr21 22000001 23000000 q
2813 | chr21 23000001 24000000 q
2814 | chr21 24000001 25000000 q
2815 | chr21 25000001 26000000 q
2816 | chr21 26000001 27000000 q
2817 | chr21 27000001 28000000 q
2818 | chr21 28000001 29000000 q
2819 | chr21 29000001 30000000 q
2820 | chr21 30000001 31000000 q
2821 | chr21 31000001 32000000 q
2822 | chr21 32000001 33000000 q
2823 | chr21 33000001 34000000 q
2824 | chr21 34000001 35000000 q
2825 | chr21 35000001 36000000 q
2826 | chr21 36000001 37000000 q
2827 | chr21 37000001 38000000 q
2828 | chr21 38000001 39000000 q
2829 | chr21 39000001 40000000 q
2830 | chr21 40000001 41000000 q
2831 | chr21 41000001 42000000 q
2832 | chr21 42000001 43000000 q
2833 | chr21 43000001 44000000 q
2834 | chr21 44000001 45000000 q
2835 | chr21 45000001 46000000 q
2836 | chr21 46000001 46709983 q
2837 | chr22 1 1000000 p
2838 | chr22 1000001 2000000 p
2839 | chr22 2000001 3000000 p
2840 | chr22 3000001 4000000 p
2841 | chr22 4000001 5000000 p
2842 | chr22 5000001 6000000 p
2843 | chr22 6000001 7000000 p
2844 | chr22 7000001 8000000 p
2845 | chr22 8000001 9000000 p
2846 | chr22 9000001 10000000 p
2847 | chr22 10000001 11000000 p
2848 | chr22 11000001 12000000 p
2849 | chr22 12000001 13000000 p
2850 | chr22 13000001 14000000 p
2851 | chr22 14000001 15000000 cen
2852 | chr22 15000001 16000000 cen
2853 | chr22 16000001 17000000 cen
2854 | chr22 17000001 18000000 cen
2855 | chr22 18000001 19000000 q
2856 | chr22 19000001 20000000 q
2857 | chr22 20000001 21000000 q
2858 | chr22 21000001 22000000 q
2859 | chr22 22000001 23000000 q
2860 | chr22 23000001 24000000 q
2861 | chr22 24000001 25000000 q
2862 | chr22 25000001 26000000 q
2863 | chr22 26000001 27000000 q
2864 | chr22 27000001 28000000 q
2865 | chr22 28000001 29000000 q
2866 | chr22 29000001 30000000 q
2867 | chr22 30000001 31000000 q
2868 | chr22 31000001 32000000 q
2869 | chr22 32000001 33000000 q
2870 | chr22 33000001 34000000 q
2871 | chr22 34000001 35000000 q
2872 | chr22 35000001 36000000 q
2873 | chr22 36000001 37000000 q
2874 | chr22 37000001 38000000 q
2875 | chr22 38000001 39000000 q
2876 | chr22 39000001 40000000 q
2877 | chr22 40000001 41000000 q
2878 | chr22 41000001 42000000 q
2879 | chr22 42000001 43000000 q
2880 | chr22 43000001 44000000 q
2881 | chr22 44000001 45000000 q
2882 | chr22 45000001 46000000 q
2883 | chr22 46000001 47000000 q
2884 | chr22 47000001 48000000 q
2885 | chr22 48000001 49000000 q
2886 | chr22 49000001 50000000 q
2887 | chr22 50000001 50818468 q
2888 | chrX 1 1000000 p
2889 | chrX 1000001 2000000 p
2890 | chrX 2000001 3000000 p
2891 | chrX 3000001 4000000 p
2892 | chrX 4000001 5000000 p
2893 | chrX 5000001 6000000 p
2894 | chrX 6000001 7000000 p
2895 | chrX 7000001 8000000 p
2896 | chrX 8000001 9000000 p
2897 | chrX 9000001 10000000 p
2898 | chrX 10000001 11000000 p
2899 | chrX 11000001 12000000 p
2900 | chrX 12000001 13000000 p
2901 | chrX 13000001 14000000 p
2902 | chrX 14000001 15000000 p
2903 | chrX 15000001 16000000 p
2904 | chrX 16000001 17000000 p
2905 | chrX 17000001 18000000 p
2906 | chrX 18000001 19000000 p
2907 | chrX 19000001 20000000 p
2908 | chrX 20000001 21000000 p
2909 | chrX 21000001 22000000 p
2910 | chrX 22000001 23000000 p
2911 | chrX 23000001 24000000 p
2912 | chrX 24000001 25000000 p
2913 | chrX 25000001 26000000 p
2914 | chrX 26000001 27000000 p
2915 | chrX 27000001 28000000 p
2916 | chrX 28000001 29000000 p
2917 | chrX 29000001 30000000 p
2918 | chrX 30000001 31000000 p
2919 | chrX 31000001 32000000 p
2920 | chrX 32000001 33000000 p
2921 | chrX 33000001 34000000 p
2922 | chrX 34000001 35000000 p
2923 | chrX 35000001 36000000 p
2924 | chrX 36000001 37000000 p
2925 | chrX 37000001 38000000 p
2926 | chrX 38000001 39000000 p
2927 | chrX 39000001 40000000 p
2928 | chrX 40000001 41000000 p
2929 | chrX 41000001 42000000 p
2930 | chrX 42000001 43000000 p
2931 | chrX 43000001 44000000 p
2932 | chrX 44000001 45000000 p
2933 | chrX 45000001 46000000 p
2934 | chrX 46000001 47000000 p
2935 | chrX 47000001 48000000 p
2936 | chrX 48000001 49000000 p
2937 | chrX 49000001 50000000 p
2938 | chrX 50000001 51000000 p
2939 | chrX 51000001 52000000 p
2940 | chrX 52000001 53000000 p
2941 | chrX 53000001 54000000 p
2942 | chrX 54000001 55000000 p
2943 | chrX 55000001 56000000 p
2944 | chrX 56000001 57000000 p
2945 | chrX 57000001 58000000 p
2946 | chrX 58000001 59000000 p
2947 | chrX 59000001 60000000 cen
2948 | chrX 60000001 61000000 cen
2949 | chrX 61000001 62000000 cen
2950 | chrX 62000001 63000000 cen
2951 | chrX 63000001 64000000 cen
2952 | chrX 64000001 65000000 q
2953 | chrX 65000001 66000000 q
2954 | chrX 66000001 67000000 q
2955 | chrX 67000001 68000000 q
2956 | chrX 68000001 69000000 q
2957 | chrX 69000001 70000000 q
2958 | chrX 70000001 71000000 q
2959 | chrX 71000001 72000000 q
2960 | chrX 72000001 73000000 q
2961 | chrX 73000001 74000000 q
2962 | chrX 74000001 75000000 q
2963 | chrX 75000001 76000000 q
2964 | chrX 76000001 77000000 q
2965 | chrX 77000001 78000000 q
2966 | chrX 78000001 79000000 q
2967 | chrX 79000001 80000000 q
2968 | chrX 80000001 81000000 q
2969 | chrX 81000001 82000000 q
2970 | chrX 82000001 83000000 q
2971 | chrX 83000001 84000000 q
2972 | chrX 84000001 85000000 q
2973 | chrX 85000001 86000000 q
2974 | chrX 86000001 87000000 q
2975 | chrX 87000001 88000000 q
2976 | chrX 88000001 89000000 q
2977 | chrX 89000001 90000000 q
2978 | chrX 90000001 91000000 q
2979 | chrX 91000001 92000000 q
2980 | chrX 92000001 93000000 q
2981 | chrX 93000001 94000000 q
2982 | chrX 94000001 95000000 q
2983 | chrX 95000001 96000000 q
2984 | chrX 96000001 97000000 q
2985 | chrX 97000001 98000000 q
2986 | chrX 98000001 99000000 q
2987 | chrX 99000001 100000000 q
2988 | chrX 100000001 101000000 q
2989 | chrX 101000001 102000000 q
2990 | chrX 102000001 103000000 q
2991 | chrX 103000001 104000000 q
2992 | chrX 104000001 105000000 q
2993 | chrX 105000001 106000000 q
2994 | chrX 106000001 107000000 q
2995 | chrX 107000001 108000000 q
2996 | chrX 108000001 109000000 q
2997 | chrX 109000001 110000000 q
2998 | chrX 110000001 111000000 q
2999 | chrX 111000001 112000000 q
3000 | chrX 112000001 113000000 q
3001 | chrX 113000001 114000000 q
3002 | chrX 114000001 115000000 q
3003 | chrX 115000001 116000000 q
3004 | chrX 116000001 117000000 q
3005 | chrX 117000001 118000000 q
3006 | chrX 118000001 119000000 q
3007 | chrX 119000001 120000000 q
3008 | chrX 120000001 121000000 q
3009 | chrX 121000001 122000000 q
3010 | chrX 122000001 123000000 q
3011 | chrX 123000001 124000000 q
3012 | chrX 124000001 125000000 q
3013 | chrX 125000001 126000000 q
3014 | chrX 126000001 127000000 q
3015 | chrX 127000001 128000000 q
3016 | chrX 128000001 129000000 q
3017 | chrX 129000001 130000000 q
3018 | chrX 130000001 131000000 q
3019 | chrX 131000001 132000000 q
3020 | chrX 132000001 133000000 q
3021 | chrX 133000001 134000000 q
3022 | chrX 134000001 135000000 q
3023 | chrX 135000001 136000000 q
3024 | chrX 136000001 137000000 q
3025 | chrX 137000001 138000000 q
3026 | chrX 138000001 139000000 q
3027 | chrX 139000001 140000000 q
3028 | chrX 140000001 141000000 q
3029 | chrX 141000001 142000000 q
3030 | chrX 142000001 143000000 q
3031 | chrX 143000001 144000000 q
3032 | chrX 144000001 145000000 q
3033 | chrX 145000001 146000000 q
3034 | chrX 146000001 147000000 q
3035 | chrX 147000001 148000000 q
3036 | chrX 148000001 149000000 q
3037 | chrX 149000001 150000000 q
3038 | chrX 150000001 151000000 q
3039 | chrX 151000001 152000000 q
3040 | chrX 152000001 153000000 q
3041 | chrX 153000001 154000000 q
3042 | chrX 154000001 155000000 q
3043 | chrX 155000001 156000000 q
3044 | chrX 156000001 156040895 q
3045 | chrY 1 1000000 p
3046 | chrY 1000001 2000000 p
3047 | chrY 2000001 3000000 p
3048 | chrY 3000001 4000000 p
3049 | chrY 4000001 5000000 p
3050 | chrY 5000001 6000000 p
3051 | chrY 6000001 7000000 p
3052 | chrY 7000001 8000000 p
3053 | chrY 8000001 9000000 p
3054 | chrY 9000001 10000000 p
3055 | chrY 10000001 11000000 p
3056 | chrY 11000001 12000000 q
3057 | chrY 12000001 13000000 q
3058 | chrY 13000001 14000000 q
3059 | chrY 14000001 15000000 q
3060 | chrY 15000001 16000000 q
3061 | chrY 16000001 17000000 q
3062 | chrY 17000001 18000000 q
3063 | chrY 18000001 19000000 q
3064 | chrY 19000001 20000000 q
3065 | chrY 20000001 21000000 q
3066 | chrY 21000001 22000000 q
3067 | chrY 22000001 23000000 q
3068 | chrY 23000001 24000000 q
3069 | chrY 24000001 25000000 q
3070 | chrY 25000001 26000000 q
3071 | chrY 26000001 27000000 q
3072 | chrY 27000001 28000000 q
3073 | chrY 28000001 29000000 q
3074 | chrY 29000001 30000000 q
3075 | chrY 30000001 31000000 q
3076 | chrY 31000001 32000000 q
3077 | chrY 32000001 33000000 q
3078 | chrY 33000001 34000000 q
3079 | chrY 34000001 35000000 q
3080 | chrY 35000001 36000000 q
3081 | chrY 36000001 37000000 q
3082 | chrY 37000001 38000000 q
3083 | chrY 38000001 39000000 q
3084 | chrY 39000001 40000000 q
3085 | chrY 40000001 41000000 q
3086 | chrY 41000001 42000000 q
3087 | chrY 42000001 43000000 q
3088 | chrY 43000001 44000000 q
3089 | chrY 44000001 45000000 q
3090 | chrY 45000001 46000000 q
3091 | chrY 46000001 47000000 q
3092 | chrY 47000001 48000000 q
3093 | chrY 48000001 49000000 q
3094 | chrY 49000001 50000000 q
3095 | chrY 50000001 51000000 q
3096 | chrY 51000001 52000000 q
3097 | chrY 52000001 53000000 q
3098 | chrY 53000001 54000000 q
3099 | chrY 54000001 55000000 q
3100 | chrY 55000001 56000000 q
3101 | chrY 56000001 57000000 q
3102 | chrY 57000001 57227415 q
3103 | chrM 1 16569 -
3104 |
--------------------------------------------------------------------------------
/hg38_references/hg38_chrom_sizes.tsv:
--------------------------------------------------------------------------------
1 | chr1 248956422
2 | chr2 242193529
3 | chr3 198295559
4 | chr4 190214555
5 | chr5 181538259
6 | chr6 170805979
7 | chr7 159345973
8 | chr8 145138636
9 | chr9 138394717
10 | chr10 133797422
11 | chr11 135086622
12 | chr12 133275309
13 | chr13 114364328
14 | chr14 107043718
15 | chr15 101991189
16 | chr16 90338345
17 | chr17 83257441
18 | chr18 80373285
19 | chr19 58617616
20 | chr20 64444167
21 | chr21 46709983
22 | chr22 50818468
23 | chrX 156040895
24 | chrY 57227415
25 | chrM 16569
26 |
--------------------------------------------------------------------------------
/man/annotateCNV3.Rd:
--------------------------------------------------------------------------------
1 | % Generated by roxygen2: do not edit by hand
2 | % Please edit documentation in R/cnv_caller_functions_packaged.R
3 | \name{annotateCNV3}
4 | \alias{annotateCNV3}
5 | \title{annotateCNV3}
6 | \usage{
7 | annotateCNV3(cnvResults, saveOutput = TRUE, maxClust2 = 4, outputSuffix = "_1")
8 | }
9 | \arguments{
10 | \item{cnvResults}{output of filtered CNVs (set of lists)}
11 |
12 | \item{saveOutput}{save output to a file on disk}
13 |
14 | \item{maxClust2}{maximum # of clusters}
15 |
16 | \item{outputSuffix}{output suffix to save files}
17 | }
18 | \description{
19 | Annotates the filtered CNV calls and saves the results, and estimates absolute copy numbers
20 | }
21 | \examples{
22 | annotateCNV3(cleanCNV,saveOutput=TRUE,outputSuffix="_nolog")
23 | }
24 | \keyword{CNV}
25 | \keyword{output}
26 |
--------------------------------------------------------------------------------
/man/annotateCNV4.Rd:
--------------------------------------------------------------------------------
1 | % Generated by roxygen2: do not edit by hand
2 | % Please edit documentation in R/cnv_caller_functions_packaged.R
3 | \name{annotateCNV4}
4 | \alias{annotateCNV4}
5 | \title{annotateCNV4}
6 | \usage{
7 | annotateCNV4(
8 | cnvResults,
9 | saveOutput = TRUE,
10 | maxClust2 = 4,
11 | outputSuffix = "_1",
12 | sdCNV = 0.6,
13 | filterResults = TRUE,
14 | filterRange = 0.8,
15 | minAlteredCells = 40
16 | )
17 | }
18 | \arguments{
19 | \item{cnvResults}{output of filtered CNVs (set of lists)}
20 |
21 | \item{saveOutput}{save output to a file on disk}
22 |
23 | \item{maxClust2}{maximum # of clusters}
24 |
25 | \item{outputSuffix}{output suffix to save files}
26 |
27 | \item{sdCNV}{sd for CNV copy number estimation}
28 |
29 | \item{filterResults}{filter results to remove likely unaltered chromosomes}
30 |
31 | \item{filterRange}{copy number range minimum}
32 |
33 | \item{minAlteredCells}{filtering parameter - remove all alterations with a smallest group less than X cells (default is 40)}
34 | }
35 | \description{
36 | Annotates the filtered CNV calls and saves the results, and estimates absolute copy numbers
37 | }
38 | \examples{
39 | annotateCNV4(cleanCNV,saveOutput=TRUE,outputSuffix="_nolog",sdCNV=0.5)
40 | }
41 | \keyword{CNV}
42 | \keyword{output}
43 |
--------------------------------------------------------------------------------
/man/annotateCNV4B.Rd:
--------------------------------------------------------------------------------
1 | % Generated by roxygen2: do not edit by hand
2 | % Please edit documentation in R/cnv_caller_functions_packaged.R
3 | \name{annotateCNV4B}
4 | \alias{annotateCNV4B}
5 | \title{annotateCNV4B}
6 | \usage{
7 | annotateCNV4B(
8 | cnvResults,
9 | expectedNormals,
10 | saveOutput = TRUE,
11 | maxClust2 = 4,
12 | outputSuffix = "_1",
13 | sdCNV = 0.6,
14 | filterResults = TRUE,
15 | filterRange = 0.8,
16 | minAlteredCellProp = 0.75
17 | )
18 | }
19 | \arguments{
20 | \item{cnvResults}{output of filtered CNVs (set of lists)}
21 |
22 | \item{expectedNormals}{list of normal barcodes}
23 |
24 | \item{saveOutput}{save output to a file on disk}
25 |
26 | \item{maxClust2}{maximum # of clusters}
27 |
28 | \item{outputSuffix}{output suffix to save files}
29 |
30 | \item{sdCNV}{sd for CNV copy number estimation}
31 |
32 | \item{filterResults}{filter results to remove likely unaltered chromosomes}
33 |
34 | \item{filterRange}{copy number range minimum}
35 |
36 | \item{minAlteredCellProp}{filtering parameter - proportion of normal cell population that should be unaltered, default is 0.75}
37 | }
38 | \description{
39 | Annotates the filtered CNV calls and saves the results, and estimates absolute copy numbers
40 | unlike the regular version, this uses predicted normal cells to set the normal values to 2
41 | }
42 | \keyword{CNV}
43 | \keyword{output}
44 |
--------------------------------------------------------------------------------
/man/annotateLosses.Rd:
--------------------------------------------------------------------------------
1 | % Generated by roxygen2: do not edit by hand
2 | % Please edit documentation in R/cnv_caller_functions_packaged.R
3 | \name{annotateLosses}
4 | \alias{annotateLosses}
5 | \title{AnnotateLosses}
6 | \usage{
7 | annotateLosses(lossFile)
8 | }
9 | \arguments{
10 | \item{lossFile}{the file for LOH putative reginos}
11 | }
12 | \description{
13 | This function allows you to annotate loss regions
14 | }
15 | \keyword{Losses}
16 |
--------------------------------------------------------------------------------
/man/clusterCNV.Rd:
--------------------------------------------------------------------------------
1 | % Generated by roxygen2: do not edit by hand
2 | % Please edit documentation in R/cnv_caller_functions_packaged.R
3 | \name{clusterCNV}
4 | \alias{clusterCNV}
5 | \title{clusterCNVs}
6 | \usage{
7 | clusterCNV(initialResultList, medianIQR, maxClust = 4, minDiff = 0.25)
8 | }
9 | \arguments{
10 | \item{initialResultList}{output list generated by identifyCNVClusters}
11 |
12 | \item{medianIQR}{median and IQR list of sample}
13 |
14 | \item{maxClust}{maximum # of clusters fed into identifyCNVClusters}
15 |
16 | \item{minDiff}{minimum Z-score difference between clusters}
17 | }
18 | \description{
19 | Cleans the putative CNV calls
20 | }
21 | \keyword{CNV}
22 |
--------------------------------------------------------------------------------
/man/collapseChrom3N.Rd:
--------------------------------------------------------------------------------
1 | % Generated by roxygen2: do not edit by hand
2 | % Please edit documentation in R/cnv_caller_functions_packaged.R
3 | \name{collapseChrom3N}
4 | \alias{collapseChrom3N}
5 | \title{collapseChrom3N}
6 | \usage{
7 | collapseChrom3N(
8 | inputMatrix,
9 | minimumSegments = 40,
10 | summaryFunction = cutAverage,
11 | logTrans = FALSE,
12 | binExpand = 1,
13 | minimumChromValue = 2,
14 | tssEnrich = 5,
15 | logBase = 2,
16 | minCPG = 300,
17 | powVal = 0.73
18 | )
19 | }
20 | \arguments{
21 | \item{tssEnrich}{multiply CpG by weighting factor (default 1)}
22 |
23 | \item{logBase}{log base to apply if doing a log weighting of the CpG scaling factor}
24 |
25 | \item{minCPG}{keep only regions with at least CpG score of X (300)}
26 |
27 | \item{powVal}{scaling factor adjustment (cpg^powVal, 0.7-0.75 works well for hg38 and hg19)}
28 |
29 | \item{inputMatrix:}{normalised matrix}
30 |
31 | \item{summaryFunction:}{function to use to summarise signal}
32 |
33 | \item{logTrans:}{whether matrix is log-transformed}
34 |
35 | \item{binExpand:}{whether to merge adjacent bins, if so how many (merges if > 1)}
36 |
37 | \item{minimumChromValue:}{cutoff to keep a chromosome}
38 | }
39 | \description{
40 | This function summarises signal across chromosomes and normalises using the CpG content
41 | }
42 | \keyword{CNV}
43 |
--------------------------------------------------------------------------------
/man/computeCenters.Rd:
--------------------------------------------------------------------------------
1 | % Generated by roxygen2: do not edit by hand
2 | % Please edit documentation in R/cnv_caller_functions_packaged.R
3 | \name{computeCenters}
4 | \alias{computeCenters}
5 | \title{computeCenters}
6 | \usage{
7 | computeCenters(inputMatrix, summaryFunction = cutAverage)
8 | }
9 | \arguments{
10 | \item{inputMatrix}{- normalised, filtered matrix}
11 |
12 | \item{summaryFunction}{- summary function to use (defaults to cutAverage)}
13 | }
14 | \description{
15 | Recompute range values after normalization and filtering. Returns a list containing values with summary values and IQRs
16 | }
17 | \examples{
18 | listCenters <- computeCenters(inputMatrix,cutAverage)
19 | }
20 | \keyword{CNV}
21 | \keyword{median}
22 |
--------------------------------------------------------------------------------
/man/cutAverage.Rd:
--------------------------------------------------------------------------------
1 | % Generated by roxygen2: do not edit by hand
2 | % Please edit documentation in R/cnv_caller_functions_packaged.R
3 | \name{cutAverage}
4 | \alias{cutAverage}
5 | \title{cutAverage}
6 | \usage{
7 | cutAverage(inputVector)
8 | }
9 | \arguments{
10 | \item{inputVector}{- vector of numbers}
11 | }
12 | \description{
13 | Averages regions of vector between prespecified quantiles
14 | }
15 | \keyword{average`}
16 |
--------------------------------------------------------------------------------
/man/estimateCellCycleFraction.Rd:
--------------------------------------------------------------------------------
1 | % Generated by roxygen2: do not edit by hand
2 | % Please edit documentation in R/cnv_caller_functions_packaged.R
3 | \name{estimateCellCycleFraction}
4 | \alias{estimateCellCycleFraction}
5 | \title{estimateCellCycleFraction
6 | Detect cycling cells using chromosome X
7 | Returns list of barcodes and cluster assignments, and list of non-neoplastic cells}
8 | \usage{
9 | estimateCellCycleFraction(
10 | inputMatrix,
11 | sampName,
12 | cutoff = 10000,
13 | maxG = 4,
14 | logTrans = FALSE,
15 | modelName = "E",
16 | chromToUse = "chrX"
17 | )
18 | }
19 | \arguments{
20 | \item{inputMatrix}{Matrix (unfiltered before normalization only)}
21 |
22 | \item{cutoff}{Minimum cutoff to discard noisy cell}
23 |
24 | \item{maxG}{maximum number of G components to use (default is 4)}
25 |
26 | \item{logTrans}{log transform data (default is faulse)}
27 |
28 | \item{modelName}{Model option for MCLUST (default is E)}
29 |
30 | \item{chromToUse}{Chromosome to use for normalization (default is chrX)}
31 | }
32 | \description{
33 | estimateCellCycleFraction
34 | Detect cycling cells using chromosome X
35 | Returns list of barcodes and cluster assignments, and list of non-neoplastic cells
36 | }
37 | \keyword{CNV}
38 | \keyword{cell}
39 | \keyword{cycle}
40 |
--------------------------------------------------------------------------------
/man/filterCells.Rd:
--------------------------------------------------------------------------------
1 | % Generated by roxygen2: do not edit by hand
2 | % Please edit documentation in R/cnv_caller_functions_packaged.R
3 | \name{filterCells}
4 | \alias{filterCells}
5 | \title{filterCells}
6 | \usage{
7 | filterCells(inputMatrix, minimumSegments = 40, minDensity = 0, signalSDcut = 2)
8 | }
9 | \arguments{
10 | \item{inputMatrix}{- collapsed, normalised matrix}
11 |
12 | \item{minimumSegments}{the minimum segments required to keep a cell}
13 |
14 | \item{minDensity}{minimum segment density to consider useful (defaults to zero)}
15 |
16 | \item{signalSDcut}{Number of standard deviations average signal of a cell must be from an average per-cell signal to be considered an outlier (to identify putative doublets; default: 2)}
17 | }
18 | \description{
19 | This function filters the collapsed chromosome signal density matrix based on predefined parameters (minimum non-zero chromosome segments)
20 | }
21 | \examples{
22 | filterCells(inputMatrix,minimumSegments=41)
23 | }
24 | \keyword{CNV}
25 | \keyword{filter}
26 |
--------------------------------------------------------------------------------
/man/generateReferences.Rd:
--------------------------------------------------------------------------------
1 | % Generated by roxygen2: do not edit by hand
2 | % Please edit documentation in R/cnv_caller_functions_packaged.R
3 | \name{generateReferences}
4 | \alias{generateReferences}
5 | \title{generateReferences
6 | Generate reference files from UCSC for genome of interest
7 | Returns CPG, chromosome size and cytoband data into target directory}
8 | \usage{
9 | generateReferences(
10 | genomeObject,
11 | genomeText = "hg38",
12 | tileWidth = 1e+06,
13 | outputDir = "~"
14 | )
15 | }
16 | \arguments{
17 | \item{genomeObject}{BSgenome object of interest}
18 |
19 | \item{genomeText}{Shorthand for genome in UCSC (defaults to hg38)}
20 |
21 | \item{tileWidth}{Width of tiles - (default: 1e6)}
22 |
23 | \item{outputDir}{Output directory to save reference files to (default: ~)}
24 | }
25 | \description{
26 | generateReferences
27 | Generate reference files from UCSC for genome of interest
28 | Returns CPG, chromosome size and cytoband data into target directory
29 | }
30 | \keyword{CNV}
31 | \keyword{reference}
32 |
--------------------------------------------------------------------------------
/man/getAlteredSegments.Rd:
--------------------------------------------------------------------------------
1 | % Generated by roxygen2: do not edit by hand
2 | % Please edit documentation in R/cnv_caller_functions_packaged.R
3 | \name{getAlteredSegments}
4 | \alias{getAlteredSegments}
5 | \title{getAlteredSegments}
6 | \usage{
7 | getAlteredSegments(
8 | inputMatrix,
9 | clusterResults,
10 | minSeglen = 3,
11 | lossThreshold = 0.5,
12 | gainThreshold = 1.6,
13 | minCutoff = 50,
14 | rangeThreshold = 0.4
15 | )
16 | }
17 | \arguments{
18 | \item{inputMatrix}{Unprocessed and normalized input matrix}
19 |
20 | \item{clusterResults}{Result list of identifyNonNeoplastic}
21 |
22 | \item{minSeglen}{Minimum segment length for changepoint analysis}
23 |
24 | \item{lossThreshold}{fold change threshold to call something a relative loss (default 0.5)}
25 |
26 | \item{gainThreshold}{fold change threshold to call something a relative gain (default 1.6)}
27 |
28 | \item{minCutoff}{Number of altered cells in smallest group to keep a putative alteration}
29 |
30 | \item{rangeThreshold}{threshold filter between max and min fold change to keep an alteration (Default 0.4)}
31 | }
32 | \description{
33 | This function relies on pre-determined 'normal' cell set to compute smaller regions of altered accessibility
34 | }
35 | \keyword{CNV}
36 | \keyword{comparison}
37 |
--------------------------------------------------------------------------------
/man/getDoubleMinutes.Rd:
--------------------------------------------------------------------------------
1 | % Generated by roxygen2: do not edit by hand
2 | % Please edit documentation in R/cnv_caller_functions_packaged.R
3 | \name{getDoubleMinutes}
4 | \alias{getDoubleMinutes}
5 | \title{getDoubleMinutes}
6 | \usage{
7 | getDoubleMinutes(
8 | inputMatrix,
9 | targetCell,
10 | doPlot = FALSE,
11 | penalty_type = "SIC",
12 | doLosses = FALSE,
13 | peakCutoff = 5,
14 | lossCutoff = -1,
15 | minThreshold = 4
16 | )
17 | }
18 | \arguments{
19 | \item{minThreshold}{set threshold of Z score to run changepoint analysis; higher value = less sensitive but faster}
20 | }
21 | \description{
22 | This function allows you to express your love of cats.
23 | }
24 | \keyword{double}
25 | \keyword{minutes}
26 |
--------------------------------------------------------------------------------
/man/getLOHRegions.Rd:
--------------------------------------------------------------------------------
1 | % Generated by roxygen2: do not edit by hand
2 | % Please edit documentation in R/cnv_caller_functions_packaged.R
3 | \name{getLOHRegions}
4 | \alias{getLOHRegions}
5 | \title{getLOHRegions}
6 | \usage{
7 | getLOHRegions(
8 | inputMatrixIn,
9 | lossCutoff = (-0.25),
10 | uncertaintyCutLoss = 0.5,
11 | diffThreshold = 0.9,
12 | minLength = 3e+06,
13 | minSeg = 3,
14 | lossCutoffCells = 100,
15 | targetFun = IQR,
16 | quantileLimit = 0.3,
17 | cpgCutoff = 0,
18 | meanThreshold = 4,
19 | dummyQuantile = 0.5,
20 | dummyPercentile = 0.2,
21 | dummySd = 0.2
22 | )
23 | }
24 | \arguments{
25 | \item{lossCutoff}{- minimum Z score for losses (default is -0.25)}
26 |
27 | \item{uncertaintyCutLoss}{- maximum uncertainty to accept a cell assignment}
28 |
29 | \item{diffThreshold}{- difference threshold between bins}
30 |
31 | \item{minLength}{- minimum length of a LOH region}
32 |
33 | \item{minSeg}{- minimum number of bins for changepoint analysis}
34 |
35 | \item{lossCutoffCells}{- minimum number of cells to accept a LOH (default is 100)}
36 |
37 | \item{targetFun}{- target function to identify LOH regions}
38 |
39 | \item{quantileLimit}{quantile of signal per cell population to use to identify losses in changepoints (default is 0.3)}
40 |
41 | \item{inputMatrix}{- normalised input fragment count matrix}
42 |
43 | \item{signalBoost}{- value to add prior to logtransforming signal}
44 |
45 | \item{lossCutoffReads}{minimum number of cells showing alteration to keep in final list (filter)}
46 | }
47 | \description{
48 | Calls putative regions of LOH
49 | }
50 | \keyword{CNV}
51 | \keyword{LOH}
52 |
--------------------------------------------------------------------------------
/man/graphCNVDistribution.Rd:
--------------------------------------------------------------------------------
1 | % Generated by roxygen2: do not edit by hand
2 | % Please edit documentation in R/cnv_caller_functions_packaged.R
3 | \name{graphCNVDistribution}
4 | \alias{graphCNVDistribution}
5 | \title{graphCNVDistribution}
6 | \usage{
7 | graphCNVDistribution(inputMatrix, outputSuffix = "_all")
8 | }
9 | \arguments{
10 | \item{inputMatrix}{(the normalised matrix)}
11 |
12 | \item{outputSuffix}{suffix to append to pdf output file}
13 | }
14 | \description{
15 | Makes graph of normalised, collapsed fragment data
16 | }
17 | \examples{
18 | graphCNVDistribution(inputMatrix,outputSuffix="unfiltered")
19 | }
20 | \keyword{output}
21 |
--------------------------------------------------------------------------------
/man/identifyCNVClusters.Rd:
--------------------------------------------------------------------------------
1 | % Generated by roxygen2: do not edit by hand
2 | % Please edit documentation in R/cnv_caller_functions_packaged.R
3 | \name{identifyCNVClusters}
4 | \alias{identifyCNVClusters}
5 | \title{identifyCNVClusters}
6 | \usage{
7 | identifyCNVClusters(
8 | inputMatrix,
9 | median_iqr,
10 | useDummyCells = TRUE,
11 | propDummy = 0.25,
12 | deltaMean = 0.03,
13 | subsetSize = 500,
14 | fakeCellSD = 0.1,
15 | summaryFunction = cutAverage,
16 | minDiff = 0.25,
17 | deltaBIC2 = 0.25,
18 | bicMinimum = 0.1,
19 | minMix = 0.3,
20 | uncertaintyCutoff = 0.55,
21 | mergeCutoff = 3,
22 | summarySuffix = "",
23 | shrinky = 0,
24 | maxClust = 4,
25 | IQRCutoff = 0.25,
26 | medianQuantileCutoff = 0.3,
27 | normalCells = NULL
28 | )
29 | }
30 | \arguments{
31 | \item{inputMatrix}{input matrix after collapsing and filtering steps}
32 |
33 | \item{median_iqr}{matrix of medians and IQRs}
34 |
35 | \item{useDummyCells}{use pseudodiploid control}
36 |
37 | \item{propDummy}{pseudodiploid control as proportion of normal cells (0.25 = 25 percent)}
38 |
39 | \item{deltaMean}{minimum difference between clusters}
40 |
41 | \item{subsetSize}{subset of cells to use for initial computation (useful in large samples)}
42 |
43 | \item{fakeCellSD}{SD of dummy cells as proportion of range of normal cells (0.10 is default, 0.10-0.20 works best in most cases)}
44 |
45 | \item{summaryFunction}{summarising function for chromosome arms (default is trimmed average)}
46 | }
47 | \description{
48 | Uses Gaussian decomposition to analyse a filtered, normalised input matrix and call putative CNVs
49 | }
50 |
--------------------------------------------------------------------------------
/man/identifyDoubleMinutes.Rd:
--------------------------------------------------------------------------------
1 | % Generated by roxygen2: do not edit by hand
2 | % Please edit documentation in R/cnv_caller_functions_packaged.R
3 | \name{identifyDoubleMinutes}
4 | \alias{identifyDoubleMinutes}
5 | \title{identifyDoubleMinutes}
6 | \usage{
7 | identifyDoubleMinutes(
8 | inputMatrix,
9 | minCells = 100,
10 | qualityCutoff2 = 100,
11 | peakCutoff = 5,
12 | lossCutoff = -1,
13 | doPlots = FALSE,
14 | imageNumber = 1000,
15 | logTrans = FALSE,
16 | cpgTransform = FALSE,
17 | doLosses = FALSE,
18 | minThreshold = 4
19 | )
20 | }
21 | \arguments{
22 | \item{inputMatrix}{normalized input matrix}
23 |
24 | \item{minCells}{minimum cells to retain a DM}
25 |
26 | \item{qualityCutoff2}{minimum cells to retain DM (filter 2)}
27 |
28 | \item{peakCutoff}{Z score minimum to retain a putative DM/amplification}
29 |
30 | \item{doPlots}{Plot occasional cells as QC}
31 |
32 | \item{imageNumber}{Plot every Nth cell (use in conjunction with doPlots = TRUE)}
33 |
34 | \item{minThreshold}{Z-score maximum to continue processing cells (can save time in larger datasets; default 4)}
35 | }
36 | \description{
37 | Identify double minutes on all chromosomes using changepoint analysis
38 | }
39 | \keyword{amplification}
40 | \keyword{double}
41 | \keyword{ecDNA}
42 | \keyword{minutes}
43 |
--------------------------------------------------------------------------------
/man/identifyNonNeoplastic.Rd:
--------------------------------------------------------------------------------
1 | % Generated by roxygen2: do not edit by hand
2 | % Please edit documentation in R/cnv_caller_functions_packaged.R
3 | \name{identifyNonNeoplastic}
4 | \alias{identifyNonNeoplastic}
5 | \title{identifyNonNeoplastic
6 | Detect neoplastic vs neoplastic cells using unsupervised clustering
7 | Returns list of barcodes and cluster assignments, and list of non-neoplastic cells}
8 | \usage{
9 | identifyNonNeoplastic(
10 | inputMatrix,
11 | estimatedCellularity = 0.8,
12 | nmfComponents = 5,
13 | outputHeatmap = TRUE,
14 | cutHeight = 0.6,
15 | methodHclust = "ward.D"
16 | )
17 | }
18 | \arguments{
19 | \item{inputMatrix}{Matrix (after filterCells is called)}
20 |
21 | \item{estimatedCellularity}{Expected cellularity of tumour (default 0.8)}
22 |
23 | \item{nmfComponents}{# of components to use for NMF/SVD}
24 |
25 | \item{outputHeatmap}{Output a heatmap of the clustering (default is yes)}
26 |
27 | \item{cutHeight}{Cutting height as percent of max for dendrogram}
28 |
29 | \item{methodHclust}{Method for clustering (default is Ward.D)}
30 | }
31 | \description{
32 | identifyNonNeoplastic
33 | Detect neoplastic vs neoplastic cells using unsupervised clustering
34 | Returns list of barcodes and cluster assignments, and list of non-neoplastic cells
35 | }
36 | \keyword{CNV}
37 | \keyword{clustering}
38 |
--------------------------------------------------------------------------------
/man/initialiseEnvironment.Rd:
--------------------------------------------------------------------------------
1 | % Generated by roxygen2: do not edit by hand
2 | % Please edit documentation in R/cnv_caller_functions_packaged.R
3 | \name{initialiseEnvironment}
4 | \alias{initialiseEnvironment}
5 | \title{initialiseEnvironment}
6 | \usage{
7 | initialiseEnvironment(
8 | genomeFile,
9 | cytobandFile,
10 | cpgFile,
11 | binSize = 1e+06,
12 | minFrags = 10000,
13 | cellSuffix = c("-1"),
14 | lowerTrim = 0.5,
15 | upperTrim = 0.8
16 | )
17 | }
18 | \arguments{
19 | \item{genomeFile}{Chromosome size file for genome of interest}
20 |
21 | \item{cytobandFile}{Processed cytoband file}
22 |
23 | \item{cpgFile}{Processed CpG island file}
24 |
25 | \item{binSize}{Size of chromosome bins (defaults to 1e6)}
26 |
27 | \item{minFrags}{Minimum # of fragments per cell (default 1e4)}
28 |
29 | \item{cellSuffix}{Suffix appended to cells}
30 |
31 | \item{lowerTrim}{Lower quantile trim for trimmed mean (default 0.5)}
32 |
33 | \item{upperTrim}{Upper quantile trim for trimmed mean (default 0.8)}
34 | }
35 | \description{
36 | This function prepares and preloads the genome data required for CNV analysis.
37 | }
38 | \keyword{configuration}
39 |
--------------------------------------------------------------------------------
/man/initializeStandards.Rd:
--------------------------------------------------------------------------------
1 | % Generated by roxygen2: do not edit by hand
2 | % Please edit documentation in R/cnv_caller_functions_packaged.R
3 | \name{initializeStandards}
4 | \alias{initializeStandards}
5 | \title{initializeStandards}
6 | \usage{
7 | initializeStandards(chromSizeFile, cpgDataFile, cytobandFile)
8 | }
9 | \arguments{
10 | \item{chromSizeFile}{- a tsv chrom sizes file}
11 |
12 | \item{cpgDataFile}{- a binned cpg density file (see documentation for how to prepare}
13 |
14 | \item{cytobandFile}{- a binned cytoband file for your genome of interest (see documentation for how to prepare)}
15 | }
16 | \description{
17 | This function prepares and preloads the genome data required for CNV analysis.
18 | }
19 | \examples{
20 | initializeStandards("hg38.chrom.sizes","hg38.cpg.1e6.bed","hg38.cytoband.1e6.bed"
21 | }
22 | \keyword{initialisation}
23 |
--------------------------------------------------------------------------------
/man/makeFakeCells.Rd:
--------------------------------------------------------------------------------
1 | % Generated by roxygen2: do not edit by hand
2 | % Please edit documentation in R/cnv_caller_functions_packaged.R
3 | \name{makeFakeCells}
4 | \alias{makeFakeCells}
5 | \title{makeFakeCells}
6 | \usage{
7 | makeFakeCells(x, num = 300, sd_fact = 0.1)
8 | }
9 | \arguments{
10 | \item{x}{(mean of values)}
11 |
12 | \item{num}{(number of cells)}
13 |
14 | \item{sd_fact}{(scaling factor for cell SD)}
15 | }
16 | \description{
17 | simulate a pseudodiploid control
18 | }
19 |
--------------------------------------------------------------------------------
/man/normalizeMatrixN.Rd:
--------------------------------------------------------------------------------
1 | % Generated by roxygen2: do not edit by hand
2 | % Please edit documentation in R/cnv_caller_functions_packaged.R
3 | \name{normalizeMatrixN}
4 | \alias{normalizeMatrixN}
5 | \title{normalizeMatrixN}
6 | \usage{
7 | normalizeMatrixN(
8 | inputMatrix,
9 | logNorm = FALSE,
10 | maxZero = 2000,
11 | imputeZeros = FALSE,
12 | blacklistProp = 0.8,
13 | priorCount = 1,
14 | blacklistCutoff = 100,
15 | dividingFactor = 1e+06,
16 | upperFilterQuantile = 0.95
17 | )
18 | }
19 | \arguments{
20 | \item{inputMatrix}{- processed fragment table from your input}
21 |
22 | \item{logNorm}{- whether to log normalize input file. default: FALSE}
23 |
24 | \item{maxZero}{- maximum # of zeros per cell after removal of uninformative regions}
25 |
26 | \item{imputeZeros}{- default to FALSE; will impute cells with medians - don't use it}
27 |
28 | \item{blacklistProp}{- proportion of cells that have zeros in an interval to consider that interval blacklisted/uninformative - lower = more stringency}
29 |
30 | \item{priorCount}{- use if log normalizing data - priorCount to add to fields before normalisation}
31 |
32 | \item{blacklistCutoff}{- minimum signal in a bin to count it as "empty" for the blacklist cutoff}
33 |
34 | \item{dividingFactor}{- deprecated}
35 |
36 | \item{upperFilterQuantile}{- exclude cells with reads above certain percentile (to avoid doublets)}
37 | }
38 | \description{
39 | This function normalizes the input matrix. Do this first.
40 | }
41 |
--------------------------------------------------------------------------------
/man/readInputTable.Rd:
--------------------------------------------------------------------------------
1 | % Generated by roxygen2: do not edit by hand
2 | % Please edit documentation in R/cnv_caller_functions_packaged.R
3 | \name{readInputTable}
4 | \alias{readInputTable}
5 | \title{readInputTable}
6 | \usage{
7 | readInputTable(inputFile, sep = "\\t")
8 |
9 | readInputTable(inputFile, sep = "\\t")
10 | }
11 | \arguments{
12 | \item{inputFile}{input count fragment matrix}
13 |
14 | \item{sep}{separator (defaults to tab)}
15 | }
16 | \description{
17 | This function prepares and preloads the genome data required for CNV analysis.
18 | }
19 | \keyword{CNV}
20 | \keyword{files}
21 | \keyword{import}
22 | \keyword{initialisation}
23 | \keyword{loading}
24 |
--------------------------------------------------------------------------------
/man/saveSummaryStats.Rd:
--------------------------------------------------------------------------------
1 | % Generated by roxygen2: do not edit by hand
2 | % Please edit documentation in R/cnv_caller_functions_packaged.R
3 | \name{saveSummaryStats}
4 | \alias{saveSummaryStats}
5 | \title{saveSummaryStats}
6 | \usage{
7 | saveSummaryStats(outputSuffix = "_stats")
8 | }
9 | \arguments{
10 | \item{outputSuffix}{suffix to append to output file names. defaults to _stats}
11 | }
12 | \description{
13 | saves summary statistics about loaded files
14 | }
15 | \keyword{summary}
16 |
--------------------------------------------------------------------------------
/man/scDataSamp.Rd:
--------------------------------------------------------------------------------
1 | % Generated by roxygen2: do not edit by hand
2 | % Please edit documentation in R/data.R
3 | \docType{data}
4 | \name{scDataSamp}
5 | \alias{scDataSamp}
6 | \title{Sample processed matrix for testing}
7 | \format{
8 | data.frame with 3103 columns and 1371 rows
9 | }
10 | \source{
11 | 1371 adult GBM cells
12 | }
13 | \usage{
14 | scDataSamp
15 | }
16 | \description{
17 | Sample processed matrix for testing
18 | }
19 | \keyword{datasets}
20 |
--------------------------------------------------------------------------------
/man/scDataSampClusters.Rd:
--------------------------------------------------------------------------------
1 | % Generated by roxygen2: do not edit by hand
2 | % Please edit documentation in R/data.R
3 | \docType{data}
4 | \name{scDataSampClusters}
5 | \alias{scDataSampClusters}
6 | \title{Sample processed cluster data frame for testing}
7 | \format{
8 | data.frame
9 | }
10 | \source{
11 | adult GBM cells
12 | }
13 | \usage{
14 | scDataSampClusters
15 | }
16 | \description{
17 | Sample processed cluster data frame for testing
18 | }
19 | \keyword{datasets}
20 |
--------------------------------------------------------------------------------
/man/scaleMatrix.Rd:
--------------------------------------------------------------------------------
1 | % Generated by roxygen2: do not edit by hand
2 | % Please edit documentation in R/cnv_caller_functions_packaged.R
3 | \name{scaleMatrix}
4 | \alias{scaleMatrix}
5 | \title{scaleMatrix}
6 | \usage{
7 | scaleMatrix(inputMatrix, median_iqr_list, spread = FALSE)
8 | }
9 | \arguments{
10 | \item{inputMatrix}{normalised, filtered matrix}
11 |
12 | \item{median_iqr_list}{list containing summary lists with median/trimmed mean and IQR (computed by computeCenters)}
13 |
14 | \item{spread}{return the list in Tidyverse "spread" format - for plotting}
15 | }
16 | \description{
17 | Scales the normalised, filtered input matrix based on provided median and IQR data
18 | }
19 | \examples{
20 | scaleMatrix(inputMatrix,medianIQR)
21 | }
22 | \keyword{CNV}
23 | \keyword{scale}
24 |
--------------------------------------------------------------------------------
/man/scaleMatrixBins.Rd:
--------------------------------------------------------------------------------
1 | % Generated by roxygen2: do not edit by hand
2 | % Please edit documentation in R/cnv_caller_functions_packaged.R
3 | \name{scaleMatrixBins}
4 | \alias{scaleMatrixBins}
5 | \title{Scale matrix bins}
6 | \usage{
7 | scaleMatrixBins(inputMatrix, binSizeRatio, inColumn)
8 | }
9 | \arguments{
10 | \item{inputMatrix}{matrix of input stuff}
11 |
12 | \item{binSizeRatio}{ratio to expand by (2 = double bin size)}
13 |
14 | \item{inColumn}{input column}
15 | }
16 | \description{
17 | Merges together adjacent windows
18 | }
19 |
--------------------------------------------------------------------------------
/man/setOutputFile.Rd:
--------------------------------------------------------------------------------
1 | % Generated by roxygen2: do not edit by hand
2 | % Please edit documentation in R/cnv_caller_functions_packaged.R
3 | \name{setOutputFile}
4 | \alias{setOutputFile}
5 | \title{setOutputFile}
6 | \usage{
7 | setOutputFile(outputDir, outputFileSuffix)
8 | }
9 | \arguments{
10 | \item{outputDir}{Output directory}
11 |
12 | \item{outputFileSuffix}{Suffix to add to output files}
13 | }
14 | \description{
15 | This function prepares and preloads the genome data required for CNV analysis.
16 | }
17 | \keyword{configuration}
18 |
--------------------------------------------------------------------------------
/man/smoothClusters.Rd:
--------------------------------------------------------------------------------
1 | % Generated by roxygen2: do not edit by hand
2 | % Please edit documentation in R/cnv_caller_functions_packaged.R
3 | \name{smoothClusters}
4 | \alias{smoothClusters}
5 | \title{smoothClusters
6 | Read clusters from file and CNV calls from input or an external file
7 | Note: assumes files are comma delimited
8 | Returns a smoothed matrix}
9 | \usage{
10 | smoothClusters(
11 | inputClusters,
12 | inputCNVList,
13 | inputCNVClusterFile = "",
14 | percentPositive = 0.5,
15 | removeEmpty = TRUE
16 | )
17 | }
18 | \arguments{
19 | \item{inputClusters}{input cluster matrix}
20 |
21 | \item{inputCNVList}{list of CNVs with copy number estimates (2 as normal)}
22 |
23 | \item{inputCNVClusterFile}{alternate option to specify external comma delimited file for CNV calls}
24 |
25 | \item{percentPositive}{minimum percentage of a cluster to use to call positive for CNV, default is 0.5 (50 percent)}
26 | }
27 | \description{
28 | smoothClusters
29 | Read clusters from file and CNV calls from input or an external file
30 | Note: assumes files are comma delimited
31 | Returns a smoothed matrix
32 | }
33 | \keyword{CNV}
34 | \keyword{clusters}
35 |
--------------------------------------------------------------------------------
/man/testOverlap.Rd:
--------------------------------------------------------------------------------
1 | % Generated by roxygen2: do not edit by hand
2 | % Please edit documentation in R/cnv_caller_functions_packaged.R
3 | \name{testOverlap}
4 | \alias{testOverlap}
5 | \title{Test overlap}
6 | \usage{
7 | testOverlap(interval.1, interval.2)
8 | }
9 | \arguments{
10 | \item{interval.1}{(text interval)}
11 |
12 | \item{interval.2}{(text interval)}
13 | }
14 | \description{
15 | Tests overlap between two intervals
16 | Internal use
17 | }
18 |
--------------------------------------------------------------------------------
/process_fragment_file.py:
--------------------------------------------------------------------------------
1 | #!/usr/bin/env python
2 | # coding: utf-8
3 |
4 | #initialize module
5 | import sys, getopt
6 | import math
7 | import numpy as np
8 | import gzip
9 |
10 | #initialize variables
11 | #matrix of cells x regions
12 | cell_ids = {}
13 | #dictionary of cell barcodes with total counts per chr
14 | cell_counts = {}
15 | chrom_step = 1000000
16 | chrom_max = 0
17 | file_init = ''
18 | line1 = ''
19 | min_filter = 10000
20 | output_file = ''
21 | #chrom sizes file
22 | chrom_sizefile = ''
23 | #initialization
24 | try:
25 | opts, args = getopt.getopt(sys.argv[1:],"hi:o:b:f:g:",["help","ifile=","ofile=","binsize=","frags=","genome="])
26 | #opts, args = getopt.getopt(sys.argv[1:],"h",["help"])
27 | print("process_fragment_file",len(opts))
28 | except getopt.GetoptError as err:
29 | print('process_fragment_file.py -i -o -b -f -g ')
30 | print(str(err),"process_fragment_file")
31 | sys.exit(2)
32 | for opt, arg in opts:
33 | print("process_fragment_file",opt)
34 | if opt in ("-h","help"):
35 | print('process_fragment_file.py -i -o -b -f -g ')
36 | sys.exit()
37 | elif opt in ("-i", "--ifile"):
38 | file_init = arg
39 | elif opt in ("-o", "--ofile"):
40 | output_file = arg
41 | elif opt in ("-b", "--binsize"):
42 | chrom_step = int(arg)
43 | elif opt in ("-f", "--frags"):
44 | min_filter = int(arg)
45 | elif opt in ("-g", "--genome"):
46 | chrom_sizefile = arg
47 |
48 | if len(opts)<5:
49 | print('process_fragment_file.py -i -o -b -f -g ')
50 | sys.exit(2)
51 |
52 | #load sizes
53 | chrom_sizes = {}
54 | def init_chrom_sizes():
55 | chrom_size = {}
56 | with open(chrom_sizefile) as reader:
57 | line1 = reader.readline().rstrip()
58 | while line1 != '':
59 | line_split = line1.split('\t')
60 | chrom_size[line_split[0]]=line_split[1]
61 | line1 = reader.readline().rstrip()
62 | return chrom_size
63 |
64 | chrom_sizes = init_chrom_sizes()
65 | print(chrom_sizes)
66 | print("Initializing chromosomes")
67 | #initialize chromosome bins
68 | def init_chrom_list_all():
69 | chrom_min = 0
70 | chrom_total_list = {}
71 | for chrom in chrom_sizes:
72 | #chrom_list_temp = {}
73 | chrom_max1 = int(chrom_sizes[chrom])
74 | chrom_list_temp = np.zeros(int(chrom_max1 / chrom_step)+1)
75 | # chrom_list_temp[i*chrom_step] = 0
76 | chrom_total_list[chrom] = chrom_list_temp
77 | return chrom_total_list
78 |
79 | blank_list_all = init_chrom_list_all()
80 |
81 |
82 | print("Reading file")
83 | #read file
84 | lines_read = 0
85 | with gzip.open(file_init,'rt') as reader:
86 | for line1 in reader:
87 | #print(line1 + " " + str(len(cell_ids)))
88 | #remove header from new version of cellranger-atac
89 | if (line1.find('#')!=-1):
90 | print("commented header line detected...skipping")
91 | continue
92 | line_split = line1.split('\t')
93 | readLength=int(line_split[2])-int(line_split[1])-1
94 | #test if chromosome is in the list
95 | if (line_split[0] in chrom_sizes.keys()):
96 | #print(line_split[0] + "\n")
97 | if (line_split[3] in cell_ids):
98 | setIndex = int(math.floor(int(line_split[1]) / chrom_step))
99 | cell_ids[line_split[3]][line_split[0]][setIndex] += readLength
100 | cell_counts[line_split[3]] += 1
101 | else:
102 | cell_ids[line_split[3]]=init_chrom_list_all()
103 | setIndex = int(math.floor(int(line_split[1]) / chrom_step))
104 | cell_ids[line_split[3]][line_split[0]][setIndex] += readLength
105 | cell_counts[line_split[3]]=1
106 | else:
107 | #abnormal chromosome - will not include in final results
108 | print("warning: chromosome " + line_split[0] + " found in fragment file but not in chromosome file - skipping fragment")
109 | lines_read+=1
110 | if lines_read%100000==0:
111 | print("Reading line " + str(lines_read) + "\n")
112 | print("File loaded into memory")
113 |
114 |
115 | #how many pass filter
116 | filter_passing = 0
117 |
118 | #minimum number of fragments per barcode - quality filter
119 |
120 | print("Writing output")
121 | with open(output_file,'w') as writer:
122 | #initialize header
123 | writer.write("Cell_id")
124 | for chrom in chrom_sizes:
125 | for i in range(0,len(blank_list_all[chrom])):
126 | writer.write("\t" + chrom + "_" + str(i*chrom_step))
127 | writer.write("\n")
128 | for cell in cell_ids:
129 | if (cell_counts[cell] > min_filter):
130 | chr_list = cell_ids[cell]
131 | filter_passing += 1
132 | writer.write(cell)
133 | for chrom in chrom_sizes:
134 | writer.write('\t')
135 | writer.write('\t'.join(map(str, chr_list[chrom])))
136 |
137 | writer.write("\n")
138 |
139 | print("Done writing output")
140 |
141 |
142 |
--------------------------------------------------------------------------------
/scDataSampClusters.Rdata:
--------------------------------------------------------------------------------
https://raw.githubusercontent.com/spcdot/CopyscAT/e785ed313cdcb64cf2f153c9e6cddf7f8351829d/scDataSampClusters.Rdata
--------------------------------------------------------------------------------