MathGroup Archive 2011

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

Search the Archive

Mathematica

  • To: mathgroup at smc.vnet.net
  • Subject: [mg121930] Mathematica
  • From: Rajnish <errajnish4ever at gmail.com>
  • Date: Fri, 7 Oct 2011 04:43:03 -0400 (EDT)
  • Delivered-to: l-mathgroup@mail-archive0.wolfram.com

I am getting getting errors when i evaluate the notebook for the mentioned code. Its for a buckling equation. I am not able to find the errors. Can anyone help.

lengL[arg1_] :=
 (p = arg1;
  \[Psi]sol = NDSolve[{\[Psi]''[s] + pSin[\[Psi][s]] == 0, y'[s] == Sin[\[Psi][s]], x'[s] == Cos[\[Psi][s]], \[Psi][0] == \[Psi]0, \[Psi]'[0] == \[Kappa]0, x[0] == RCos[\[Psi]0], y[0] == RSin[\[Psi]0]}, {\[Psi], x, y}, {s, 0, 2}];

L = s /. FindRoot[(ArcTan[y[s]/x[s]] /. \[Psi]sol)[[1]] == (\[Psi][s] /. \[Psi]sol)[[1]], {s, 0.75, 1.25}])

endstrain[arg2_, arg3_] := (\[Psi]0 = arg2 \[Pi]/180; 
                            R = arg3;
  load = xx /. FindRoot[lengL[xx] == 1, {xx, 20, 21}];
  \[Theta] = (\[Psi][L] /. \[Psi]sol)[[1]];
  xb[s_] = Cos[\[Theta]] x[s] + Sin[\[Theta]] y[s];
  yb[s_] = Cos[\[Theta]] y[s] \[Minus] Sin[\[Theta]] x[s];
  {strain = 100 (L + R \[Minus] (xb[L] /. \[Psi]sol)[[1]])/L, (\[Psi]0 \[Minus] \[Theta])180/\[Pi],loadCos[\[Theta]], ((\[Psi]'[L] \[Minus] \[Kappa]0)/xb[L]) /. \[Psi]sol[[1]]})

\[Psi]solfind[varg_?NumericQ, \[Kappa]0arg_?NumericQ,parg_?NumericQ, \[Psi]0arg_,uarg_] := (p = parg; v = varg; \[Kappa]0 = \[Kappa]0arg; \[Psi]0 = (\[Psi]0arg \[Pi])/180 ;

Rajnish



  • Prev by Date: Re: average of the consecutive coin tosses
  • Next by Date: Re: average of the consecutive coin tosses
  • Previous by thread: Re: Baffled by notebook history
  • Next by thread: Re: Mathematica