Message Boards Message Boards

Integrate a bessel function?

Posted 7 years ago

Hi

I am trying to solve this integral, but Mathematica but with no luck at all.

Integrate[(Exp[-(x + s^2)/(2*a^2)])*(BesselI[0, Sqrt[x]*s/a^2]), {x, 0, g}]

where g is a constant. Can this be solved?

Thanks in advance.

POSTED BY: Monir Hasan
4 Replies
Posted 7 years ago

thanks a lot guys for the help, this was useful

POSTED BY: Updating Name

Mathematica is evidently not able to do the integral analytically. You need some clever transformation of variables or just a resort to numerical integration (with g, a and s given numerical values).

POSTED BY: S M Blinder

Hi,

You might also look into the following reference:

\> Wolfram Functions: Bessel.

\>\> Product Integrals

\>\>\> Power Function

\>\>\> Exponential Function

A lot of integrals are already written down, usually in terms of a linear argument. I agree with Blinder, you may want to start by changing variables: $\sqrt{x}=y$.

Although, it's also useful to look at the series expansion:

Bessel Series Expansion

As it is an even function, the integrand should expand in whole powers of $x$. Then it's possible to integrate term by term,

Integrate[ Normal[Series[(Exp[-(x + s^2)/(2*a^2)])*(BesselI[0, 
      Sqrt[x]*s/a^2]), {x, 0, 10}]], {x, 0, g}]
N[% /. {a -> 1, s -> 2, g -> 3}]

term by term

Depending on the limit $g$, this is an okay method numerically. It also lends some insight in terms of symbols. The functional part has a reliable lexicographic ordering, so we just need to figure out sequence or sequences of denominators. It's useful to compare with OEIS, for example: A002866, and A187735 which appear correct to a factor for cases with $s^0$ and $s^2$ .

If you get stuck with transforms, it can help to calculate a few coefficients.

Brad

POSTED BY: Brad Klee

It is best to use NIntegrate in yours case.

f[a_?NumericQ, s_?NumericQ, g_?NumericQ] := 
NIntegrate[(Exp[-(x + s^2)/(2 a^2)]) (BesselI[0, Sqrt[x]*s/a^2]), {x,0, g}]

f[1., 2, 3]
(*0.580509*)

Analytical solution maybe not exist.

Integral represented by an infinite sum.

func = (Exp[-(x + s^2)/(2 a^2)]) (BesselI[0, Sqrt[x]*s/a^2])
sol = InverseZTransform[func /. x -> 1/x, x, n]
sol2 = Integrate[sol*x^n, {x, 0, g}, Assumptions -> n >= 0]
(*(2^-n a^(-2 n) E^(-(s^2/(2 a^2))) g^(1 + n) HypergeometricU[-n, 1, s^2/(2 a^2)])/((1 + n) Gamma[1 + n]^2)*)

enter image description here

Sum[sol2, {n, 0, 1000}] /. a -> 1 /. s -> 2 /. g -> 3 // N
(*0.580509*)
POSTED BY: Mariusz Iwaniuk
Reply to this discussion
Community posts can be styled and formatted using the Markdown syntax.
Reply Preview
Attachments
Remove
or Discard

Group Abstract Group Abstract