library(astroxo)
library(ggplot2)

Read filter data

data <- read.csv("Baader IR Blocking Filter.csv", col.names=c("wavelength","t","X"))[,1:2]

Plot transmission curves

ggplot(data) +
    geom_line(aes(x=wavelength, y=t)) +
    geom_rect(data=photopic.vision.range, aes(xmin=xmin, xmax=xmax, ymin=0, ymax=100), alpha=0.1) +
    labs(title="Baader IR Blocking Filter", x="Wavelength [nm]", y="Transmission [%]") + 
    coord_cartesian(xlim=c(300, 850), ylim=c(0.0,100.0)) +
    theme_bw()

Parameters for Baader IR Blocking Filter

filter.parameters(data$wavelength, data$t, 550, 200)
## $center
## [1] 541.1
## 
## $fwhm
## [1] 290
## 
## $peak
## [1] 99.00533