MathGroup Archive 2007

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

Search the Archive

a problem about loglogplot

  • To: mathgroup at smc.vnet.net
  • Subject: [mg73095] a problem about loglogplot
  • From: "lynn" <lynn0701 at gmail.com>
  • Date: Fri, 2 Feb 2007 05:06:47 -0500 (EST)

Hello,

I have some problems during the processes.

\!\(sol =
   NDSolve[{2\[Times]\(y'\)[x]\[Times]y[x] +
           x\[Times]\(y''\)[x]\[Times]y[x] -
           x\[Times]\((\(y'\)[x])\)\^2 \[Equal] x\[Times]y[x],
       y[0.00001] \[Equal] 1, \(y'\)[0.00001] \[Equal] 0}, y, {x, 0,
1},
     MaxSteps \[Rule] 1000]\[IndentingNewLine]
 f[w_?NumberQ] :=
   2\[Times]Integrate[\((Evaluate[y[x] /. sol])\)\^\(-1\)\[Times]
         x\/\@\(x\^2 - w\^2\), {x, w, 1}]\[IndentingNewLine]
 << Graphics`Graphics`\[IndentingNewLine]
 curve = LogLogPlot[{f[w], w}, {w, 0.01, 0.99}]\)

However, the prcesses work well when I just "Plot" the curve, not
"LogLogPlot" it.
I don't know what's wrong....

Thanks a lot!!!


  • Prev by Date: Re: How to use BlockMatrix
  • Next by Date: Re: loglogplot
  • Previous by thread: Re: Problem with ExpIntegralEi vs. LogIntegral
  • Next by thread: reverse polish notation