MODERATOR NOTE: a submission to computations art contest, see more: https://wolfr.am/CompArt-22
Intrigued by the Ambiguous Cylinder Illusion, of prof. Kokichi Sugihara, I started looking for explanations with the help of Wolfram Language.
data:image/s3,"s3://crabby-images/77bf7/77bf7363fa7bd018c1655e9366be2ba657f60935" alt="enter image description here"
The "ambiguous cylinder" can, for purposes of the viewing illusion, be reduced to its upper rim. We call the rim an "ambiguous ring". This ring can be seen as a circle or a square, depending on the viewpoint. Almost perpendicular, viewpoints can be achieved with the help of a mirror.
data:image/s3,"s3://crabby-images/4c656/4c656214cf686be507d62fa116cb729356dc938f" alt="enter image description here"
Looking parallel to the axis of the circular cylinder or of the square cylinder (prism) will show a circle or a square respectively. A possible mathematical expression for this "ambiguous curve" can be obtained by investigating the intersection of a circular with a square cylinder. My Wolfram demonstrations Intersection of Circular and Polygonal Cylinders 1] and [Ambiguous Rings 1: Polygon Based illustrate the different intersection curves obtained by changing the geometry of the cylinders. For these intersection curves to form a ring, a tight fit between the square cylinder inside the circular one is required. The circumradius of a perfectly fitted square inside a circle of radius 1 is:
fittedradius4[t_] :=
Module[{n}, n = 2 Floor[4 (.5 t + \[Pi]/8)/\[Pi]] - 1;
Cos[t - (n + 1) \[Pi]/4]]
As can be seen in this simple Manipulate:
Manipulate[
ParametricPlot[
1/Sqrt[2] Sec[
1/2 ArcTan[Cot[2 (\[Theta] - \[Theta]0)]]] {Cos[\[Theta]],
Sin[\[Theta]]}, {\[Theta], 0, 2 \[Pi]},
PlotStyle -> Directive[AbsoluteThickness[4], Orange],
PlotRange -> 1.25, ImageSize -> Small, TicksStyle -> 6,
Prolog -> {{Thick, Dotted, Circle[]}, Cyan, AbsoluteThickness[4],
Line[{{-5, fittedradius4[\[Theta]0]}, {5,
fittedradius4[\[Theta]0]}}],
Line[{{-5, -fittedradius4[\[Theta]0]}, {5, \
-fittedradius4[\[Theta]0]}}], AbsolutePointSize[5], Black,
Point[{0, 0}]}],
{{\[Theta]0, 0.5, "axial rotation\nsquare cylinder"}, 0, 10 \[Pi],
ImageSize -> Tiny}, TrackedSymbols :> Manipulate]
data:image/s3,"s3://crabby-images/04968/04968c53c01e3e3798c35d7deb174f7e48b158a3" alt="Fitted square"
Based on [1], this is the function for a polygonal ringset:
polyRingsetCF =
Compile[{{\[Theta], _Real}, {r, _Real}, {\[Theta]0, _Real}, {d, \
_Real}, {n, _Integer}, {\[Alpha], _Real}},
Module[{t},
t = Sec[2 ArcTan[Cot[1/2 n (\[Theta] - \[Theta]0)]]/
n]; {(*part1*){Cos[\[Pi]/n] Cos[\[Theta]] t,
Cos[\[Pi]/n] t Sin[\[Theta]],
Sec[\[Alpha]] Sqrt[-d^2 + r^2 +
2 d Cos[\[Pi]/n] t Sin[\[Theta]] -
Cos[\[Pi]/n]^2 t^2 Sin[\[Theta]]^2] -
Cos[\[Pi]/n] Cos[\[Theta]] t Tan[\[Alpha]]},
{(*part 2*)Cos[\[Pi]/n] Cos[\[Theta]] t,
Cos[\[Pi]/
n] t Sin[\[Theta]], -Sec[\[Alpha]] Sqrt[-d^2 + r^2 +
2 d Cos[\[Pi]/n] t Sin[\[Theta]] -
Cos[\[Pi]/n]^2 t^2 Sin[\[Theta]]^2] -
Cos[\[Pi]/n] Cos[\[Theta]] t Tan[\[Alpha]]}}]];
ParametricPlot3D[
polyRingsetCF[t, 1., 0.5, 0., 4, 0.], {t, -\[Pi], \[Pi]},
PlotStyle -> {{Red, Tube[.035]}}, PlotPoints -> 500,
PerformanceGoal -> "Quality", SphericalRegion -> True,
PlotRange -> 1.1, Background -> Lighter[Gray, 0.5], ImageSize -> 300,
PlotTheme -> "Marketing"]
data:image/s3,"s3://crabby-images/3d3d9/3d3d9b0bd42324d73c004b1c6ca7e1bde60dbe57" alt="Complete rindset4"
If we now use fittedRadius[[Theta]0] as the circumradius for the square cylinder, we can create closed ringsets as a function the axial rotation [Theta]0 of the suare cylinder. This is a GIF scrolling through all possible fitted square cylinders inside a circular cylinder of radius 1 :
data:image/s3,"s3://crabby-images/c1020/c1020031d4eb4c26102060a02e3882773475970c" alt="Closed Rindsets4"
These intersection curves are composite curves (ringsets) consisting each of two separate curves (rings). We can select one of these two rings by introducing the cutoff angles (t1 and t2) in the parametric plot [2].
polyRingCF =
Compile[{{\[Theta], _Real}, {\[Theta]0, _Real}, {r, _Real}, \
{\[Alpha], _Real}, {n, _Integer}, {d, _Real}, {t1, _Real}, {t2, \
_Real}},(*t1 and t2 are the values of \[Theta] for switching between \
parts*)
Module[{t},(*selection of parts of a composite curve*)
t = Sec[2 ArcTan[Cot[1/2 n (\[Theta] - \[Theta]0)]]/n];
{Cos[\[Pi]/n] Cos[\[Theta]] t,
Cos[\[Pi]/n] Sin[\[Theta]] t,(*select part1 or part 2*)
Piecewise[{{1, \[Theta] <= t1 \[Pi] + 2 \[Theta]0 || \[Theta] >
t2 \[Pi] + 2 \[Theta]0}}, -1]*(Sec[\[Alpha]] Sqrt[-d^2 +
r^2 + 2 d Cos[\[Pi]/n] t Sin[\[Theta]] -
Cos[\[Pi]/n]^2 t^2 Sin[\[Theta]]^2]) -
Cos[\[Pi]/n] Cos[\[Theta]] t Tan[\[Alpha]]}]]
printring4 =
ParametricPlot3D[
polyRingCF[\[Theta], 0., fittedradius4[0.], 0., 4,
0., -.5, .5], {\[Theta], -\[Pi], \[Pi]}, SphericalRegion -> True,
PlotStyle -> {Green, Tube[.05]}, Boxed -> False, Axes -> False,
PlotRange -> 1.05, PlotPoints -> 100, ImageSize -> Small,
PlotTheme -> "ThickSurface"]
data:image/s3,"s3://crabby-images/c51ed/c51ed6f47d9c633afc90da68da8d00033c7f85ae" alt="Ring41"
This is a GIF showing the different views of this ring: among them a circle, a square, a "lemniscate", etc...
data:image/s3,"s3://crabby-images/1d2c6/1d2c6af3db45e72c0ba05e765951a274b9a7a8f3" alt="enter image description here"
To test this "ambiguous ring" in a mirror setup, we use Printout3D to send the file to Sculpteo for 3D-printing:
Printout3D[printring4, "Sculpteo", RegionSize -> Quantity[5, "cm"]]
data:image/s3,"s3://crabby-images/d0490/d0490471c80979261a04c41e7bc2a0f269bbf8d3" alt="Sculpteo ring41"
And when reflected in an experimental mirror setup: data:image/s3,"s3://crabby-images/bcb75/bcb7559548c53053458f17b0f439d80a336eba68" alt="Reflected image"
The physical ring looks like a circle while the reflected ring looks like a square.
For those who like to print this ring themselves, This is the link to the Sculpteo file.