load_microbesonline_annotations(species="CJB111") cjb_microbes <-
## Found 1 entry.
## Streptococcus agalactiae CJB111Firmicutesyes2007-05-08noNANA2208342617
## The species being downloaded is: Streptococcus agalactiae CJB111
## Downloading: http://www.microbesonline.org/cgi-bin/genomeInfo.cgi?tId=342617;export=tab
load_gff_annotations("~/scratch/libraries/genome/sagalactiae_cjb111.gff") cjb_gff <-
## Trying attempt: rtracklayer::import.gff3(gff, sequenceRegionsAsSeqinfo=TRUE)
## Had a successful gff import with rtracklayer::import.gff3(gff, sequenceRegionsAsSeqinfo=TRUE)
## Returning a df with 42 columns and 4347 rows.
as.data.frame(cjb_microbes)
cjb_microbes <-rownames(cjb_gff) <- make.names(cjb_gff[["locus_tag"]], unique=TRUE)
## I am going to only pay attention to the first annotation for each locus tag from microbesonline.
"sysName"]] <- make.names(cjb_microbes[["sysName"]], unique=TRUE)
cjb_microbes[[## I should ask Lindsey if they would like me to merge these
cjb_gff
cjb_annot <-## cjb_annot <- merge(cjb_gff, cjb_microbes, by.x="old_locus_tag", by.y="sysName")
## rownames(cjb_annot) <- make.names(cjb_annot[["locus_tag"]], unique=TRUE)
The following block merges the various counts, annotations, and experimental metadata.
Just as with the annotations, I will create one expressionset for each strain.
create_expt(metadata="sample_sheets/all_samples_cjb111.xlsx",
cjb_expt <-gene_info=cjb_annot, file_column="btv1m1sagalactiaecjb111")
## Reading the sample metadata.
## The sample definitions comprises: 16 rows(samples) and 18 columns(metadata fields).
## Reading count tables.
## Reading count files with read.table().
## /mnt/sshfs/cbcbsub01/fs/cbcb-lab/nelsayed/scratch/atb/tnseq/sagalacticae_2020/preprocessing/cx1/outputs/bowtie_sagalactiae_cjb111/consolidated_v2-v1M1.count_sagalactiae_cjb111_sno_gene_Name.count.xz contains 2042 rows.
## preprocessing/cx2/outputs/bowtie_sagalactiae_cjb111/consolidated_v2-v1M1.count_sagalactiae_cjb111_sno_gene_Name.count.xz contains 2042 rows and merges to 2042 rows.
## preprocessing/cx3/outputs/bowtie_sagalactiae_cjb111/consolidated_v2-v1M1.count_sagalactiae_cjb111_sno_gene_Name.count.xz contains 2042 rows and merges to 2042 rows.
## preprocessing/d1s1/outputs/bowtie_sagalactiae_cjb111/consolidated_v2-v1M1.count_sagalactiae_cjb111_sno_gene_Name.count.xz contains 2042 rows and merges to 2042 rows.
## preprocessing/d1s2/outputs/bowtie_sagalactiae_cjb111/consolidated_v2-v1M1.count_sagalactiae_cjb111_sno_gene_Name.count.xz contains 2042 rows and merges to 2042 rows.
## preprocessing/d1s3/outputs/bowtie_sagalactiae_cjb111/consolidated_v2-v1M1.count_sagalactiae_cjb111_sno_gene_Name.count.xz contains 2042 rows and merges to 2042 rows.
## preprocessing/d3s1/outputs/bowtie_sagalactiae_cjb111/consolidated_v2-v1M1.count_sagalactiae_cjb111_sno_gene_Name.count.xz contains 2042 rows and merges to 2042 rows.
## preprocessing/d3s3/outputs/bowtie_sagalactiae_cjb111/consolidated_v2-v1M1.count_sagalactiae_cjb111_sno_gene_Name.count.xz contains 2042 rows and merges to 2042 rows.
## preprocessing/tn1/outputs/bowtie_sagalactiae_cjb111/consolidated_v2-v1M1.count_sagalactiae_cjb111_sno_gene_Name.count.xz contains 2042 rows and merges to 2042 rows.
## preprocessing/tn2/outputs/bowtie_sagalactiae_cjb111/consolidated_v2-v1M1.count_sagalactiae_cjb111_sno_gene_Name.count.xz contains 2042 rows and merges to 2042 rows.
## preprocessing/tn3/outputs/bowtie_sagalactiae_cjb111/consolidated_v2-v1M1.count_sagalactiae_cjb111_sno_gene_Name.count.xz contains 2042 rows and merges to 2042 rows.
## preprocessing/ut1/outputs/bowtie_sagalactiae_cjb111/consolidated_v2-v1M1.count_sagalactiae_cjb111_sno_gene_Name.count.xz contains 2042 rows and merges to 2042 rows.
## preprocessing/ut2/outputs/bowtie_sagalactiae_cjb111/consolidated_v2-v1M1.count_sagalactiae_cjb111_sno_gene_Name.count.xz contains 2042 rows and merges to 2042 rows.
## preprocessing/vg1/outputs/bowtie_sagalactiae_cjb111/consolidated_v2-v1M1.count_sagalactiae_cjb111_sno_gene_Name.count.xz contains 2042 rows and merges to 2042 rows.
## preprocessing/vg2/outputs/bowtie_sagalactiae_cjb111/consolidated_v2-v1M1.count_sagalactiae_cjb111_sno_gene_Name.count.xz contains 2042 rows and merges to 2042 rows.
## preprocessing/vg3/outputs/bowtie_sagalactiae_cjb111/consolidated_v2-v1M1.count_sagalactiae_cjb111_sno_gene_Name.count.xz contains 2042 rows and merges to 2042 rows.
## Finished reading count data.
## Matched 1610 annotations and counts.
## Bringing together the count matrix and gene information.
## Some annotations were lost in merging, setting them to 'undefined'.
## Saving the expressionset to 'expt.rda'.
## The final expressionset has 2037 rows and 16 columns.
write_expt(cjb_expt, batch="raw",
cjb_written <-excel=glue::glue("excel/{rundate}-cjb_counts-v{ver}.xlsx"))
## Writing the first sheet, containing a legend and some summary data.
## Writing the raw reads.
## Graphing the raw reads.
## `geom_smooth()` using formula 'y ~ x'
## `geom_smooth()` using formula 'y ~ x'
## Warning in doTryCatch(return(expr), name, parentenv, handler): display list
## redraw incomplete
## Warning: ggrepel: 12 unlabeled data points (too many overlaps). Consider
## increasing max.overlaps
## Warning: ggrepel: 14 unlabeled data points (too many overlaps). Consider
## increasing max.overlaps
## Warning in doTryCatch(return(expr), name, parentenv, handler): display list
## redraw incomplete
## Warning: ggrepel: 1 unlabeled data points (too many overlaps). Consider
## increasing max.overlaps
## Attempting mixed linear model with: ~ condition + batch
## Fitting the expressionset to the model, this is slow.
## Loading required package: Matrix
##
## Total:11 s
## Placing factor: condition at the beginning of the model.
## Writing the normalized reads.
## Graphing the normalized reads.
## Warning: ggrepel: 2 unlabeled data points (too many overlaps). Consider
## increasing max.overlaps
## `geom_smooth()` using formula 'y ~ x'
## `geom_smooth()` using formula 'y ~ x'
## Warning in doTryCatch(return(expr), name, parentenv, handler): display list
## redraw incomplete
## Warning in doTryCatch(return(expr), name, parentenv, handler): display list
## redraw incomplete
## Warning: ggrepel: 1 unlabeled data points (too many overlaps). Consider
## increasing max.overlaps
## Attempting mixed linear model with: ~ condition + batch
## Fitting the expressionset to the model, this is slow.
##
## Total:11 s
## Placing factor: condition at the beginning of the model.
## Writing the median reads by factor.
"legend_plot"]] cjb_written[[
"raw_libsize"]] cjb_written[[
"raw_density"]] cjb_written[[
## awesome
"norm_disheat"]] cjb_written[[
"norm_corheat"]] cjb_written[[
plot_topn(cjb_expt, num=40)$plot
## `geom_smooth()` using formula 'y ~ x'
normalize_expt(cjb_expt, filter=TRUE, norm="quant", convert="cpm", transform="log2") cjb_n <-
## This function will replace the expt$expressionset slot with:
## log2(cpm(quant(cbcb(data))))
## It will save copies of each step along the way
## in expt$normalized with the corresponding libsizes. Keep libsizes in mind
## when invoking limma. The appropriate libsize is non-log(cpm(normalized)).
## This is most likely kept at:
## 'new_expt$normalized$intermediate_counts$normalization$libsizes'
## A copy of this may also be found at:
## new_expt$best_libsize
## Not correcting the count-data for batch effects. If batch is
## included in EdgerR/limma's model, then this is probably wise; but in extreme
## batch effects this is a good parameter to play with.
## Step 1: performing count filter with option: cbcb
## Removing 170 low-count genes (1867 remaining).
## Step 2: normalizing the data with quant.
## Step 3: converting the data with cpm.
## The method is: raw.
## Step 4: not doing batch correction.
## Step 4: transforming the data with log2.
## transform_counts: Found 2 values equal to 0, adding 1 to the matrix.
plot_pca(cjb_n)$plot
normalize_expt(cjb_expt, filter=TRUE, norm="quant",
cjb_nb <-transform="log2", batch="limma")
## This function will replace the expt$expressionset slot with:
## log2(limma(quant(cbcb(data))))
## It will save copies of each step along the way
## in expt$normalized with the corresponding libsizes. Keep libsizes in mind
## when invoking limma. The appropriate libsize is non-log(cpm(normalized)).
## This is most likely kept at:
## 'new_expt$normalized$intermediate_counts$normalization$libsizes'
## A copy of this may also be found at:
## new_expt$best_libsize
## Leaving the data unconverted. It is often advisable to cpm/rpkm
## the data to normalize for sampling differences, keep in mind though that rpkm
## has some annoying biases, and voom() by default does a cpm (though hpgl_voom()
## will try to detect this).
## Step 1: performing count filter with option: cbcb
## Removing 170 low-count genes (1867 remaining).
## Step 2: normalizing the data with quant.
## Step 3: not converting the data.
## The method is: limma.
## Step 4: doing batch correction with limma.
## Using the current state of normalization.
## Passing the data to all_adjusters using the limma estimate type.
## batch_counts: Before batch/surrogate estimation, 29850 entries are x>1: 100%.
## batch_counts: Before batch/surrogate estimation, 2 entries are x==0: 0%.
## batch_counts: Before batch/surrogate estimation, 20 entries are 0<x<1: 0%.
## The be method chose 2 surrogate variables.
## batch_counts: Using limma's removeBatchEffect to remove batch effect.
## If you receive a warning: 'NANs produced', one potential reason is that the data was quantile normalized.
## There are 1 (0%) elements which are < 0 after batch correction.
## Setting low elements to zero.
## Step 4: transforming the data with log2.
## transform_counts: Found 1 values equal to 0, adding 1 to the matrix.
plot_pca(cjb_nb)$plot
all_pairwise(cjb_expt, filter=TRUE, batch="svaseq") tn_de <-
## Plotting a PCA before surrogate/batch inclusion.
## Not putting labels on the PC plot.
## Using limma's removeBatchEffect to visualize with(out) batch inclusion.
## Not putting labels on the PC plot.
## Finished running DE analyses, collecting outputs.
## Comparing analyses.
list(
keepers <-"ut" = c("ut", "tn"),
"d1" = c("d1", "tn"),
"d3" = c("d3", "tn"),
"cx" = c("cx", "tn"),
"vg" = c("vg", "tn"))
combine_de_tables(tn_de, keepers=keepers,
tn_tables <-excel=glue::glue("excel/vivo_fitness-v{ver}.xlsx"))
## Deleting the file excel/vivo_fitness-v202011.xlsx before writing the tables.
## Writing a legend of columns.
## Printing a pca plot before/after surrogates/batch estimation.
## Working on 1/5: ut which is: ut/tn.
## Found table with ut_vs_tn
## The ebseq table is null.
## Only 1 bin; IHW reduces to Benjamini Hochberg (uniform weights)
## Only 1 bin; IHW reduces to Benjamini Hochberg (uniform weights)
## Only 1 bin; IHW reduces to Benjamini Hochberg (uniform weights)
## Only 1 bin; IHW reduces to Benjamini Hochberg (uniform weights)
## Working on 2/5: d1 which is: d1/tn.
## Found inverse table with tn_vs_d1
## The ebseq table is null.
## Only 1 bin; IHW reduces to Benjamini Hochberg (uniform weights)
## Only 1 bin; IHW reduces to Benjamini Hochberg (uniform weights)
## Only 1 bin; IHW reduces to Benjamini Hochberg (uniform weights)
## Only 1 bin; IHW reduces to Benjamini Hochberg (uniform weights)
## Working on 3/5: d3 which is: d3/tn.
## Found inverse table with tn_vs_d3
## The ebseq table is null.
## Only 1 bin; IHW reduces to Benjamini Hochberg (uniform weights)
## Only 1 bin; IHW reduces to Benjamini Hochberg (uniform weights)
## Only 1 bin; IHW reduces to Benjamini Hochberg (uniform weights)
## Only 1 bin; IHW reduces to Benjamini Hochberg (uniform weights)
## Working on 4/5: cx which is: cx/tn.
## Found inverse table with tn_vs_cx
## The ebseq table is null.
## Only 1 bin; IHW reduces to Benjamini Hochberg (uniform weights)
## Only 1 bin; IHW reduces to Benjamini Hochberg (uniform weights)
## Only 1 bin; IHW reduces to Benjamini Hochberg (uniform weights)
## Only 1 bin; IHW reduces to Benjamini Hochberg (uniform weights)
## Working on 5/5: vg which is: vg/tn.
## Found table with vg_vs_tn
## The ebseq table is null.
## Only 1 bin; IHW reduces to Benjamini Hochberg (uniform weights)
## Only 1 bin; IHW reduces to Benjamini Hochberg (uniform weights)
## Only 1 bin; IHW reduces to Benjamini Hochberg (uniform weights)
## Only 1 bin; IHW reduces to Benjamini Hochberg (uniform weights)
## Adding venn plots for ut.
## Limma expression coefficients for ut; R^2: 0.429; equation: y = 0.781x + 0.589
## Deseq expression coefficients for ut; R^2: 0.521; equation: y = 0.406x + 6.16
## Edger expression coefficients for ut; R^2: 0.491; equation: y = 0.406x + 12.1
## Adding venn plots for d1.
## Limma expression coefficients for d1; R^2: 0.834; equation: y = 0.864x + 0.493
## Deseq expression coefficients for d1; R^2: 0.754; equation: y = 1.24x - 3.23
## Edger expression coefficients for d1; R^2: 0.752; equation: y = 1.19x - 2.95
## Adding venn plots for d3.
## Limma expression coefficients for d3; R^2: 0.715; equation: y = 0.789x + 0.71
## Deseq expression coefficients for d3; R^2: 0.696; equation: y = 1.33x - 5.67
## Edger expression coefficients for d3; R^2: 0.679; equation: y = 1.22x - 4.83
## Adding venn plots for cx.
## Limma expression coefficients for cx; R^2: 0.624; equation: y = 0.71x + 0.853
## Deseq expression coefficients for cx; R^2: 0.617; equation: y = 1.33x - 5.8
## Edger expression coefficients for cx; R^2: 0.586; equation: y = 1.25x - 6.27
## Adding venn plots for vg.
## Limma expression coefficients for vg; R^2: 0.626; equation: y = 0.962x - 0.00323
## Deseq expression coefficients for vg; R^2: 0.588; equation: y = 0.431x + 6.44
## Edger expression coefficients for vg; R^2: 0.567; equation: y = 0.432x + 9.18
## Writing summary information, compare_plot is: TRUE.
## Performing save of excel/vivo_fitness-v202011.xlsx.
I moved this above the differential “expression”/“fitness” analysis so that we can add the results from it as annotation data to the DE tables if requested.
tnseq_saturation(
saturation_a909_cx1 <-"preprocessing/d1s3/outputs/essentiality_sagalactiae_a909/r2_ca_v3-v1M1.wig")
$plot saturation_d1s3
## Error in eval(expr, envir, enclos): object 'saturation_d1s3' not found
$hits_summary saturation_d1s3
## Error in eval(expr, envir, enclos): object 'saturation_d1s3' not found
tnseq_saturation(
saturation_cx1 <-"preprocessing/cx1/outputs/essentiality_sagalactiae_cjb111/consolidated_v2-v1M1.wig",
adjust=2)
$plot saturation_cx1
## Warning: Removed 4377 rows containing non-finite values (stat_bin).
## Warning: Removed 4377 rows containing non-finite values (stat_density).
## Warning: Removed 2 rows containing missing values (geom_bar).
$hits_summary saturation_cx1
## Min. 1st Qu. Median Mean 3rd Qu. Max.
## 0 18 68 207 252 4815
plot_essentiality(
ess_plts <-"preprocessing/cx1/outputs/essentiality_sagalactiae_cjb111/mh_ess-consolidated_v2-v1M1_gene_tas_m1.csv")
"zbar"]] ess_plts[[
tnseq_saturation(
saturation_cx2 <-"preprocessing/cx2/outputs/essentiality_sagalactiae_cjb111/consolidated_v2-v1M1.wig")
$plot saturation_cx2
## Warning: Removed 1991 rows containing non-finite values (stat_bin).
## Warning: Removed 1991 rows containing non-finite values (stat_density).
## Warning: Removed 2 rows containing missing values (geom_bar).
$hits_summary saturation_cx2
## Min. 1st Qu. Median Mean 3rd Qu. Max.
## 0 18 105 268 374 3743
plot_essentiality(
ess_plts <-"preprocessing/cx2/outputs/essentiality_sagalactiae_cjb111/mh_ess-consolidated_v2-v1M1_gene_tas_m1.csv")
"zbar"]] ess_plts[[
tnseq_saturation(
saturation_cx3 <-"preprocessing/cx3/outputs/essentiality_sagalactiae_cjb111/consolidated_v2-v1M1.wig")
$plot saturation_cx3
## Warning: Removed 1989 rows containing non-finite values (stat_bin).
## Warning: Removed 1989 rows containing non-finite values (stat_density).
## Warning: Removed 2 rows containing missing values (geom_bar).
$hits_summary saturation_cx3
## Min. 1st Qu. Median Mean 3rd Qu. Max.
## 0 26 91 353 386 8771
plot_essentiality(
ess_plts <-"preprocessing/cx3/outputs/essentiality_sagalactiae_cjb111/mh_ess-consolidated_v2-v1M1_gene_tas_m1.csv")
"zbar"]] ess_plts[[
tnseq_saturation(
saturation_d1s1 <-"preprocessing/d1s1/outputs/essentiality_sagalactiae_cjb111/consolidated_v2-v1M1.wig")
$plot saturation_d1s1
## Warning: Removed 11638 rows containing non-finite values (stat_bin).
## Warning: Removed 11638 rows containing non-finite values (stat_density).
## Warning: Removed 2 rows containing missing values (geom_bar).
$hits_summary saturation_d1s1
## Min. 1st Qu. Median Mean 3rd Qu. Max.
## 0.0 14.0 41.0 97.9 110.0 2595.0
plot_essentiality(
ess_plts <-"preprocessing/d1s1/outputs/essentiality_sagalactiae_cjb111/mh_ess-consolidated_v2-v1M1_gene_tas_m2.csv")
"zbar"]] ess_plts[[
tnseq_saturation(
saturation_d1s2 <-"preprocessing/d1s2/outputs/essentiality_sagalactiae_cjb111/consolidated_v2-v1M1.wig")
$plot saturation_d1s2
## Warning: Removed 5413 rows containing non-finite values (stat_bin).
## Warning: Removed 5413 rows containing non-finite values (stat_density).
## Warning: Removed 2 rows containing missing values (geom_bar).
$hits_summary saturation_d1s2
## Min. 1st Qu. Median Mean 3rd Qu. Max.
## 0 17 54 184 205 6218
plot_essentiality(
ess_plts <-"preprocessing/d1s2/outputs/essentiality_sagalactiae_cjb111/mh_ess-consolidated_v2-v1M1_gene_tas_m2.csv")
## Warning in lmrob.S(x, y, control = control): S refinements did not converge (to
## refine.tol=1e-07) in 200 (= k.max) steps
## Warning in lmrob.S(x, y, control = control): S refinements did not converge (to
## refine.tol=1e-07) in 200 (= k.max) steps
"zbar"]] ess_plts[[
tnseq_saturation(
saturation_d1s3 <-"preprocessing/d1s3/outputs/essentiality_sagalactiae_cjb111/r2_ca_v3-v1M1.wig")
## Warning in file(file, "rt"): cannot open file 'preprocessing/d1s3/outputs/
## essentiality_sagalactiae_cjb111/r2_ca_v3-v1M1.wig': No such file or directory
## Error in file(file, "rt"): cannot open the connection
$plot saturation_d1s3
## Error in eval(expr, envir, enclos): object 'saturation_d1s3' not found
$hits_summary saturation_d1s3
## Error in eval(expr, envir, enclos): object 'saturation_d1s3' not found
plot_essentiality(
ess_plts <-"preprocessing/d1s3/outputs/essentiality_sagalactiae_cjb111/r2_ca_v3-v1M1_gene_tas_m2.csv")
## Error: 'preprocessing/d1s3/outputs/essentiality_sagalactiae_cjb111/r2_ca_v3-v1M1_gene_tas_m2.csv' does not exist in current working directory ('/mnt/sshfs/cbcbsub01/fs/cbcb-lab/nelsayed/scratch/atb/tnseq/sagalacticae_2020').
"zbar"]] ess_plts[[
tnseq_saturation(
saturation_d3s1 <-"preprocessing/d3s1/outputs/essentiality_sagalactiae_cjb111/r2_ca_v3-v1M1.wig")
## Warning in file(file, "rt"): cannot open file 'preprocessing/d3s1/outputs/
## essentiality_sagalactiae_cjb111/r2_ca_v3-v1M1.wig': No such file or directory
## Error in file(file, "rt"): cannot open the connection
$plot saturation_d3s1
## Error in eval(expr, envir, enclos): object 'saturation_d3s1' not found
$hits_summary saturation_d3s1
## Error in eval(expr, envir, enclos): object 'saturation_d3s1' not found
plot_essentiality(
ess_plts <-"preprocessing/d3s1/outputs/essentiality_sagalactiae_cjb111/r2_ca_v3-v1M1_gene_tas_m2.csv")
## Error: 'preprocessing/d3s1/outputs/essentiality_sagalactiae_cjb111/r2_ca_v3-v1M1_gene_tas_m2.csv' does not exist in current working directory ('/mnt/sshfs/cbcbsub01/fs/cbcb-lab/nelsayed/scratch/atb/tnseq/sagalacticae_2020').
"zbar"]] ess_plts[[
tnseq_saturation(
saturation_d3s3 <-"preprocessing/d3s3/outputs/essentiality_sagalactiae_cjb111/r2_ca_v3-v1M1.wig")
## Warning in file(file, "rt"): cannot open file 'preprocessing/d3s3/outputs/
## essentiality_sagalactiae_cjb111/r2_ca_v3-v1M1.wig': No such file or directory
## Error in file(file, "rt"): cannot open the connection
$plot saturation_d3s3
## Error in eval(expr, envir, enclos): object 'saturation_d3s3' not found
$hits_summary saturation_d3s3
## Error in eval(expr, envir, enclos): object 'saturation_d3s3' not found
plot_essentiality(
ess_plts <-"preprocessing/d3s3/outputs/essentiality_sagalactiae_cjb111/r2_ca_v3-v1M1_gene_tas_m2.csv")
## Error: 'preprocessing/d3s3/outputs/essentiality_sagalactiae_cjb111/r2_ca_v3-v1M1_gene_tas_m2.csv' does not exist in current working directory ('/mnt/sshfs/cbcbsub01/fs/cbcb-lab/nelsayed/scratch/atb/tnseq/sagalacticae_2020').
"zbar"]] ess_plts[[
tnseq_saturation(
saturation_tn1 <-"preprocessing/tn1/outputs/essentiality_sagalactiae_cjb111/r2_ca_v3-v1M1.wig")
## Warning in file(file, "rt"): cannot open file 'preprocessing/tn1/outputs/
## essentiality_sagalactiae_cjb111/r2_ca_v3-v1M1.wig': No such file or directory
## Error in file(file, "rt"): cannot open the connection
$plot saturation_tn1
## Error in eval(expr, envir, enclos): object 'saturation_tn1' not found
$hits_summary saturation_tn1
## Error in eval(expr, envir, enclos): object 'saturation_tn1' not found
plot_essentiality(
ess_plts <-"preprocessing/tn1/outputs/essentiality_sagalactiae_cjb111/r2_ca_v3-v1M1_gene_tas_m2.csv")
## Error: 'preprocessing/tn1/outputs/essentiality_sagalactiae_cjb111/r2_ca_v3-v1M1_gene_tas_m2.csv' does not exist in current working directory ('/mnt/sshfs/cbcbsub01/fs/cbcb-lab/nelsayed/scratch/atb/tnseq/sagalacticae_2020').
"zbar"]] ess_plts[[
tnseq_saturation(
saturation_tn2 <-"preprocessing/tn2/outputs/essentiality_sagalactiae_cjb111/r2_ca_v3-v1M1.wig")
## Warning in file(file, "rt"): cannot open file 'preprocessing/tn2/outputs/
## essentiality_sagalactiae_cjb111/r2_ca_v3-v1M1.wig': No such file or directory
## Error in file(file, "rt"): cannot open the connection
$plot saturation_tn2
## Error in eval(expr, envir, enclos): object 'saturation_tn2' not found
$hits_summary saturation_tn2
## Error in eval(expr, envir, enclos): object 'saturation_tn2' not found
plot_essentiality(
ess_plts <-"preprocessing/tn2/outputs/essentiality_sagalactiae_cjb111/r2_ca_v3-v1M1_gene_tas_m2.csv")
## Error: 'preprocessing/tn2/outputs/essentiality_sagalactiae_cjb111/r2_ca_v3-v1M1_gene_tas_m2.csv' does not exist in current working directory ('/mnt/sshfs/cbcbsub01/fs/cbcb-lab/nelsayed/scratch/atb/tnseq/sagalacticae_2020').
"zbar"]] ess_plts[[
tnseq_saturation(
saturation_tn3 <-"preprocessing/tn3/outputs/essentiality_sagalactiae_cjb111/r2_ca_v3-v1M1.wig")
## Warning in file(file, "rt"): cannot open file 'preprocessing/tn3/outputs/
## essentiality_sagalactiae_cjb111/r2_ca_v3-v1M1.wig': No such file or directory
## Error in file(file, "rt"): cannot open the connection
$plot saturation_tn3
## Error in eval(expr, envir, enclos): object 'saturation_tn3' not found
$hits_summary saturation_tn3
## Error in eval(expr, envir, enclos): object 'saturation_tn3' not found
plot_essentiality(
ess_plts <-"preprocessing/tn3/outputs/essentiality_sagalactiae_cjb111/r2_ca_v3-v1M1_gene_tas_m2.csv")
## Error: 'preprocessing/tn3/outputs/essentiality_sagalactiae_cjb111/r2_ca_v3-v1M1_gene_tas_m2.csv' does not exist in current working directory ('/mnt/sshfs/cbcbsub01/fs/cbcb-lab/nelsayed/scratch/atb/tnseq/sagalacticae_2020').
"zbar"]] ess_plts[[
tnseq_saturation(
saturation_ut1 <-"preprocessing/ut1/outputs/essentiality_sagalactiae_cjb111/r2_ca_v3-v1M1.wig")
## Warning in file(file, "rt"): cannot open file 'preprocessing/ut1/outputs/
## essentiality_sagalactiae_cjb111/r2_ca_v3-v1M1.wig': No such file or directory
## Error in file(file, "rt"): cannot open the connection
$plot saturation_ut1
## Error in eval(expr, envir, enclos): object 'saturation_ut1' not found
$hits_summary saturation_ut1
## Error in eval(expr, envir, enclos): object 'saturation_ut1' not found
plot_essentiality(
ess_plts <-"preprocessing/ut1/outputs/essentiality_sagalactiae_cjb111/r2_ca_v3-v1M1_gene_tas_m2.csv")
## Error: 'preprocessing/ut1/outputs/essentiality_sagalactiae_cjb111/r2_ca_v3-v1M1_gene_tas_m2.csv' does not exist in current working directory ('/mnt/sshfs/cbcbsub01/fs/cbcb-lab/nelsayed/scratch/atb/tnseq/sagalacticae_2020').
"zbar"]] ess_plts[[
tnseq_saturation(
saturation_ut2 <-"preprocessing/ut2/outputs/essentiality_sagalactiae_cjb111/r2_ca_v3-v1M1.wig")
## Warning in file(file, "rt"): cannot open file 'preprocessing/ut2/outputs/
## essentiality_sagalactiae_cjb111/r2_ca_v3-v1M1.wig': No such file or directory
## Error in file(file, "rt"): cannot open the connection
$plot saturation_ut2
## Error in eval(expr, envir, enclos): object 'saturation_ut2' not found
$hits_summary saturation_ut2
## Error in eval(expr, envir, enclos): object 'saturation_ut2' not found
plot_essentiality(
ess_plts <-"preprocessing/ut2/outputs/essentiality_sagalactiae_cjb111/r2_ca_v3-v1M1_gene_tas_m2.csv")
## Error: 'preprocessing/ut2/outputs/essentiality_sagalactiae_cjb111/r2_ca_v3-v1M1_gene_tas_m2.csv' does not exist in current working directory ('/mnt/sshfs/cbcbsub01/fs/cbcb-lab/nelsayed/scratch/atb/tnseq/sagalacticae_2020').
"zbar"]] ess_plts[[
tnseq_saturation(
saturation_vg1 <-"preprocessing/vg1/outputs/essentiality_sagalactiae_cjb111/r2_ca_v3-v1M1.wig")
## Warning in file(file, "rt"): cannot open file 'preprocessing/vg1/outputs/
## essentiality_sagalactiae_cjb111/r2_ca_v3-v1M1.wig': No such file or directory
## Error in file(file, "rt"): cannot open the connection
$plot saturation_vg1
## Error in eval(expr, envir, enclos): object 'saturation_vg1' not found
$hits_summary saturation_vg1
## Error in eval(expr, envir, enclos): object 'saturation_vg1' not found
plot_essentiality(
ess_plts <-"preprocessing/vg1/outputs/essentiality_sagalactiae_cjb111/r2_ca_v3-v1M1_gene_tas_m2.csv")
## Error: 'preprocessing/vg1/outputs/essentiality_sagalactiae_cjb111/r2_ca_v3-v1M1_gene_tas_m2.csv' does not exist in current working directory ('/mnt/sshfs/cbcbsub01/fs/cbcb-lab/nelsayed/scratch/atb/tnseq/sagalacticae_2020').
"zbar"]] ess_plts[[
tnseq_saturation(
saturation_vg2 <-"preprocessing/vg2/outputs/essentiality_sagalactiae_cjb111/r2_ca_v3-v1M1.wig")
## Warning in file(file, "rt"): cannot open file 'preprocessing/vg2/outputs/
## essentiality_sagalactiae_cjb111/r2_ca_v3-v1M1.wig': No such file or directory
## Error in file(file, "rt"): cannot open the connection
$plot saturation_vg2
## Error in eval(expr, envir, enclos): object 'saturation_vg2' not found
$hits_summary saturation_vg2
## Error in eval(expr, envir, enclos): object 'saturation_vg2' not found
plot_essentiality(
ess_plts <-"preprocessing/vg2/outputs/essentiality_sagalactiae_cjb111/r2_ca_v3-v1M1_gene_tas_m2.csv")
## Error: 'preprocessing/vg2/outputs/essentiality_sagalactiae_cjb111/r2_ca_v3-v1M1_gene_tas_m2.csv' does not exist in current working directory ('/mnt/sshfs/cbcbsub01/fs/cbcb-lab/nelsayed/scratch/atb/tnseq/sagalacticae_2020').
"zbar"]] ess_plts[[
tnseq_saturation(
saturation_vg3 <-"preprocessing/vg3/outputs/essentiality_sagalactiae_cjb111/r2_ca_v3-v1M1.wig")
## Warning in file(file, "rt"): cannot open file 'preprocessing/vg3/outputs/
## essentiality_sagalactiae_cjb111/r2_ca_v3-v1M1.wig': No such file or directory
## Error in file(file, "rt"): cannot open the connection
$plot saturation_vg3
## Error in eval(expr, envir, enclos): object 'saturation_vg3' not found
$hits_summary saturation_vg3
## Error in eval(expr, envir, enclos): object 'saturation_vg3' not found
plot_essentiality(
ess_plts <-"preprocessing/vg3/outputs/essentiality_sagalactiae_cjb111/r2_ca_v3-v1M1_gene_tas_m2.csv")
## Error: 'preprocessing/vg3/outputs/essentiality_sagalactiae_cjb111/r2_ca_v3-v1M1_gene_tas_m2.csv' does not exist in current working directory ('/mnt/sshfs/cbcbsub01/fs/cbcb-lab/nelsayed/scratch/atb/tnseq/sagalacticae_2020').
"zbar"]] ess_plts[[
tnseq_saturation(
saturation_control <-"preprocessing/cx_combined/outputs/essentiality_sagalactiae_cjb111/r2-v1M1.wig")
## Warning in file(file, "rt"): cannot open file 'preprocessing/cx_combined/
## outputs/essentiality_sagalactiae_cjb111/r2-v1M1.wig': No such file or directory
## Error in file(file, "rt"): cannot open the connection
$plot saturation_control
## Error in eval(expr, envir, enclos): object 'saturation_control' not found
plot_essentiality(
ess_plts <-"preprocessing/cx_combined/outputs/essentiality_sagalactiae_cjb111/mh_ess-r2-v1M1_gene_tas_m1.csv")
## Error: 'preprocessing/cx_combined/outputs/essentiality_sagalactiae_cjb111/mh_ess-r2-v1M1_gene_tas_m1.csv' does not exist in current working directory ('/mnt/sshfs/cbcbsub01/fs/cbcb-lab/nelsayed/scratch/atb/tnseq/sagalacticae_2020').
"zbar"]] ess_plts[[
plot_essentiality(
ess_plts <-"preprocessing/cx_combined/outputs/essentiality_sagalactiae_cjb111/mh_ess-r2-v1M1_gene_tas_m2.csv")
## Error: 'preprocessing/cx_combined/outputs/essentiality_sagalactiae_cjb111/mh_ess-r2-v1M1_gene_tas_m2.csv' does not exist in current working directory ('/mnt/sshfs/cbcbsub01/fs/cbcb-lab/nelsayed/scratch/atb/tnseq/sagalacticae_2020').
"zbar"]] ess_plts[[
plot_essentiality(
ess_plts <-"preprocessing/cx_combined/outputs/essentiality_sagalactiae_cjb111/mh_ess-r2-v1M1_gene_tas_m4.csv")
## Error: 'preprocessing/cx_combined/outputs/essentiality_sagalactiae_cjb111/mh_ess-r2-v1M1_gene_tas_m4.csv' does not exist in current working directory ('/mnt/sshfs/cbcbsub01/fs/cbcb-lab/nelsayed/scratch/atb/tnseq/sagalacticae_2020').
"zbar"]] ess_plts[[
plot_essentiality(
ess_plts <-"preprocessing/cx_combined/outputs/essentiality_sagalactiae_cjb111/mh_ess-r2-v1M1_gene_tas_m8.csv")
## Error: 'preprocessing/cx_combined/outputs/essentiality_sagalactiae_cjb111/mh_ess-r2-v1M1_gene_tas_m8.csv' does not exist in current working directory ('/mnt/sshfs/cbcbsub01/fs/cbcb-lab/nelsayed/scratch/atb/tnseq/sagalacticae_2020').
"zbar"]] ess_plts[[
plot_essentiality(
ess_plts <-"preprocessing/cx_combined/outputs/essentiality_sagalactiae_cjb111/mh_ess-r2-v1M1_gene_tas_m16.csv")
## Error: 'preprocessing/cx_combined/outputs/essentiality_sagalactiae_cjb111/mh_ess-r2-v1M1_gene_tas_m16.csv' does not exist in current working directory ('/mnt/sshfs/cbcbsub01/fs/cbcb-lab/nelsayed/scratch/atb/tnseq/sagalacticae_2020').
"zbar"]] ess_plts[[
tnseq_multi_saturation(meta=pData(cjb111_expt), meta_column="cjb111esswig") plt <-
## Error in h(simpleError(msg, call)): error in evaluating the argument 'object' in selecting a method for function 'pData': object 'cjb111_expt' not found
$ggstats plt
## Error in eval(expr, envir, enclos): object 'plt' not found
tnseq_multi_saturation(meta=pData(cjb111_expt), meta_column="cjb111esswig") plt <-
## Error in h(simpleError(msg, call)): error in evaluating the argument 'object' in selecting a method for function 'pData': object 'cjb111_expt' not found
"plot"]] + ggplot2::scale_y_continuous(limits=c(0, 12000)) plt[[
## Error in eval(expr, envir, enclos): object 'plt' not found
## I expect the saturation of this to be a bit better than 2603V/R.
tnseq_multi_saturation(meta=pData(vr2603_expt), meta_column="vr2603esswig") plt <-
## Error in h(simpleError(msg, call)): error in evaluating the argument 'object' in selecting a method for function 'pData': object 'vr2603_expt' not found
"plot"]] + ggplot2::scale_y_continuous(limits=c(0, 12000)) plt[[
## Error in eval(expr, envir, enclos): object 'plt' not found
## hmm this is not definitive. It looks like cjb111 has more TAs with ~ 1 hit.
## but R/V has more hits with ~ 16<x<64 hits.
tnseq_multi_saturation(meta=pData(cjb111_expt), meta_column="cjb111esswig") plt <-
## Error in h(simpleError(msg, call)): error in evaluating the argument 'object' in selecting a method for function 'pData': object 'cjb111_expt' not found
"plot"]] + ggplot2::scale_y_continuous(limits=c(0, 20000)) plt[[
## Error in eval(expr, envir, enclos): object 'plt' not found
## I am not quite sure how to interpret this one, we have much more discrete
## numbers of reads than the others.
For differential expression, I am going to assume until I hear otherwise, that my batch assignments are not correct and that the 1,2,3 assignments of the sample names do not actually delineate separate batches. Though, if they do delineate separate batches, it might be taken as a (very)small degree of evidence that 04 and 09 were switched.
list(
combined_essentiality <-"control" = "preprocessing/combined_control/outputs/essentiality_sagalactiae_cjb111/mh_ess-trimmed_ca-v1m1_gene_tas_m2.csv",
"low" = "preprocessing/combined_low/outputs/essentiality_sagalactiae_cjb111/mh_ess-trimmed_ca-v1m1_gene_tas_m2.csv",
"high" = "preprocessing/combined_high/outputs/essentiality_sagalactiae_cjb111/mh_ess-trimmed_ca-v1m1_gene_tas_m2.csv",
"previous" = "preprocessing/combined_previous/outputs/essentiality_sagalactiae_cjb111/mh_ess-combined_ca_ta-v0M1_gene_tas_m2.csv")
data.frame()
ess_table <-for (f in 1:length(combined_essentiality)) {
names(combined_essentiality)[f]
name <- c("orf", "k", "n", "r", "s", "zbar", "call")
column_names <- paste0(name, "_", column_names)
names <- readr::read_tsv(combined_essentiality[[f]], comment="#", col_names=names)
r <-colnames(r)[1] <- "orf"
if (f == 1) {
r
ess_table <-else {
} merge(ess_table, r, by="orf")
ess_table <-
} }
## Error: 'preprocessing/combined_control/outputs/essentiality_sagalactiae_cjb111/mh_ess-trimmed_ca-v1m1_gene_tas_m2.csv' does not exist in current working directory ('/mnt/sshfs/cbcbsub01/fs/cbcb-lab/nelsayed/scratch/atb/tnseq/sagalacticae_2020').
rownames(ess_table) <- gsub(x=ess_table[["orf"]], pattern="^cds_", replacement="")
"orf"]] <- NULL
ess_table[[
all_pairwise(cjb111_expt, model_batch=FALSE, parallel=FALSE) cjb111_de <-
## Error in normalize_expt(input, filter = TRUE, batch = FALSE, transform = "log2", : object 'cjb111_expt' not found
list(
cjb111_contrasts <-"low_vs_control" = c("cal_low", "control"),
"high_vs_control" = c("cal_high", "control"))
combine_de_tables(
cjb111_tables <-extra_annot=ess_table,
keepers=cjb111_contrasts,
cjb111_de, excel=glue::glue("excel/{rundate}-cjb111_tables-v{ver}.xlsx"))
## Error in combine_de_tables(extra_annot = ess_table, cjb111_de, keepers = cjb111_contrasts, : object 'cjb111_de' not found
##cjb111_sig <- extract_significant_genes(
## cjb111_tables,
## excel=glue::glue("excel/cjb111_sig-v{ver}.xlsx"))
create_expt("sample_sheets/sagalactiae_combined_samples.xlsx",
combined_expt <-gene_info=cjb111_annot)
## Reading the sample metadata.
## Error in read.xlsx.default(xlsxFile = file, sheet = 1) :
## File does not exist.
## Error in read_metadata(meta_file, ...): Unable to read the metadata file: sample_sheets/sagalactiae_combined_samples.xlsx
normalize_expt(combined_expt, convert="rpkm",
combined_norm <-transform="log2", na_to_zero=TRUE)
## Error in normalize_expt(combined_expt, convert = "rpkm", transform = "log2", : object 'combined_expt' not found
exprs(combined_norm) combined_exprs <-
## Error in h(simpleError(msg, call)): error in evaluating the argument 'object' in selecting a method for function 'exprs': object 'combined_norm' not found
ess_table[, c("control_call", "low_call", "high_call")] %>%
ess_circos <- dplyr::mutate(control_num = dplyr::case_when(
== "E" ~ 2,
control_call == "NE" ~ 0,
control_call == "S" ~ -1,
control_call == "U" ~ 1),
control_call low_num = dplyr::case_when(
== "E" ~ 2,
low_call == "NE" ~ 0,
low_call == "S" ~ -1,
low_call == "U" ~ 1),
low_call high_num = dplyr::case_when(
== "E" ~ 2,
high_call == "NE" ~ 0,
high_call == "S" ~ -1,
high_call == "U" ~ 1)) high_call
## Error in `[.data.frame`(ess_table, , c("control_call", "low_call", "high_call")): undefined columns selected
"control_call"]] <- as.factor(ess_circos[["control_call"]]) ess_circos[[
## Error in is.factor(x): object 'ess_circos' not found
"low_call"]] <- as.factor(ess_circos[["low_call"]]) ess_circos[[
## Error in is.factor(x): object 'ess_circos' not found
"high_call"]] <- as.factor(ess_circos[["high_call"]]) ess_circos[[
## Error in is.factor(x): object 'ess_circos' not found
rownames(ess_circos) <- rownames(ess_table)
## Error in rownames(ess_circos) <- rownames(ess_table): object 'ess_circos' not found
c("990000", "008800", "000000", "0000AA")
colors <-names(colors) <- c("E", "NE", "S", "U")
cjb111_tables[["data"]][["low_vs_control"]] low_df <-
## Error in eval(expr, envir, enclos): object 'cjb111_tables' not found
cjb111_tables[["data"]][["high_vs_control"]] high_df <-
## Error in eval(expr, envir, enclos): object 'cjb111_tables' not found
circos_prefix(cjb111_annot, name="cjb111") circos_cfg <-
## This assumes you have a colors.conf in circos/colors/ and fonts.conf in circos/fonts/
## It also assumes you have conf/ideogram.conf, conf/ticks.conf, and conf/housekeeping.conf
## It will write circos/conf/cjb111.conf with a reasonable first approximation config file.
## Creating the data directory: circos/data
## The circos directory does not exist, creating: circos/conf
## Error in circos_prefix(cjb111_annot, name = "cjb111"): object 'cjb111_annot' not found
circos_karyotype(circos_cfg, fasta="reference/sagalactiae_cjb111.fasta") cjb111_kary <-
## Error in circos_karyotype(circos_cfg, fasta = "reference/sagalactiae_cjb111.fasta"): object 'circos_cfg' not found
circos_plus_minus(circos_cfg, width=0.06, thickness=40) cjb111_plus_minus <-
## Error in message("Writing data file: ", cfg[["plus_data_file"]], " with the + strand GO data."): object 'circos_cfg' not found
circos_hist(circos_cfg, combined_exprs, colname="control",
cjb111_control_rpkm <-basename="control_rpkm", outer=cjb111_plus_minus,
fill_color="vvdpblue", width=0.06)
## Error in circos_hist(circos_cfg, combined_exprs, colname = "control", : object 'circos_cfg' not found
circos_hist(circos_cfg, combined_exprs, colname="low",
cjb111_low_rpkm <-basename="low_rpkm", outer=cjb111_control_rpkm,
fill_color="vdpblue", width=0.06)
## Error in circos_hist(circos_cfg, combined_exprs, colname = "low", basename = "low_rpkm", : object 'circos_cfg' not found
circos_hist(circos_cfg, combined_exprs, colname="high",
cjb111_high_rpkm <-basename="high_rpkm", outer=cjb111_low_rpkm,
fill_color="dpblue", width=0.06)
## Error in circos_hist(circos_cfg, combined_exprs, colname = "high", basename = "high_rpkm", : object 'circos_cfg' not found
circos_tile(circos_cfg, ess_circos, colname="control_call",
cjb111_control_tile <-colors=colors, basename="control_tile",
outer=cjb111_high_rpkm, width=0.06)
## Error in circos_tile(circos_cfg, ess_circos, colname = "control_call", : object 'circos_cfg' not found
circos_hist(circos_cfg, low_df, colname="deseq_logfc", basename="low",
cjb111_low <-outer=0.60, fill_color="vvdpgreen", width=0.06, thickness=0.1)
## Error in circos_hist(circos_cfg, low_df, colname = "deseq_logfc", basename = "low", : object 'circos_cfg' not found
circos_hist(circos_cfg, high_df, colname="deseq_logfc", basename="high",
cjb111_high <-outer=cjb111_low, fill_color="vdpgreen", width=0.06, thickness=0.1)
## Error in circos_hist(circos_cfg, high_df, colname = "deseq_logfc", basename = "high", : object 'circos_cfg' not found
circos_suffix(circos_cfg) cjb111_suffix <-
## Error in circos_suffix(circos_cfg): object 'circos_cfg' not found
circos_make(circos_cfg, target="cjb111") made <-
## Error in circos_make(circos_cfg, target = "cjb111"): object 'circos_cfg' not found
Yoann sent an email this morning with the following request:
“I have now the table summarizing the data and we would like to summarize it with a Circos plot. I was hoping you could do your amazing magic on this. The data is in the Excel file I am attaching to the email. The figure would look very similar to what you did not too long ago, but with extra data. The idea will be to have the genome information and then going down into the circle we would show the THY data (in column BE), than maybe a little space and we would show the RPMI-based data (BL, BS and BZ), then again a little space and we would have a final circle integrating all previous data for the final call (CI).”
I copied the xls file to the ‘from_yoann/’ directory and exported the relevant portions to a csv file named ‘gbs_essentiality.csv’.
I just realized that the material Yoann sent me is precisely what I already did in the above section which created the ess_circos table.
readr::read_csv("from_yoann/gbs_essentiality.csv") yoann_table <-
## Error: 'from_yoann/gbs_essentiality.csv' does not exist in current working directory ('/mnt/sshfs/cbcbsub01/fs/cbcb-lab/nelsayed/scratch/atb/tnseq/sagalacticae_2020').
## The new column which is desired is actually the 'Final'.
## So, I will merge this with my existing ess_circos data frame and add a color for 'NC'.
## The wanted column names are:
## BE: previouscall BL: controlcall BS: lowcall BZ: highcall CI: 'Final call' (85)
c("controlcall", "Final")
wanted <- as.data.frame(yoann_table[, wanted]) yoann_wanted <-
## Error in h(simpleError(msg, call)): error in evaluating the argument 'x' in selecting a method for function 'as.data.frame': object 'yoann_table' not found
rownames(yoann_wanted) <- yoann_table[["row.names"]]
## Error in eval(expr, envir, enclos): object 'yoann_table' not found
merge(ess_circos, yoann_wanted, by.x="row.names", by.y="row.names") yoann_circos <-
## Error in merge(ess_circos, yoann_wanted, by.x = "row.names", by.y = "row.names"): object 'ess_circos' not found
"Final"]] <- as.factor(yoann_circos[["Final"]]) yoann_circos[[
## Error in is.factor(x): object 'yoann_circos' not found
rownames(yoann_circos) <- yoann_circos[["Row.names"]]
## Error in eval(expr, envir, enclos): object 'yoann_circos' not found
"Row.names"]] <- NULL yoann_circos[[
## Error in yoann_circos[["Row.names"]] <- NULL: object 'yoann_circos' not found
c("990000", "008800", "444444", "0000AA", "000000")
colors <-names(colors) <- c("E", "NE", "S", "U", "NC")
circos_prefix(cjb111_annot, name="cjb111_yoann") yoann_cfg <-
## This assumes you have a colors.conf in circos/colors/ and fonts.conf in circos/fonts/
## It also assumes you have conf/ideogram.conf, conf/ticks.conf, and conf/housekeeping.conf
## It will write circos/conf/cjb111_yoann.conf with a reasonable first approximation config file.
## Error in circos_prefix(cjb111_annot, name = "cjb111_yoann"): object 'cjb111_annot' not found
circos_karyotype(yoann_cfg, fasta="reference/sagalactiae_cjb111.fasta") yoann_kary <-
## Error in circos_karyotype(yoann_cfg, fasta = "reference/sagalactiae_cjb111.fasta"): object 'yoann_cfg' not found
circos_plus_minus(yoann_cfg, width=0.06, thickness=40) yoann_plus_minus <-
## Error in message("Writing data file: ", cfg[["plus_data_file"]], " with the + strand GO data."): object 'yoann_cfg' not found
circos_tile(yoann_cfg, ess_circos, colname="control_call",
yoann_control_tile <-colors=colors, basename="control_tile",
outer=yoann_plus_minus, width=0.06)
## Error in circos_tile(yoann_cfg, ess_circos, colname = "control_call", : object 'yoann_cfg' not found
circos_tile(yoann_cfg, ess_circos, colname="low_call",
yoann_low_tile <-colors=colors, basename="low_tile",
outer=yoann_control_tile, width=0.06)
## Error in circos_tile(yoann_cfg, ess_circos, colname = "low_call", colors = colors, : object 'yoann_cfg' not found
circos_tile(yoann_cfg, ess_circos, colname="high_call",
yoann_high_tile <-colors=colors, basename="high_tile",
outer=yoann_low_tile, width=0.06)
## Error in circos_tile(yoann_cfg, ess_circos, colname = "high_call", colors = colors, : object 'yoann_cfg' not found
circos_tile(yoann_cfg, yoann_circos, colname="Final",
yoann_final_tile <-colors=colors, basename="final_tile",
outer=yoann_high_tile, width=0.06)
## Error in circos_tile(yoann_cfg, yoann_circos, colname = "Final", colors = colors, : object 'yoann_cfg' not found
circos_suffix(yoann_cfg) yoann_suffix <-
## Error in circos_suffix(yoann_cfg): object 'yoann_cfg' not found
circos_make(yoann_cfg, target="cjb111_yoann") made <-
## Error in circos_make(yoann_cfg, target = "cjb111_yoann"): object 'yoann_cfg' not found
First, between the COG categories and the THY data, I would like to add the saturation level of the library: this would be the blue lines from the Circos figure you produce a while back (see Circos plot attached to this email).
Second, I would like to add a new ring of essentiality that summarizes the data from the rings (1), (2), (3) and (4) abovementioned. The data is listed in the attached Excel document and is found in column CI, called Lindsey’s call. I would like the data to look a little different so it “pops” as it is a summary. I remember back in the day, we did something similar with some of my data in Group A strep, and we had the non-essential genes showing in yellow.
In order to do the above, I saved the excel file Yoann sent me, exported the relevant column to a 2 column cvs file, containing the gene IDs and calls. Now I will copy/paste the previous set of rings and add the new requests.
202006 <- readr::read_csv("from_yoann/lindsey_calls.csv") yoann_
## Error: 'from_yoann/lindsey_calls.csv' does not exist in current working directory ('/mnt/sshfs/cbcbsub01/fs/cbcb-lab/nelsayed/scratch/atb/tnseq/sagalacticae_2020').
202006 <- as.data.frame(yoann_202006) yoann_
## Error in h(simpleError(msg, call)): error in evaluating the argument 'x' in selecting a method for function 'as.data.frame': object 'yoann_202006' not found
rownames(yoann_202006) <- yoann_202006[["ID"]]
## Error in eval(expr, envir, enclos): object 'yoann_202006' not found
colnames(yoann_202006) <- c("ID202006", "lindsey_call")
## Error in colnames(yoann_202006) <- c("ID202006", "lindsey_call"): object 'yoann_202006' not found
c("e31212", "f0c505", "444444", "0000AA", "000000")
lindsey_colors <-names(lindsey_colors) <- c("E", "NE", "S", "U", "NC")
202006 <- merge(yoann_circos, yoann_202006, by.x="row.names", by.y="row.names") yoann_circos_
## Error in merge(yoann_circos, yoann_202006, by.x = "row.names", by.y = "row.names"): object 'yoann_circos' not found
rownames(yoann_circos_202006) <- yoann_circos_202006[["Row.names"]]
## Error in eval(expr, envir, enclos): object 'yoann_circos_202006' not found
202006[["Row.names"]] <- NULL yoann_circos_
## Error in yoann_circos_202006[["Row.names"]] <- NULL: object 'yoann_circos_202006' not found
202006 <- circos_prefix(cjb111_annot, name="cjb111_yoann_202006") yoann_cfg_
## This assumes you have a colors.conf in circos/colors/ and fonts.conf in circos/fonts/
## It also assumes you have conf/ideogram.conf, conf/ticks.conf, and conf/housekeeping.conf
## It will write circos/conf/cjb111_yoann_202006.conf with a reasonable first approximation config file.
## Error in circos_prefix(cjb111_annot, name = "cjb111_yoann_202006"): object 'cjb111_annot' not found
202006 <- circos_karyotype(yoann_cfg_202006, fasta="reference/sagalactiae_cjb111.fasta") yoann_kary_
## Error in circos_karyotype(yoann_cfg_202006, fasta = "reference/sagalactiae_cjb111.fasta"): object 'yoann_cfg_202006' not found
202006 <- circos_plus_minus(yoann_cfg_202006, width=0.05, thickness=40) yoann_plus_minus_
## Error in message("Writing data file: ", cfg[["plus_data_file"]], " with the + strand GO data."): object 'yoann_cfg_202006' not found
202006 <- circos_hist(yoann_cfg_202006, combined_exprs, colname="control",
cjb111_control_rpkm_basename="control_rpkm", outer=yoann_plus_minus_202006,
fill_color="vvdpblue", width=0.05)
## Error in circos_hist(yoann_cfg_202006, combined_exprs, colname = "control", : object 'yoann_cfg_202006' not found
202006 <- circos_hist(yoann_cfg_202006, combined_exprs, colname="low",
cjb111_low_rpkm_basename="low_rpkm", outer=cjb111_control_rpkm_202006,
fill_color="vdpblue", width=0.05)
## Error in circos_hist(yoann_cfg_202006, combined_exprs, colname = "low", : object 'yoann_cfg_202006' not found
202006 <- circos_hist(yoann_cfg_202006, combined_exprs, colname="high",
cjb111_high_rpkm_basename="high_rpkm", outer=cjb111_low_rpkm_202006,
fill_color="dpblue", width=0.05)
## Error in circos_hist(yoann_cfg_202006, combined_exprs, colname = "high", : object 'yoann_cfg_202006' not found
202006 <- circos_tile(yoann_cfg_202006, yoann_circos_202006, colname="lindsey_call",
lindsey_tile_colors=lindsey_colors, basename="summary_tile", thickness=60,
stroke_thickness=0.001,
outer=cjb111_high_rpkm_202006, width=0.05)
## Error in circos_tile(yoann_cfg_202006, yoann_circos_202006, colname = "lindsey_call", : object 'yoann_cfg_202006' not found
202006 <- circos_tile(yoann_cfg_202006, ess_circos, colname="control_call",
yoann_control_tile_colors=colors, basename="control_tile", thickness=60,
stroke_thickness=0.001,
outer=lindsey_tile_202006, width=0.05)
## Error in circos_tile(yoann_cfg_202006, ess_circos, colname = "control_call", : object 'yoann_cfg_202006' not found
202006 <- circos_tile(yoann_cfg_202006, ess_circos, colname="low_call",
yoann_low_tile_colors=colors, basename="low_tile",
thickness=60, stroke_thickness=0.001,
outer=yoann_control_tile_202006, width=0.05)
## Error in circos_tile(yoann_cfg_202006, ess_circos, colname = "low_call", : object 'yoann_cfg_202006' not found
202006 <- circos_tile(yoann_cfg_202006, ess_circos, colname="high_call",
yoann_high_tile_colors=colors, basename="high_tile",
thickness=60, stroke_thickness=0.001,
outer=yoann_low_tile_202006, width=0.05)
## Error in circos_tile(yoann_cfg_202006, ess_circos, colname = "high_call", : object 'yoann_cfg_202006' not found
202006 <- circos_tile(yoann_cfg_202006, yoann_circos_202006, colname="Final",
yoann_final_tile_colors=colors, basename="final_tile",
thickness=60, stroke_thickness=0.001,
outer=yoann_high_tile_202006, width=0.05)
## Error in circos_tile(yoann_cfg_202006, yoann_circos_202006, colname = "Final", : object 'yoann_cfg_202006' not found
202006 <- circos_suffix(yoann_cfg_202006) yoann_suffix_
## Error in circos_suffix(yoann_cfg_202006): object 'yoann_cfg_202006' not found
circos_make(yoann_cfg_202006, target="cjb111_yoann_202006") made <-
## Error in circos_make(yoann_cfg_202006, target = "cjb111_yoann_202006"): object 'yoann_cfg_202006' not found
Here is this morning’s email:
For the information we want to display. - rings 1 and 2, from the outside: the genes by COG, which I think is already what you have there. - ring 3: the mutation saturation, how many Krmit insertions in the initial library in THY, which again I think is what you have. - ring 4: Bayesian essentiality data for the THY medium (this is column BE in the crazy table I sent you this morning). - ring 5: Bayesian essentiality data for the mRPMI medium (this is column BL in the crazy table). - ring 6: Bayesian essentiality data for the mRPMI medium + low Calprotectin (this is column BS in the crazy table). - ring 7: Bayesian essentiality data for the mRPMI medium + high Calprotectin (this is column BZ in the crazy table). - I was wondering if you could include a little space here (maybe it’s too much, don’t spend too much time on that).
Since all the stuff is apparently in the table Yoann called ‘crazy table’, I exported those columns into a csv with that name…
read.csv("from_yoann/crazy_table.csv") crazy_table <-
## Warning in file(file, "rt"): cannot open file 'from_yoann/crazy_table.csv': No
## such file or directory
## Error in file(file, "rt"): cannot open the connection
rownames(crazy_table) <- crazy_table[["row.names"]]
## Error in eval(expr, envir, enclos): object 'crazy_table' not found
"row.names"]] <- NULL crazy_table[[
## Error in crazy_table[["row.names"]] <- NULL: object 'crazy_table' not found
circos_prefix(cjb111_annot, name="cjb111_v4") cfgv4 <-
## This assumes you have a colors.conf in circos/colors/ and fonts.conf in circos/fonts/
## It also assumes you have conf/ideogram.conf, conf/ticks.conf, and conf/housekeeping.conf
## It will write circos/conf/cjb111_v4.conf with a reasonable first approximation config file.
## Error in circos_prefix(cjb111_annot, name = "cjb111_v4"): object 'cjb111_annot' not found
circos_karyotype(cfgv4, fasta="reference/sagalactiae_cjb111.fasta") karyv4 <-
## Error in circos_karyotype(cfgv4, fasta = "reference/sagalactiae_cjb111.fasta"): object 'cfgv4' not found
circos_plus_minus(cfgv4, width=0.05, thickness=40) ring12v4 <-
## Error in message("Writing data file: ", cfg[["plus_data_file"]], " with the + strand GO data."): object 'cfgv4' not found
circos_hist(cfgv4, combined_exprs, colname="control",
ring3v4 <-basename="control_rpkmv4", outer=ring12v4,
fill_color="vvdpblue", width=0.05)
## Error in circos_hist(cfgv4, combined_exprs, colname = "control", basename = "control_rpkmv4", : object 'cfgv4' not found
circos_tile(cfgv4, crazy_table, colname="previouscall",
ring4v4 <-colors=lindsey_colors, basename="previousv4", outer=ring3v4,
thickness=60, stroke_thickness=0.001, width=0.05)
## Error in circos_tile(cfgv4, crazy_table, colname = "previouscall", colors = lindsey_colors, : object 'cfgv4' not found
circos_tile(cfgv4, crazy_table, colname="controlcall",
ring5v4 <-colors=lindsey_colors, basename="controlv4", outer=ring4v4,
thickness=60, stroke_thickness=0.001, width=0.05)
## Error in circos_tile(cfgv4, crazy_table, colname = "controlcall", colors = lindsey_colors, : object 'cfgv4' not found
circos_tile(cfgv4, crazy_table, colname="lowcall",
ring6v4 <-colors=lindsey_colors, basename="lowv4", outer=ring5v4,
thickness=60, stroke_thickness=0.001, width=0.05)
## Error in circos_tile(cfgv4, crazy_table, colname = "lowcall", colors = lindsey_colors, : object 'cfgv4' not found
circos_tile(cfgv4, crazy_table, colname="highcall",
ring7v4 <-colors=lindsey_colors, basename="highv4", outer=ring6v4,
thickness=60, stroke_thickness=0.001, width=0.05)
## Error in circos_tile(cfgv4, crazy_table, colname = "highcall", colors = lindsey_colors, : object 'cfgv4' not found
circos_suffix(cfgv4) suffixv4 <-
## Error in circos_suffix(cfgv4): object 'cfgv4' not found
circos_make(cfgv4, target="cjb111_v4") made <-
## Error in circos_make(cfgv4, target = "cjb111_v4"): object 'cfgv4' not found
Here is today’s email:
“For the Bayesian representations, I was hoping we could display a total of 5 circles, four representing the data obtained for the four different conditions (i.e., THY -column BE-; RPMI -column BL-; RPMI+lowCal -column BS- and RPMI+highCal -column BZ-): for these 4 circles the non-essential genes would be shown in gree. Then, there would be one last circle, that is a summary of the results previously mentioned: this circle would integrate the data from column CI (also called Lindsey Call), and for this circle, I want the non-essential genes represented in yellow, so that we can see that this is a little different than the 4 other circles previously mentioned.”
If I read this correctly, the only thing I did wrong was to get some of the colors wrong?
c("e31212", "12e312", "444444", "0909AA", "090909")
main_colors <-names(main_colors) <- c("E", "NE", "S", "U", "NC")
c("e31212", "f0c505", "444444", "0909AA", "090909")
summary_colors <-names(summary_colors) <- c("E", "NE", "S", "U", "NC")
circos_prefix(cjb111_annot, name="cjb111_v5") cfgv5 <-
## This assumes you have a colors.conf in circos/colors/ and fonts.conf in circos/fonts/
## It also assumes you have conf/ideogram.conf, conf/ticks.conf, and conf/housekeeping.conf
## It will write circos/conf/cjb111_v5.conf with a reasonable first approximation config file.
## Error in circos_prefix(cjb111_annot, name = "cjb111_v5"): object 'cjb111_annot' not found
circos_karyotype(cfgv5, fasta="reference/sagalactiae_cjb111.fasta") karyv5 <-
## Error in circos_karyotype(cfgv5, fasta = "reference/sagalactiae_cjb111.fasta"): object 'cfgv5' not found
circos_plus_minus(cfgv5, width=0.07, thickness=40) ring12v5 <-
## Error in message("Writing data file: ", cfg[["plus_data_file"]], " with the + strand GO data."): object 'cfgv5' not found
circos_hist(cfgv5, combined_exprs, colname="control",
ring3v5 <-basename="control_rpkmv5", outer=ring12v5,
fill_color="vvdpblue", width=0.07)
## Error in circos_hist(cfgv5, combined_exprs, colname = "control", basename = "control_rpkmv5", : object 'cfgv5' not found
circos_tile(cfgv5, crazy_table, colname="previouscall",
ring4v5 <-colors=main_colors, basename="previousv5", outer=ring3v5,
thickness=70, stroke_thickness=0.001, width=0.07)
## Error in circos_tile(cfgv5, crazy_table, colname = "previouscall", colors = main_colors, : object 'cfgv5' not found
circos_tile(cfgv5, crazy_table, colname="controlcall",
ring5v5 <-colors=main_colors, basename="controlv5", outer=ring4v5,
thickness=70, stroke_thickness=0.001, width=0.07)
## Error in circos_tile(cfgv5, crazy_table, colname = "controlcall", colors = main_colors, : object 'cfgv5' not found
circos_tile(cfgv5, crazy_table, colname="lowcall",
ring6v5 <-colors=main_colors, basename="lowv5", outer=ring5v5,
thickness=70, stroke_thickness=0.001, width=0.07)
## Error in circos_tile(cfgv5, crazy_table, colname = "lowcall", colors = main_colors, : object 'cfgv5' not found
circos_tile(cfgv5, crazy_table, colname="highcall",
ring7v5 <-colors=main_colors, basename="highv5", outer=ring6v5,
thickness=70, stroke_thickness=0.001, width=0.07)
## Error in circos_tile(cfgv5, crazy_table, colname = "highcall", colors = main_colors, : object 'cfgv5' not found
circos_tile(cfgv5, crazy_table, colname="Final",
ring8v5 <-colors=summary_colors, basename="finalv5", outer=ring7v5,
thickness=70, stroke_thickness=0.001, width=0.07)
## Error in circos_tile(cfgv5, crazy_table, colname = "Final", colors = summary_colors, : object 'cfgv5' not found
circos_suffix(cfgv5) suffixv5 <-
## Error in circos_suffix(cfgv5): object 'cfgv5' not found
circos_make(cfgv5, target="cjb111_v5") made <-
## Error in circos_make(cfgv5, target = "cjb111_v5"): object 'cfgv5' not found
create_expt(metadata="sample_sheets/sagalactiae_combined_with_previous_samples.xlsx",
cjb111_prev <-batch=FALSE, gene_info=cjb111_annot, file_column="file")
## Reading the sample metadata.
## Error in read.xlsx.default(xlsxFile = file, sheet = 1) :
## File does not exist.
## Error in read_metadata(meta_file, ...): Unable to read the metadata file: sample_sheets/sagalactiae_combined_with_previous_samples.xlsx
tnseq_saturation(
saturation_control <-"preprocessing/combined_control/outputs/essentiality_sagalactiae_cjb111/trimmed_ca-v1m1.wig")
## Warning in file(file, "rt"): cannot open file 'preprocessing/combined_control/
## outputs/essentiality_sagalactiae_cjb111/trimmed_ca-v1m1.wig': No such file or
## directory
## Error in file(file, "rt"): cannot open the connection
$plot saturation_control
## Error in eval(expr, envir, enclos): object 'saturation_control' not found
plot_essentiality(
control_plts <-"preprocessing/combined_control/outputs/essentiality_sagalactiae_cjb111/mh_ess-trimmed_ca-v1m1_gene_tas_m2.csv")
## Error: 'preprocessing/combined_control/outputs/essentiality_sagalactiae_cjb111/mh_ess-trimmed_ca-v1m1_gene_tas_m2.csv' does not exist in current working directory ('/mnt/sshfs/cbcbsub01/fs/cbcb-lab/nelsayed/scratch/atb/tnseq/sagalacticae_2020').
"zbar"]] control_plts[[
## Error in eval(expr, envir, enclos): object 'control_plts' not found
tnseq_saturation(
saturation_low <-"preprocessing/combined_low/outputs/essentiality_sagalactiae_cjb111/trimmed_ca-v1m1.wig")
## Warning in file(file, "rt"): cannot open file 'preprocessing/combined_low/
## outputs/essentiality_sagalactiae_cjb111/trimmed_ca-v1m1.wig': No such file or
## directory
## Error in file(file, "rt"): cannot open the connection
$plot saturation_control
## Error in eval(expr, envir, enclos): object 'saturation_control' not found
plot_essentiality(
low_plts <-"preprocessing/combined_low/outputs/essentiality_sagalactiae_cjb111/mh_ess-trimmed_ca-v1m1_gene_tas_m2.csv")
## Error: 'preprocessing/combined_low/outputs/essentiality_sagalactiae_cjb111/mh_ess-trimmed_ca-v1m1_gene_tas_m2.csv' does not exist in current working directory ('/mnt/sshfs/cbcbsub01/fs/cbcb-lab/nelsayed/scratch/atb/tnseq/sagalacticae_2020').
"zbar"]] low_plts[[
## Error in eval(expr, envir, enclos): object 'low_plts' not found
tnseq_saturation(
saturation_high <-"preprocessing/combined_high/outputs/essentiality_sagalactiae_cjb111/trimmed_ca-v1m1.wig")
## Warning in file(file, "rt"): cannot open file 'preprocessing/combined_high/
## outputs/essentiality_sagalactiae_cjb111/trimmed_ca-v1m1.wig': No such file or
## directory
## Error in file(file, "rt"): cannot open the connection
$plot saturation_control
## Error in eval(expr, envir, enclos): object 'saturation_control' not found
plot_essentiality(
high_plts <-"preprocessing/combined_high/outputs/essentiality_sagalactiae_cjb111/mh_ess-trimmed_ca-v1m1_gene_tas_m2.csv")
## Error: 'preprocessing/combined_high/outputs/essentiality_sagalactiae_cjb111/mh_ess-trimmed_ca-v1m1_gene_tas_m2.csv' does not exist in current working directory ('/mnt/sshfs/cbcbsub01/fs/cbcb-lab/nelsayed/scratch/atb/tnseq/sagalacticae_2020').
"zbar"]] high_plts[[
## Error in eval(expr, envir, enclos): object 'high_plts' not found
tnseq_saturation(
saturation_prev <-"preprocessing/combined_previous/outputs/essentiality_sagalactiae_cjb111/combined_ca_ta-v0M1.wig")
## Warning in file(file, "rt"): cannot open file 'preprocessing/combined_previous/
## outputs/essentiality_sagalactiae_cjb111/combined_ca_ta-v0M1.wig': No such file
## or directory
## Error in file(file, "rt"): cannot open the connection
$plot saturation_control
## Error in eval(expr, envir, enclos): object 'saturation_control' not found
plot_essentiality(
high_plts <-"preprocessing/combined_previous/outputs/essentiality_sagalactiae_cjb111/mh_ess-combined_ca_ta-v0M1_gene_tas_m2.csv")
## Error: 'preprocessing/combined_previous/outputs/essentiality_sagalactiae_cjb111/mh_ess-combined_ca_ta-v0M1_gene_tas_m2.csv' does not exist in current working directory ('/mnt/sshfs/cbcbsub01/fs/cbcb-lab/nelsayed/scratch/atb/tnseq/sagalacticae_2020').
"zbar"]] high_plts[[
## Error in eval(expr, envir, enclos): object 'high_plts' not found
tnseq_multi_saturation(meta=pData(cjb111_prev), meta_column="cjb111esswig") plt <-
## Error in h(simpleError(msg, call)): error in evaluating the argument 'object' in selecting a method for function 'pData': object 'cjb111_prev' not found
$plot plt
## Error in eval(expr, envir, enclos): object 'plt' not found
$ggstats plt
## Error in eval(expr, envir, enclos): object 'plt' not found
::pander(sessionInfo()) pander
R version 4.0.3 (2020-10-10)
Platform: x86_64-pc-linux-gnu (64-bit)
locale: LC_CTYPE=en_US.UTF-8, LC_NUMERIC=C, LC_TIME=en_US.UTF-8, LC_COLLATE=en_US.UTF-8, LC_MONETARY=en_US.UTF-8, LC_MESSAGES=en_US.UTF-8, LC_PAPER=en_US.UTF-8, LC_NAME=C, LC_ADDRESS=C, LC_TELEPHONE=C, LC_MEASUREMENT=en_US.UTF-8 and LC_IDENTIFICATION=C
attached base packages: splines, parallel, stats, graphics, grDevices, utils, datasets, methods and base
other attached packages: ruv(v.0.9.7.1), lme4(v.1.1-26), Matrix(v.1.3-0), BiocParallel(v.1.24.1), variancePartition(v.1.20.0), hpgltools(v.1.0), testthat(v.3.0.1), R6(v.2.5.0), Biobase(v.2.50.0) and BiocGenerics(v.0.36.0)
loaded via a namespace (and not attached): R.utils(v.2.10.1), tidyselect(v.1.1.0), RSQLite(v.2.2.3), AnnotationDbi(v.1.52.0), grid(v.4.0.3), Rtsne(v.0.15), IHW(v.1.18.0), devtools(v.2.3.2), scatterpie(v.0.1.5), munsell(v.0.5.0), preprocessCore(v.1.52.0), codetools(v.0.2-18), statmod(v.1.4.35), withr(v.2.4.1), colorspace(v.2.0-0), GOSemSim(v.2.16.1), knitr(v.1.30), rstudioapi(v.0.13), stats4(v.4.0.3), Vennerable(v.3.1.0.9000), robustbase(v.0.93-6), DOSE(v.3.16.0), labeling(v.0.4.2), MatrixGenerics(v.1.2.0), slam(v.0.1-48), lpsymphony(v.1.18.0), GenomeInfoDbData(v.1.2.4), polyclip(v.1.10-0), bit64(v.4.0.5), farver(v.2.0.3), rprojroot(v.2.0.2), downloader(v.0.4), vctrs(v.0.3.6), generics(v.0.1.0), xfun(v.0.19), BiocFileCache(v.1.14.0), fastcluster(v.1.1.25), doParallel(v.1.0.16), GenomeInfoDb(v.1.26.2), graphlayouts(v.0.7.1), locfit(v.1.5-9.4), bitops(v.1.0-6), cachem(v.1.0.1), fgsea(v.1.16.0), DelayedArray(v.0.16.1), assertthat(v.0.2.1), scales(v.1.1.1), ggraph(v.2.0.4), enrichplot(v.1.10.1), gtable(v.0.3.0), sva(v.3.38.0), processx(v.3.4.5), tidygraph(v.1.2.0), rlang(v.0.4.10), genefilter(v.1.72.0), rtracklayer(v.1.50.0), selectr(v.0.4-2), broom(v.0.7.3), BiocManager(v.1.30.10), yaml(v.2.2.1), reshape2(v.1.4.4), GenomicFeatures(v.1.42.1), backports(v.1.2.1), qvalue(v.2.22.0), RBGL(v.1.66.0), clusterProfiler(v.3.18.0), tools(v.4.0.3), usethis(v.1.6.3), ggplot2(v.3.3.3), ellipsis(v.0.3.1), gplots(v.3.1.1), RColorBrewer(v.1.1-2), sessioninfo(v.1.1.1), Rcpp(v.1.0.6), plyr(v.1.8.6), progress(v.1.2.2), zlibbioc(v.1.36.0), purrr(v.0.3.4), RCurl(v.1.98-1.2), ps(v.1.5.0), prettyunits(v.1.1.1), openssl(v.1.4.3), viridis(v.0.5.1), cowplot(v.1.1.0), S4Vectors(v.0.28.1), SummarizedExperiment(v.1.20.0), ggrepel(v.0.9.0), colorRamps(v.2.3), fs(v.1.5.0), magrittr(v.2.0.1), data.table(v.1.13.6), DO.db(v.2.9), openxlsx(v.4.2.3), matrixStats(v.0.57.0), pkgload(v.1.1.0), hms(v.1.0.0), evaluate(v.0.14), xtable(v.1.8-4), pbkrtest(v.0.5-0.1), XML(v.3.99-0.5), IRanges(v.2.24.1), gridExtra(v.2.3), compiler(v.4.0.3), biomaRt(v.2.46.2), tibble(v.3.0.5), KernSmooth(v.2.23-18), crayon(v.1.3.4), shadowtext(v.0.0.7), R.oo(v.1.24.0), minqa(v.1.2.4), htmltools(v.0.5.1.1), mgcv(v.1.8-33), corpcor(v.1.6.9), geneplotter(v.1.68.0), tidyr(v.1.1.2), DBI(v.1.1.1), tweenr(v.1.0.1), dbplyr(v.2.0.0), MASS(v.7.3-53), rappdirs(v.0.3.2), boot(v.1.3-25), readr(v.1.4.0), cli(v.2.2.0), R.methodsS3(v.1.8.1), quadprog(v.1.5-8), igraph(v.1.2.6), GenomicRanges(v.1.42.0), pkgconfig(v.2.0.3), rvcheck(v.0.1.8), GenomicAlignments(v.1.26.0), xml2(v.1.3.2), foreach(v.1.5.1), annotate(v.1.68.0), XVector(v.0.30.0), rvest(v.0.3.6), stringr(v.1.4.0), callr(v.3.5.1), digest(v.0.6.27), graph(v.1.68.0), Biostrings(v.2.58.0), rmarkdown(v.2.6), fastmatch(v.1.1-0), edgeR(v.3.32.0), PROPER(v.1.22.0), directlabels(v.2020.6.17), curl(v.4.3), Rsamtools(v.2.6.0), gtools(v.3.8.2), nloptr(v.1.2.2.2), lifecycle(v.0.2.0), nlme(v.3.1-151), desc(v.1.2.0), viridisLite(v.0.3.0), askpass(v.1.1), limma(v.3.46.0), fansi(v.0.4.2), pillar(v.1.4.7), lattice(v.0.20-41), DEoptimR(v.1.0-8), fastmap(v.1.1.0), httr(v.1.4.2), pkgbuild(v.1.2.0), survival(v.3.2-7), GO.db(v.3.12.1), glue(v.1.4.2), remotes(v.2.2.0), fdrtool(v.1.2.15), zip(v.2.1.1), iterators(v.1.0.13), pander(v.0.6.3), bit(v.4.0.4), ggforce(v.0.3.2), stringi(v.1.5.3), blob(v.1.2.1), DESeq2(v.1.30.0), caTools(v.1.18.0), memoise(v.2.0.0) and dplyr(v.1.0.3)
message(paste0("This is hpgltools commit: ", get_git_commit()))
## If you wish to reproduce this exact build of hpgltools, invoke the following:
## > git clone http://github.com/abelew/hpgltools.git
## > git reset 052640a0b091e9a740e487957e087f265d0c74b5
## This is hpgltools commit: Thu Dec 3 13:42:02 2020 -0500: 052640a0b091e9a740e487957e087f265d0c74b5
paste0(gsub(pattern="\\.Rmd", replace="", x=rmd_file), "-v", ver, ".rda.xz")
this_save <-message(paste0("Saving to ", this_save))
## Saving to index_202011-v202011.rda.xz
sm(saveme(filename=this_save)) tmp <-
loadme(filename=this_save)