Hi every one
I'm having some troubles with the InverseFunction operator and I don't understand where it comes from. Here's my problem:
I solved the heat equation with a cylindrical laplacien and I considered that the temperature only depends on the radius. Then, I'm looking for solutions with the form: T(r)*exp(iwt). I'm also fixing the temperature on the border: for r=rmin we got T=dT (dT is a constant equal to 1) and for r=rmax we got T=0.
Thus the heat equation becomes:
Ks = 148;
Cs = 711;
rhos = 2338;
d = N[Ks/(rhos*Cs)]; "diffusion coefficient";
rmin = 50*10^(-6);
rmax = 500*10^(-6);
dT=1;
sol = DSolve[{d T''[r] + ( d/r) T'[r] == I w T[r], T[rmin] == dT, T[rmax] == 0}, T[r], {r, rmin, rmax}];
f = 1000;
w = 2*Pi*f;
Tiso[r_] = Abs[T[r] ] /. First[sol]
So at this point I solved the heat diffusion equation for the frequency f=1000Hz and the modul of the solution is the function Tiso. Then I'd like to inverse Tiso in order to get the radius for an isotherm. I plotted Tiso, so I know the values are between 0 and 1 for r between rmin and rmax:
Plot[Tiso[r], {r, rmin, rmax}]
For exemple, let's say I want to tknow the value of the radius where Tiso = 0.5
So I need to inverse Tiso So I wrote:
InverseFunction[Tiso][0.5]
But I can't get the numerical value, even when I write:
N[InverseFunction[Tiso][0.5]]
At first I thought I had issues because my solution is a combinaison of different Bessel Function. Yet, I tried to invert a Bessel function and I had no problem to get the numerical value:
z =. ..;
g[z_] = BesselJ[0, z]
inve = InverseFunction[g]
inve[0.5]
Does anyone has an idea of how I can return the numerical value of my InverseFunction[Tiso][0.5] ?
Cheers, Olivier