I am projecting 2d triangles into a 3d space (aligning short side with z axis). both the notebook version and the cdf preview work fine but the player gives a different rendering. 
This is the module for the transformation:
 
TRIV[Long_, Short_, Mid_] := 
 Module[{mastu = Long, mast0 = Short, mastb = Mid},
  T = SSSTriangle[mastu, mast0, mastb];
  Tang = PolygonAngle[T][[1]];
  rT = RotationTransform[(Pi/2) - Tang, {0, 0`}];
  Triangle[PolygonCoordinates[rT[T]] /. {x1_, x2_} -> {x1, 0, x2}]]
Then the manipulate environment:
 
Manipulate[
 fore = TRIV[tr, short, br];
 Graphics3D[{fore,
   Purple, Line[{{0, 0, -1.2}, {0, 0, z}}], 
   Text[Style["z", Italic, 16], {.2, .2, z + .2}],
   }],
 Grid[{{Control@{{tr, 1.695}, InputField, ImageSize -> Small}, 
    Control@{{short, .5}, InputField, 
      ImageSize -> Small}}, {Control@{{br, 1.32}, InputField, 
      ImageSize -> Small}, 
    Control@{{z, 2}, InputField, ImageSize -> Small}},
   {Control@{{y, 1.5}, InputField, ImageSize -> Small},
    Control@{{x, 2}, InputField, ImageSize -> Small}}}],
 SaveDefinitions -> True, Initialization :> TRIV[1.695, .5, 1.32]]
I can't work out what I'm getting wrong?