library(astroxo)
library(ggplot2)
Read filter data
V <- read.csv("Schuler V Filter.csv", col.names=c("wavelength","t","X"))[,1:2]
Plot transmission curves
ggplot(V) +
geom_line(aes(x=V$wavelength, y=V$t), color="darkgreen") +
geom_rect(data=photopic.vision.range, aes(xmin=xmin, xmax=xmax, ymin=0, ymax=100), alpha=0.1) +
labs(title="Schuler V Filter", x="Wavelength [nm]", y="Transmission [%]") +
coord_cartesian(xlim=c(300, 850), ylim=c(0.0,100.0)) +
theme_bw()
Parameter for Schuler V Filter
filter.parameters(V$wavelength, V$t)
## $center
## [1] 538.4
##
## $fwhm
## [1] 95.5
##
## $peak
## [1] 82.47144