MathGroup Archive 2012

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

Search the Archive

Re: 3d artifacts

  • To: mathgroup at smc.vnet.net
  • Subject: [mg127394] Re: 3d artifacts
  • From: Bob Hanlon <hanlonr357 at gmail.com>
  • Date: Sun, 22 Jul 2012 04:29:45 -0400 (EDT)
  • Delivered-to: l-mathgroup@mail-archive0.wolfram.com
  • Delivered-to: mathgroup-newout@smc.vnet.net
  • Delivered-to: mathgroup-newsend@smc.vnet.net
  • References: <201207070930.FAA20625@smc.vnet.net>

I also suggested using Piecewise.

Clear[ww, f, g]

ww[t_, p_] = Piecewise[{{
     {(10 + Cos[p]) Sin[2 t],
      (10 + Cos[p + 2 Pi/3]) 15/10 Cos[t]/(1 + Sin[t]^2),
      (10 + Cos[p - 2 Pi/3]) Sin[t]/(1 + Sin[t]^2)},
     2 Pi <= t <= 4 Pi}},
   {(10 + Cos[p]) Cos[t],
    (10 + Cos[p + 2 Pi/3]) Sin[t],
    (10 + Cos[p - 2 Pi/3]) Sin[2 t]}];

ParametricPlot3D[ww[t, p],
 {t, 0, 4 Pi}, {p, 0, 2 Pi},
 Boxed -> False,
 Axes -> False,
 ColorFunction -> "GreenBrownTerrain",
 MeshFunctions -> {#3 &},
 PlotPoints -> {35, 50}]

f[t_] = Piecewise[{
    {(1 - Cos[2 t])/2,
     -Pi/2 <= t <= Pi/2}},
   (-1 + Cos[2 t])/2];
g[t_] = -Pi/2 + Mod[t, Pi];

ParametricPlot3D[{
  (10 + Cos[p]) f[t] g[t],
  (10 + Cos[p + 2 Pi/3]) g[t] g[t],
  (10 + Cos[p - 2 Pi/3]) f[t]},
 {t, -Pi, Pi}, {p, 0, 2 Pi},
 Boxed -> False,
 Axes -> False,
 ColorFunction -> "GreenBrownTerrain",
 MeshFunctions -> {#3 &},
 PlotPoints -> {35, 50}]


Bob Hanlon


On Fri, Jul 20, 2012 at 3:49 AM, Roger Bagula <roger.bagula at gmail.com> wrote:
> Bob Hanlon
> You and Park both thought exceptions would work.
> Once add an tube function Parametric3D
> no longer performs the Exceptions it appears.
> I tried a tube program  that usually works
> and then my triaxial tubes topological product method:
> Clear[ww, x, t, p, f, g]
> (* patched manifold function for Whitehead link*)
> ww[t_, p_] :=
>   If[t >= 0 &&
>     t < 2*Pi, {(10 + Cos[p])*Cos[t], (10 + Cos[p + 2*Pi/3])*
>      Sin[t], (10 + Cos[p - 2*Pi/3])*Sin[2*t]},
>    If[t >= 2*Pi &&
>      t <= 4*Pi, {(10 + Cos[p])*
>       Sin[2*t], (10 + Cos[p + 2*Pi/3])*15/
>        10 Cos[t]/(1 + Sin[t]^2), (10 + Cos[p - 2*Pi/3])*
>       Sin[t]/(1 + Sin[t]^2)}, {(10 + Cos[p])*
>       Cos[t], (10 + Cos[p + 2*Pi/3])*Sin[t], (10 + Cos[p - 2*Pi/3])*
>       Sin[2*t]}]];
> ParametricPlot3D[ww[t, p], {t, 0, 4*Pi + 0.01}, {p, 0, 2*Pi},
>  Exclusions -> {2 Pi, 4 Pi}, Boxed -> False, Axes -> False,
>  ColorFunction -> "GreenBrownTerrain", MeshFunctions -> {#3 &},
>  PlotPoints -> {35, 100}]
> ParametricPlot3D[ww[t, p], {t, 0, 4*Pi + 0.01}, {p, 0, 2*Pi},
>  Exclusions -> Range[0, 4 \[Pi], \[Pi]/4], Boxed -> False,
>  Axes -> False, ColorFunction -> "GreenBrownTerrain",
>  MeshFunctions -> {#3 &}, PlotPoints -> {35, 100}]
> (* bicuspoid manifold definition*)
> f[t_] = If [
>    t >= -Pi/2 && t <= Pi/2, (1 - Cos[2*t])/2, (-1 + Cos[2*t])/2];
> g[t_] = -Pi/2 + Mod[t, Pi];
> ParametricPlot3D[{(10 + Cos[p])*f[t]*g[t], (10 + Cos[p + 2*Pi/3])*
>    g[t]*g[t], (10 + Cos[p - 2*Pi/3])*f[t]}, {t, -Pi, Pi}, {p, 0,
>   2*Pi}, Exclusions -> Range[-\[Pi], \[Pi], \[Pi]/4], Boxed -> False,
>  Axes -> False, ColorFunction -> "GreenBrownTerrain",
>  MeshFunctions -> {#3 &}, PlotPoints -> {35, 100}]
> ParametricPlot3D[{(10 + Cos[p])*f[t]*g[t], (10 + Cos[p + 2*Pi/3])*
>    g[t]*g[t], (10 + Cos[p - 2*Pi/3])*f[t]}, {t, -Pi, Pi}, {p, 0,
>   2*Pi}, Exclusions -> {-Pi/2, Pi/2}, Boxed -> False, Axes -> False,
>  ColorFunction -> "GreenBrownTerrain", MeshFunctions -> {#3 &},
>  PlotPoints -> {35, 100}]
>
> On Monday, July 9, 2012 2:24:24 AM UTC-7, Bob Hanlon wrote:
>> Resent since this hasn&#39;t shown up.
>



  • References:
  • Prev by Date: Re: Options to know shape of functions
  • Next by Date: Re: How to Scale and vary plot for a Differential Equation
  • Previous by thread: Re: 3d artifacts
  • Next by thread: Re: Integration result depends on variable name / problem with BesselJ