library(astroxo)
library(ggplot2)

Read filter data

CLS <- read.csv("Astronomik CLS Filter.csv", col.names=c("wavelength","t","X"))[,1:2]

Plot transmission curves

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

Filter parameter for Astronomic CLS

filter.parameters(CLS$wavelength, CLS$t, 500, 100)
## $center
## [1] 494.8
## 
## $fwhm
## [1] 85.59998
## 
## $peak
## [1] 95.80466