Thank you, Frank, for the suggestion but I couldn't understand exactly what you suggested.
Actually, the difficulty that I think is that the function H[t] which I want to obtain is in the symbolic integration and is even a function of time. Even I am not sure if NSolve is a right command in this case. I have fully tried to search for any leads in archives, but I couldn't find a similar situation to this. Could you help me, please? Any information would be very appreciated.
Here is the code which I corrected some typos and unit dimensions.
Remove["Global`*"];
\[Lambda] = 800000.0;
A1 = 0.6; A2 = -1.8;
n = 2.48; k = 4.38 ;
\[Xi] = \[Lambda]/(4 \[Pi] k);
\[Chi] = \[Lambda]/(4 \[Pi] n);
v = 5894;
P1 = 0.5; P2 = 0.5;
G[t_] = -6 10^-4 (Cos[0.25 t] - 0.209611) Exp[-(t/10)^2];
W[t_] = D[G[t], t]
Plot[W[t], {t, -100, 100}, PlotRange -> All]
F[t_] = v ((P1/\[Chi] - P2/\[Xi]) Cos[
v/\[Chi] t] - (P2/\[Chi] + P1/\[Xi]) Sin[
v/\[Chi] Abs[t]]) Exp[-Abs[t] v/\[Xi]];
Intg[q_?NumericQ, H_?NumericQ] :=
NIntegrate[
F[T - q] H[T], {T, -Infinity,
Infinity}]; (* H is unknown function *)
Sol = NSolve[
8 \[Pi] v (2 P2 H[t] + Intg[q, H]) - 10^12 \[Lambda] W[t] == 0,
H][[1]];
Plot[H[t] /. Sol, {t, -30, 30}, PlotStyle -> {Blue}, PlotRange -> All]