Hi. I'm trying to get a plot, but although I think I'm doing everything correctly, the final plot comes up empty.
The code I'm using is below. Can someone tell me what I'm doing wrong?
p.s. Sorry about how the code looks. Copying the text from Mathematica seems to put it in this form.
Subscript[n, i] = 1.0;
\[Delta] = (4*\[Pi])/\[Lambda]*n*d*Cos[Subscript[\[Theta], 3] Degree];
Subscript[\[Theta], i] =
ArcSin[n/Subscript[n, i]*Sin[Subscript[\[Theta], 3] Degree]];
Subscript[r, s] = (
Subscript[n, i]*Cos[Subscript[\[Theta], i] Degree] -
n*Cos[Subscript[\[Theta], 3] Degree])/(
Subscript[n, i]*Cos[Subscript[\[Theta], i] Degree] +
n*Cos[Subscript[\[Theta], 3] Degree]);
Subscript[r, p] = (
n*Cos[Subscript[\[Theta], i] Degree] -
Subscript[n, i]*Cos[Subscript[\[Theta], 3] Degree])/(
Subscript[n, i]*Cos[Subscript[\[Theta], i] Degree] +
n*Cos[Subscript[\[Theta], 3] Degree]);
Subscript[T, s] = (1 - Subscript[r, s])^2/1;
Subscript[R, s] = (4*Subscript[r, s] Sin[\[Delta]/2]^2)/1;
Subscript[T, p] = (1 - Subscript[r, p])^2/1;
Subscript[R, p] = (4*Subscript[r, p] Sin[(\[Delta]/2) Degree]^2)/1;
Manipulate[
Plot[{Subscript[T, s], Subscript[R, s]}, {Subscript[\[Theta],
3], -1, 1}, Frame -> True,
PlotStyle -> {{Thickness[0.004],
RGBColor[0, 0, 1]}, {Thickness[0.004], RGBColor[1, 0, 0]}},
PlotRange -> {{-1, 1}, {0, 1}},
PlotLegends -> {"T", "R"}], {{\[Lambda], 500*10^-9,
"wavelength \[Lambda]"}, 350*10^-9,
750*10^-9}, {{d, 5*10^-6,
"thickness d"}, (2*10^-6), (10*10^-6)}, {{n, 1.5,
"refractive index n"}, 1.33, 1.8}]