Dear Hans Dolhaine, you are right that I needed it at the beginning not to repeat the same code for different plots( dashed(p2) and thick(p3)) using an if loop(which can easily be applied on Matlab). But the if loop were not able to give me the plot I want(had the if loop were working p2 would have been enough to plot all and p3 was not needed). Thus I finally decided to ignore the join as Rohit suggested and plot thick and dashed lines on different codes as below. I honestly thank both of you for being a big help in my Mathematica coding. If possible, help me to keep p2 and p3 in a single code (i=1(j=1:4)thick lines and i=2(j=1:4) dashed lines) using if loop than being redundant and not to use the Show function. Here is the code for both to see and if possible improve.
Kind regards. (Thank you again!!)
s = 2.6*10^4;
d = 0.0026;
\[Beta] = 3 *10^(-7);
\[Delta] = {0.5, 5};
c = 5;
p = {5, 100};
\[Epsilon] = {0.00, 0.00};
\[Eta] = {0.80, 0.95, 0.99, 1};
\[Eta]a = {0.00, 1.00};
\[Epsilon]a = {0.80, 0.95, 0.99, 1};
(*Initial Conditions*)
t0 = {(c*\[Delta][[2]])/(p[[2]]*\[Beta]), (c*\[Delta][[1]])/(p[[
2]]*\[Beta])};
x0 = 2.0*10^(6); v0 = 4.0*10^7;
(* SDES for p=100, delta=0.5 for fig A*)
eqn1a[i_,
j_] := {T'[t] == s - d*T[t] - (1 - \[Eta]a[[i]])*\[Beta]*T[t]*V[t],
x'[t] == (1 - \[Eta]a[[i]])*\[Beta]*T[t]*V[t] - \[Delta][[1]]*x[t],
V'[t] == (1 - \[Epsilon]a[[j]])*p[[2]]*x[t] - c*V[t],
T[0] == t0[[2]], x[0] == x0, V[0] == v0}
soln11[eq_] := NDSolve[eq, {T, x, V}, {t, 0, 14}]
(* Solving the SDES *)
tt2 = Flatten[Table[eqn1a[i, j], {i, 2}, {j, 4}], 1];
sol2 = Flatten[soln11 /@ tt2];
solv2 = (V /. #)[t] & /@ Select[sol2, MemberQ[#, V] &];
p2 = Plot[Evaluate[Log10@Take[solv2, 4]], {t, 0, 14},
PlotRange -> {2.6, 8}, Frame -> True,
FrameLabel -> {Days , "Simulated Decrease Log10 HCV"},
PlotStyle -> Table[If[i <= 4, {Red, Thin}, {Blue, "--"}], {i, 8}]];
(*Plot B eta=0 *)
p3 = Plot[Evaluate[Log10@Take[solv2, -4]], {t, 0, 14},
PlotRange -> {2.6, 8}, Frame -> True,
FrameLabel -> {Days , "Simulated Decrease Log10 HCV"},
PlotStyle -> Table[If[i <= 4, {Blue, Dashed}], {i, 8}]];
(* Draw together*)
p41 = Show[p2, p3]