library(astroxo)
library(ggplot2)
Read filter data
R <- read.csv("Astronomik Red Filter.csv", col.names=c("wavelength","tr","X"))[,1:2]
G <- read.csv("Astronomik Green Filter.csv", col.names=c("wavelength","tg","X"))[,1:2]
B <- read.csv("Astronomik Blue Filter.csv", col.names=c("wavelength","tb","X"))[,1:2]
Merge data
RGB <- merge(R, G, by="wavelength")
RGB <- merge(RGB, B, by="wavelength")
Plot transmission curves
ggplot(RGB, aes(col=Filter)) +
geom_line(aes(x=RGB$wavelength, y=RGB$tr, col="01")) +
geom_line(aes(x=RGB$wavelength, y=RGB$tg, col="02")) +
geom_line(aes(x=RGB$wavelength, y=RGB$tb, col="03")) +
geom_rect(data=photopic.vision.range, aes(xmin=xmin, xmax=xmax, ymin=0, ymax=100, col=NULL), alpha=0.1) +
scale_colour_manual(values=c("red", "green", "blue"), labels=c("Red", "Green", "Blue")) +
labs(title="Astronomik Type 2 RGB Filter Set", x="Wavelength [nm]", y="Transmission [%]") +
coord_cartesian(xlim=c(300, 850), ylim=c(0.0,100.0)) +
theme_bw()
Filter parameter for Astronomic Type 2 Red
filter.parameters(R$wavelength, R$tr)
## $center
## [1] 623.65
##
## $fwhm
## [1] 88
##
## $peak
## [1] 97.3242
Filter parameter for Astronomic Type 2 Green
filter.parameters(G$wavelength, G$tg)
## $center
## [1] 538.65
##
## $fwhm
## [1] 96.60002
##
## $peak
## [1] 94.7415
Filter parameter for Astronomic Type 2 Blue
filter.parameters(B$wavelength, B$tb)
## $center
## [1] 440.05
##
## $fwhm
## [1] 115.6
##
## $peak
## [1] 96.66998