MathGroup Archive 2001

[Date Index] [Thread Index] [Author Index]

Search the Archive

pde's

  • To: mathgroup at smc.vnet.net
  • Subject: [mg28103] pde's
  • From: sahni mayank <sahnimayank at yahoo.com>
  • Date: Fri, 30 Mar 2001 04:13:02 -0500 (EST)
  • Sender: owner-wri-mathgroup at wolfram.com

hi all
i'm new to mathematica and have written the foll
program but unfortunately it gives me a host of
errors.please tell me whats wrong.
thanks.
m.s.


Da = 0.1
Le = 1
g = 20
ord = 1
q = 0
x = 0
sol1 = DSolve[{
      n = (3*phi*Coth[3*phi] - 1)/(3*phi^2),
      
      phi = Sqrt[Exp[q_s/(1 + q_s/g)]],
      
      D[F[q_s, phi, B], q_s] + (q_s -
q)*(1/n)*D[n[q_s, phi, B], q_s] = 
        1 - (q_s -q)*{1/((1 + q_s/g)^2) -
{(ord*Le/B)/(1 -x - (Le/B)*(q_s - q))}},
      
      D[F[q_s, phi, B],B] = -(q_s - q)*(1/B +
(1/n)*(D[n[q_s, phi, B],B]) - {(ord*Le*(q_s -
q)/B^2)/(1 -x - (Le/B)*(q_s - q))}),
      
      D[n[q_s, phi, B],phi] = {(9*phi^2 + 2 -
3*phi*Coth[3*phi][1 + 3*p*Coth[3*phi]])/(3*
                phi^3)},
      
      D[n[q_s, phi, B], q_s] = 
        D[n[q_s, phi, B],phi]*(phi/2)*{1/((1 +
q_s/g)^2) - {((ord - 1)*Le/B)/(1 -x - (Le/B)*(q_s -
q))}},
      
      D[n[q_s, phi, B], B] = 0,
      
      F[q_s] = (q_s - q) - (B*Da/Le)*Exp[q_s/(1 +
q_s/g)]*(1 - x - (Le/B)*(q_s - q))*n = 0,
      
      S = -{(B/q_s)*(D[F[q_s, phi, B], B]/D[F[q_s,
phi, B], q_s])},}]
 Plot[Evaluate[{S} /. sol1, {q_s} /. sol1], {B}]



__________________________________________________
Do You Yahoo!?
Get email at your own domain with Yahoo! Mail. 
http://personal.mail.yahoo.com/?.refer=text


  • Follow-Ups:
    • Re: pde's
      • From: Tomas Garza <tgarza01@prodigy.net.mx>
  • Prev by Date: RE: Problem to evaluate cube root of a negative cube nember where a real value is expected
  • Next by Date: Re: Problem to evaluate cube root of a negative cube nember where a real value is expected
  • Previous by thread: RE: Plotting a function of x and y
  • Next by thread: Re: pde's