Message Boards Message Boards

Error generating graph based on Reduce function result

Posted 2 months ago

Hi.
I tried to see whether this equation is positive, and I couldn't find out the best way.

equation: (-2 a (-2+b)^2 (1+b) c+c^2 (2 b^3+8 [Alpha]-6 b^2 [Alpha]))/(2 (-4+b^2)^2)

  • Question:
    What is the correct way to generate a graph with several conditions?

  • Condition:
    a>c, c>0, 0<b<1, alpha>1

  • Attempted Code:

    RegionPlot[(c (-a (-2+b)^2 (1+b)+c (b^3+4 \[Alpha]-3 b^2 \[Alpha])))/(-4+b^2)^2 <0,{\[Alpha],1,10},{b,0,1},{c,0,3},{a,4,9},PlotLegends->"Expressions"]
    
    Reduce[-((c (-1+\[Alpha]^2) (a (-2+b)^2 (1+b) \[Alpha]+(-4+3 b^2) c (1+\[Alpha]^2)))/((-4+b^2)^2 \[Alpha]^3))<0&&a>0&&0<b<1&&c<a&&\[Alpha]>1,{\[Alpha]},R]] 
    Plot[f[\[Alpha]],{\[Alpha],1,10},PlotRange->All]
    
    (FunctionInterpolation[#1,{a,4.,10.},{b,-2.,2.},{c,0.1,3},{\[Alpha],1,10}]&)[-((c (-1+\[Alpha]^2) (a (-2+b)^2 (1+b) \[Alpha]+(-4+3 b^2) c (1+\[Alpha]^2)))/((-4+b^2)^2 \[Alpha]^3))]
    

I even tried to fix parameters and just want to see how move when alpha is increasing. but it did not show any result. Please help me.

Attempted Code:

a = 10;
c = 3;
b = 0.9;

f(\[Alpha]) = (-2 a (-2 + b)^2 (1 + b) c + c^2 (2 b^3 + 8 \[Alpha] - 6 b^2 \[Alpha]))/(2 (-4 + b^2)^2);

Plot[f[\[Alpha]], {\[Alpha], 1, 9},
  PlotRange -> All,
  Frame -> True,
  AxesLabel -> {"\[Alpha]", "f(\[Alpha])"},
  LabelStyle -> {FontFamily -> "Arial", FontSize -> 12}]
POSTED BY: Tchun Jeeyoung
3 Replies
Posted 2 months ago
POSTED BY: Tchun Jeeyoung
Posted 2 months ago

You should rename main variable (especially if you are beginner) in some simple letter, eg $x$. Function definition should start from f[x_]:= (*something with x as independent variable*)

So main definition is:

f[x_] := (-2 a (-2 + b)^2 (1 + b) c +  c^2 (2 b^3 + 8 x - 6 b^2 x))/(2 (-4 + b^2)^2);

Plot works well:

Plot[f[x], {x, 1, 9}, PlotRange -> All, Frame -> True, 
 FrameLabel -> {"x", "f(x)"}, 
 LabelStyle -> {FontFamily -> "Arial", FontSize -> 12}]

so other operations with f[x] should be OK.

POSTED BY: Denis Ivanov
Posted 2 months ago

Thank you so much!!!

It was incredibly helpful and I really appreciated it. Thank you so much again. Have a wonderful day Sincerely Jee young

POSTED BY: Tchun Jeeyoung
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