MathGroup Archive 2009

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

Search the Archive

Re: Problem in plotting Bifurcation Diagram (ListPlot with

  • To: mathgroup at smc.vnet.net
  • Subject: [mg102146] Re: [mg102096] Problem in plotting Bifurcation Diagram (ListPlot with
  • From: DrMajorBob <btreat1 at austin.rr.com>
  • Date: Thu, 30 Jul 2009 05:35:34 -0400 (EDT)
  • References: <200907290910.FAA19700@smc.vnet.net>
  • Reply-to: drmajorbob at bigfoot.com

MakeMapFunction is undefined, so of course the code doesn't work...  
although I get a different error.

Also note, your semicolon after ListPlot will prevent display of the plot.

Bobby

On Wed, 29 Jul 2009 04:10:48 -0500, AH <creativesolutionsnz at gmail.com>  
wrote:

> Hi
> I have following piece of code:
> --------------------------------------------------------------------------------------------------------
> In[1]:=BifurcationDiagram[f_, {r_, rmin_, rmax_, rstep_}, {x_, x0_},
> start_,
>          combine_] :=
> 	Module[{R, temp, MapFunction},
> 		R = Table[r, {r, rmin, rmax, rstep}]; (* The range
>     of values of the parameter *)
> 		MapFunction = MakeMapFunction[{r, x}, f];(*
>         Construct the iterating function *)
> 		temp = Nest[MapFunction[R, #] &, x0 + 0.R, start + 1];(* Starting
> iterates \
> *)
> 		temp = NestList[MapFunction[R, #] &, temp, combine - 1];(*
> Subsequent \
> iterates *)
> 		temp = Map[ Union, Transpose[
>           temp] ]; (* Remove duplicate values from cycles *)
> 		Flatten[ MapThread[Thread[{#1, #2}] &, {R, temp}], 1]
> 	];
>
> In[2]:=ListPlot[BifurcationDiagram[(1 - r) x + (r(2858.16)/(x - 500)
> ^0.82) - 30000r, \
> {r, 0.1, .2, .0001}, {x, 600}, 10000, 100], PlotStyle ->
>         AbsolutePointSize[0.0001]];
> ------------------------------------------------------
> The following errors are produced:
> Graphics:: gptn : Coordiantes -30000.5+0.0169522 i {0.1,
> -30000.5+0.0169522 i }....is not a floating pont. Is there any
> possible solution to this problem ?
> Best regards.
> --------------------------------------------------------
>



-- 
DrMajorBob at bigfoot.com


  • Prev by Date: Re: bvdae error when using NDSolve for initial value problem
  • Next by Date: Re: Slow start to AstronomicalData[]
  • Previous by thread: Problem in plotting Bifurcation Diagram (ListPlot with Complex
  • Next by thread: Re: Problem in plotting Bifurcation Diagram (ListPlot with