Saturday, March 2, 2019

FRBs: DM and width Density Plots

Chart 1 : FRBDM sorted ascending.
Chart 2 :Density plots for all DM and DM <= 1300
Chart 3: Density by group for DM
Chart 4: Density by group for width < 25
Chart 5: Density by group for width > 25

Source Paper: http://adsabs.harvard.edu/abs/2016PASA...33...45P
(For further citation information see below.)
data source : http://www.frbcat.org/ using 08.20.2019 data

Click to enlarge charts.




       Plot from http://www.frbcat.org DMs from 08.20.2019

Density by all FRBs (left)  and DM <= 1300 (right) .
Note that for the density charts below, telescopes with less than two data points are excluded. Click to enlarge the charts.

Density by group for all DM

 Density by group for width < 25

Density by group for width > 25

Code

This is a mix of base R, rdata.table and ggplot2 plotting code.

library(data.table)
library(ggplot2)

# From http://www.frbcat.org/
setwd("D:\\Math\\Math\\FRB")
frb.DM <- fread("frbcat_date.csv")[,.SD[,.(DM=gsub(paste0("&plusmn","\\S+"),"",rmp_dm,perl=TRUE))],.(frb_name,telescope,rmp_dm,rmp_width)]

# Plot http://www.frbcat.org/ DMs from 08.20.2019
dev.new()
frb.DM[,plot(sort(as.numeric(DM)),cex=2.25,ylab="FRB DM",ylim=c(0,3000))]
par(new=TRUE)
frb.DM[,plot(smooth(sort(as.numeric(sort(DM)))),lwd=2.25,pch=19,cex=2.25,ylab="FRB DM",ylim=c(0,3000),type="l",col="red")]

abline(h=500)
abline(h=1000)
abline(h=1500)
abline(h=2000)
abline(h=2500)
abline(h=2750)
abline(h=3000)

abline(v=seq(1,nrow(frb.DM),1),col=rgb(.25,.25,.25,.5))
frb.DM.sort <- frb.DM[,.(frb_name,DM=as.numeric(DM))][order(DM)]
frb.DM.sort[,Axis(side=3, at = 1:nrow(.SD), las=2,labels = frb_name,line=-5,cex.axis=.85)]
par(new=FALSE)

# Density by all FRBs and DM <= 1300
dev.new()
par(mfrow=c(1,2))
frb.DM[,plot(density(as.numeric(DM)))]
frb.DM[as.numeric(DM) <= 1300,plot(density(as.numeric(DM)))]
par(mfrow=c(1,1))

# Density by group for DM
dev.new()
group  <- frb.DM[,.N,.(telescope)][N > 2,][order(-N)]$telescope
df <- as.data.frame(frb.DM[telescope %in% group,][,.(DM=round(as.numeric(DM)),telescope)])
p <-ggplot(df, aes(x=DM, fill=telescope)) +
  geom_density(alpha=0.4)
p

# Density by group for width for width < 25
dev.new()
group  <- frb.DM[rmp_width < 25,.N,.(telescope)][N > 2,][order(-N)]$telescope
df <- as.data.frame(frb.DM[telescope %in% group][,.(width=as.numeric(rmp_width),telescope)])
p <-ggplot(df, aes(x=width, fill=telescope)) +
  geom_density(alpha=0.4)
p

# Density by group for width for width > 25
dev.new()
group  <- frb.DM[rmp_width > 25,.N,.(telescope)][N > 2,][order(-N)]$telescope
df <- as.data.frame(frb.DM[telescope %in% group][,.(width=as.numeric(rmp_width),telescope)])
p <- ggplot(df, aes(x=width, fill=telescope)) +
  geom_density(alpha=0.4)
p
# exit

Citation Information:

@ARTICLE{2016PASA...33...45P,
   author = {{Petroff}, E. and {Barr}, E.~D. and {Jameson}, A. and {Keane}, E.~F. and 
{Bailes}, M. and {Kramer}, M. and {Morello}, V. and {Tabbara}, D. and 
{van Straten}, W.},
    title = "{FRBCAT: The Fast Radio Burst Catalogue}",
  journal = {\pasa},
archivePrefix = "arXiv",
   eprint = {1601.03547},
 primaryClass = "astro-ph.HE",
 keywords = {catalogs, methods: data analysis, telescopes},
     year = 2016,
    month = sep,
   volume = 33,
      eid = {e045},
    pages = {e045},
      doi = {10.1017/pasa.2016.35},
   adsurl = {https://ui.adsabs.harvard.edu/abs/2016PASA...33...45P},
  adsnote = {Provided by the SAO/NASA Astrophysics Data System}
}


Title:
FRBCAT: The Fast Radio Burst Catalogue
Authors:
Petroff, E.; Barr, E. D.; Jameson, A.; Keane, E. F.; Bailes, M.; Kramer, M.; Morello, V.; Tabbara, D.; van Straten, W.
Affiliation:
AA(ASTRON, Netherlands Institute for Radio Astronomy, Postbus 2, 7990 AA Dwingeloo, The Netherlands; Swinburne University of Technology, Swinburne University of Technology, P.O. Box 218, Hawthorn, VIC 3122, Australia; CSIRO Astronomy & Space Science, Australia Telescope National Facility, P.O. Box 76, Epping, NSW 1710, Australia; ARC Centre of Excellence for All-sky Astrophysics (CAASTRO), Redfern, NSW 2016, Australia), AB(Swinburne University of Technology, Swinburne University of Technology, P.O. Box 218, Hawthorn, VIC 3122, Australia; ARC Centre of Excellence for All-sky Astrophysics (CAASTRO), Redfern, NSW 2016, Australia), AC(Swinburne University of Technology, Swinburne University of Technology, P.O. Box 218, Hawthorn, VIC 3122, Australia), AD(SKA Organisation, Jodrell Bank Observatory, Cheshire, SK11 9DL, UK; ARC Centre of Excellence for All-sky Astrophysics (CAASTRO), Redfern, NSW 2016, Australia; Swinburne University of Technology, Swinburne University of Technology, P.O. Box 218, Hawthorn, VIC 3122, Australia), AE(Swinburne University of Technology, Swinburne University of Technology, P.O. Box 218, Hawthorn, VIC 3122, Australia; ARC Centre of Excellence for All-sky Astrophysics (CAASTRO), Redfern, NSW 2016, Australia), AF(Max Planck Institut für Radioastronomie, Auf dem Hügel 69, D-53121 Bonn, Germany; Jodrell Bank Centre for Astrophysics, University of Manchester, Alan Turing Building, Oxford Road, Manchester M13 9PL, UK), AG(Swinburne University of Technology, Swinburne University of Technology, P.O. Box 218, Hawthorn, VIC 3122, Australia; ARC Centre of Excellence for All-sky Astrophysics (CAASTRO), Redfern, NSW 2016, Australia), AH(Swinburne University of Technology, Swinburne University of Technology, P.O. Box 218, Hawthorn, VIC 3122, Australia), AI(Swinburne University of Technology, Swinburne University of Technology, P.O. Box 218, Hawthorn, VIC 3122, Australia; ARC Centre of Excellence for All-sky Astrophysics (CAASTRO), Redfern, NSW 2016, Australia)
Publication:
Publications of the Astronomical Society of Australia, Volume 33, id.e045 7 pp. (PASA Homepage)
Publication Date:
09/2016
Origin:
CUP
Astronomy Keywords:
catalogs, methods: data analysis, telescopes
Abstract Copyright:
2016: Astronomical Society of Australia
DOI:
10.1017/pasa.2016.35
Bibliographic Code:

No comments:

Post a Comment