Group Abstract Group Abstract

Message Boards Message Boards

Tokyo 2020 Olympic and Paralympic Emblems

POSTED BY: Kotaro Okazaki
4 Replies

On January 6, Tokyo 2020 Official Art Posters were published. The poster of Mr. Asao Tokolo who designed the Tokyo 2020 Olympic and Paralympic emblems is included in those. He said,

I created the designs as a tribute to the Tokyo 1964 designers, who relied on compasses and rulers for their creations, and by imagining what mediums would be employed by designers of the future.

I used his poster as a reference and have tried to make it in a different way than the one above.

enter image description here

R = 1;
line = 2 R Sin[11/12 Pi];
linecol := \!\(\*
TagBox[
StyleBox[
RowBox[{"RGBColor", "[", 
RowBox[{".9", ",", ".9", ",", ".9", ",", 
RowBox[{"RandomReal", "[", 
RowBox[{"{", 
RowBox[{"0.4", ",", "0.5"}], "}"}], "]"}]}], "]"}],
ShowSpecialCharacters->False,
ShowStringCharacters->True,
NumberMarks->True],
FullForm]\);
reccol = White;
backcol = CMYKColor[1, .8, 0, .5];(*emblem Blue*)
thick = Thickness[.001];
(* inside deformed 24 polygon *)
baseTriangle = {EdgeForm[Directive[thick, linecol]], FaceForm[None], 
   Triangle[{{0, 0}, {0, R}, R {Cos[Pi/3], Sin[Pi/3]}}]};
g1 = Table[Rotate[baseTriangle, i Pi/6, {0, 0}], {i, 0, 12}];
baseLine = {thick, linecol, Line[{{0, 0}, {0, R Cos[11 Pi/12]}}]};
g2 = Table[Rotate[baseLine, Pi/12 + i Pi/6, {0, 0}], {i, 0, 11}] ;
(* 3 rectangles *)
rectangle[theta_] := Module[{p0, p1, p2, p3, rhombus},
  p0 = {0, 0};
  p1 = line {Cos[theta], Sin[-theta]};
  p2 = line {2 Cos[theta], 0};
  p3 = line {Cos[theta], Sin[theta]};
  rhombus = {EdgeForm[Directive[thick, linecol]], FaceForm[None], 
    Polygon[{p0, p1, p2, p3}], linecol, Line[{p0, p2}], 
    Line[{p1, p3}], Line[{p0 + p1, p2 + p3}/2], 
    Line[{p1 + p2, p3 + p0}/2],
    PointSize[.008], Point[{p0, p1, p2, p3}]};
  {FaceForm[{reccol, Opacity[RandomReal[{0.2, 0.7}]]}], 
   Rectangle[p1/2, 1/2 (p2 + p3)], rhombus}
  ]
r1 := rectangle[Pi/4];  (*large*)
r2 := rectangle[Pi/6];  (*middle*)
r3 := rectangle[Pi/12];  (*small*)

g3 := {
  (*large rectangel*)
  Translate[Rotate[r1, Pi/2, {0, 0}], {0, R}],
  Translate[Rotate[r1, 0, {0, 0}], 
   line Cos[Pi/4] {-1, 
      0} + (R Cos[Pi/4] Cos[Pi/12] + line/2 Cos[Pi/4]) {-1, 1}],
  Translate[Rotate[r1, Pi/6, {0, 0}], 
   l1 = (R Cos[Pi/12] + line (1 + Sin[Pi/3])) {-Cos[Pi/12], 
      Sin[Pi/12]}],
  (*middle rectangel*)
  Translate[Rotate[r2, Pi/12, {0, 0}], {0, R}],
  Translate[Rotate[r2, -Pi/12, {0, 0}], {0, R + 2 line Sin[Pi/4]}],
  Translate[Rotate[r2, 11 Pi/12, {0, 0}], {0, R}],
  Translate[Rotate[r2, 13 Pi/12, {0, 0}], {0, R + 2 line Cos[Pi/4]}],
  Translate[Rotate[r2, 7 Pi/12, {0, 0}], {-R, 0}],
  Translate[
   Rotate[r2, 
    Pi/12, {0, 0}], {-R Cos[Pi/6] - line (Cos[Pi/4] + Cos[Pi/12]), 
    R Sin[Pi/3] + line Sin[Pi/12]}],
  (*small rectangel*)
  s1 := Translate[
    Rotate[r3, 0, {0, 0}], {0 - line Cos[Pi/12], 
     R + 2 line Sin[Pi/4] + line Sin[Pi/12]}],
  s1,
  Rotate[s1, Pi/6, {0, 0}],
  Translate[
   Rotate[r3, 0, {0, 0}], {0 - line (Cos[Pi/4] + 2 Cos[Pi/12]), 
    R + line Sin[Pi/4]}],
  s2 := Rotate[s1, Pi/2, {0, 0}],
  s2,
  Rotate[s2, Pi/6, l1],
  Rotate[s2, Pi/3, l1]};
g = Graphics[
   {g1, g2, g3,
    Rotate[g3, 2 Pi/3, {0, 0}],
    Rotate[g3, 4 Pi/3, {0, 0}]
    }, Background -> backcol, ImageSize -> 600];

ImageEffect[g, {"GaussianNoise", .1}]
POSTED BY: Kotaro Okazaki

Very nice and interesting - thanks for sharing!

Just a note: With a simple trick one can help the eye. Let corners be the corners of the emblem, then:

order = Last@FindShortestTour[corners];
Show[emblem, Graphics[{Opacity[.1], Red, EdgeForm@Directive[Thickness[.01], Red], Polygon[corners[[order]]]}]]

enter image description here

Outside the polygon there appear only rectangles of type "middle".

POSTED BY: Henrik Schachner

enter image description here - Congratulations! This post is now featured in our Staff Pick column as distinguished by a badge on your profile of a Featured Contributor! Thank you, keep it coming, and consider contributing your work to the The Notebook Archive!

POSTED BY: EDITORIAL BOARD

Very neat! Thanks for sharing!

POSTED BY: Sander Huisman
Reply to this discussion
Community posts can be styled and formatted using the Markdown syntax.
Reply Preview
Attachments
Remove
or Discard