Message Boards Message Boards

Validating analytical solution of an equation

Posted 13 days ago

I was going through an article. I have the following functions,

f[r_] := 1 - (2*M*r^2)/(r^3 + g^3) + (8/3)*Pi*P*r^2
v[r_] := f[r]/r^2

Now I want to solve v'[r]==0 for r. Clearly This cannot be solved analytically. But there they solved it somehow and got the following result.

r = g^3/(2*r^2) + r/2 + (4/3)*(g^3 + r^3)*P*Pi + ((3 + 8*Pi*r^2)^2*(g^3 + r^3)^2)/(36*r^4*\[Xi]^(1/3)) + \[Xi]^(1/3)

Where,

\[Xi] = ((3 + 8*Pi*r^2)^3*(g^3 + r^3)^3)/(216*r^6) + Sqrt[g^6 - (g^3*(3 + 8*Pi*r^2)^3*(g^3 + r^3)^3)/(108*r^6)] - g^3

Can anyone tell me how can it be solved in Wolfram Language or what method did they use?
Thanks in advance.

POSTED BY: Debojyoti Mondal

Mathematica can solve the equation Solve[v'[r] == 0, r] analytically in terms of Root objects, as it is an algebraic equation of degree 6.

I would not call r = g^3/(2*r^2)... a "result", it is another equation with respect to r. I tried giving simple numerical values to the parameters, solving the two equations and comparing the results:

Block[{g = 1, M = 1},
 Solve[v'[r] == 0, r, Reals]]
Block[{g = 1, M = 1},
 \[Xi] = ((3 + 8*Pi*r^2)^3*(g^3 + r^3)^3)/(216*r^6) + 
   Sqrt[g^6 - (g^3*(3 + 8*Pi*r^2)^3*(g^3 + r^3)^3)/(108*r^6)] - g^3;
 NSolve[r == 
   g^3/(2*r^2) + 
    r/2 + (4/3)*(g^3 + r^3)*P*
     Pi + ((3 + 8*Pi*r^2)^2*(g^3 + r^3)^2)/(36*
       r^4*\[Xi]^(1/3)) + \[Xi]^(1/3),
  r, Reals]]
POSTED BY: Gianluca Gorni
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