{- ORMOLU_DISABLE -}
-- Implicit CAD. Copyright (C) 2011, Christopher Olah (chris@colah.ca)
-- Copyright (C) 2016, Julia Longtin (julial@turinglace.com)
-- Released under the GNU AGPLV3+, see LICENSE

module Graphics.Implicit.Export.Render.GetSegs (getSegs) where

import Prelude((-), Bool(True, False), sqrt, (+), (*), (/=), map, (.), filter, ($), (<=))

import Graphics.Implicit.Definitions (, ℝ2, Obj2, Polyline(Polyline))
import Graphics.Implicit.Export.Render.RefineSegs (refine)
import Graphics.Implicit.Export.Util (centroid)
import Linear (V2(V2))

{- The goal of getSegs is to create polylines to separate
   the interior and exterior vertices of a square intersecting
   an object described by an implicit function.

      O.....O        O.....O
      :     :        :     :
      :     *        :  ,--*
      *     :   =>   *--   :
      :     :        :     :
      #.....#        #.....#

  An interior point is one at which obj is negative.

  What are all the variables?
  ===========================

  To allow data sharing, lots of values we
  could calculate are instead arguments.

       positions               obj values
       ---------               ----------

  (x1,y2) .. (x2,y2)    obj   x1y2 .. x2y2
     :          :       =>     :       :
  (x1,y1) .. (x2,y1)          x1y1 .. x2y2

               mid points
               ----------

               (midy2V, y2)
                 = midy2

               ......*......
               :           :
 (x1, midx1V)  *           *  (x2, midx2V)
   = midx1     :           :     = midx2
               :.....*.....:

               (midy1V, y1)
                 = midy1

-}
getSegs :: ℝ2 -> ℝ2 -> Obj2 -> (,,,) -> (,,,) -> [Polyline]
getSegs :: ℝ2 -> ℝ2 -> Obj2 -> (ℝ, ℝ, ℝ, ℝ) -> (ℝ, ℝ, ℝ, ℝ) -> [Polyline]
getSegs p1 :: ℝ2
p1@(V2 x y) ℝ2
p2 Obj2
obj (x1y1, x2y1, x1y2, x2y2) (midx1V,midx2V,midy1V,midy2V) =
    let
        -- Let's evaluate obj at a few points...
        c :: ℝ
c = Obj2
obj ([ℝ2] -> ℝ2
forall a (t :: * -> *) (f :: * -> *).
(Fractional a, Foldable t, Applicative f, Num (f a)) =>
t (f a) -> f a
centroid [ℝ2
p1,ℝ2
p2])

        -- TODO(sandy): i might have swapped (^+^) for - here
        (V2 dx dy) = ℝ2
p2 ℝ2 -> ℝ2 -> ℝ2
forall a. Num a => a -> a -> a
- ℝ2
p1
        res :: ℝ
res = ℝ -> ℝ
forall a. Floating a => a -> a
sqrt (dxℝ -> ℝ -> ℝ
forall a. Num a => a -> a -> a
*dy)

        midx1 :: ℝ2
midx1 = ℝ -> ℝ -> ℝ2
forall a. a -> a -> V2 a
V2 x        midx1V
        midx2 :: ℝ2
midx2 = ℝ -> ℝ -> ℝ2
forall a. a -> a -> V2 a
V2 (x ℝ -> ℝ -> ℝ
forall a. Num a => a -> a -> a
+ dx) midx2V
        midy1 :: ℝ2
midy1 = ℝ -> ℝ -> ℝ2
forall a. a -> a -> V2 a
V2 midy1V   y
        midy2 :: ℝ2
midy2 = ℝ -> ℝ -> ℝ2
forall a. a -> a -> V2 a
V2 midy2V   (y ℝ -> ℝ -> ℝ
forall a. Num a => a -> a -> a
+ dy)

        notPointLine :: Polyline -> Bool
        notPointLine :: Polyline -> Bool
notPointLine (Polyline [ℝ2
np1,ℝ2
np2]) = ℝ2
np1 ℝ2 -> ℝ2 -> Bool
forall a. Eq a => a -> a -> Bool
/= ℝ2
np2
        notPointLine Polyline
_ = Bool
False

        -- takes straight lines between mid points and subdivides them to
        -- account for sharp corners, etc.

    in (Polyline -> Polyline) -> [Polyline] -> [Polyline]
forall a b. (a -> b) -> [a] -> [b]
map (ℝ -> Obj2 -> Polyline -> Polyline
refine res Obj2
obj) ([Polyline] -> [Polyline])
-> ([Polyline] -> [Polyline]) -> [Polyline] -> [Polyline]
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (Polyline -> Bool) -> [Polyline] -> [Polyline]
forall a. (a -> Bool) -> [a] -> [a]
filter Polyline -> Bool
notPointLine ([Polyline] -> [Polyline]) -> [Polyline] -> [Polyline]
forall a b. (a -> b) -> a -> b
$ case (x1y2 ℝ -> ℝ -> Bool
forall a. Ord a => a -> a -> Bool
<= 0, x2y2 ℝ -> ℝ -> Bool
forall a. Ord a => a -> a -> Bool
<= 0,
                                                          x1y1 ℝ -> ℝ -> Bool
forall a. Ord a => a -> a -> Bool
<= 0, x2y1 ℝ -> ℝ -> Bool
forall a. Ord a => a -> a -> Bool
<= 0) of

        -- An important point here is orientation. If you imagine going along a
        -- generated segment, the interior should be on the left-hand side.

        -- Empty Cases

        (Bool
True,   Bool
True,  Bool
True,  Bool
True) -> []
        (Bool
False, Bool
False, Bool
False, Bool
False) -> []

        -- Horizontal Cases
        ( Bool
True,  Bool
True, Bool
False, Bool
False) -> [[ℝ2] -> Polyline
Polyline [ℝ2
midx1, ℝ2
midx2]]
        (Bool
False, Bool
False,  Bool
True,  Bool
True) -> [[ℝ2] -> Polyline
Polyline [ℝ2
midx2, ℝ2
midx1]]

        -- Vertical Cases
        (Bool
False,  Bool
True, Bool
False,  Bool
True) -> [[ℝ2] -> Polyline
Polyline [ℝ2
midy2, ℝ2
midy1]]
        ( Bool
True, Bool
False,  Bool
True, Bool
False) -> [[ℝ2] -> Polyline
Polyline [ℝ2
midy1, ℝ2
midy2]]

        -- Corner Cases
        ( Bool
True, Bool
False, Bool
False, Bool
False) -> [[ℝ2] -> Polyline
Polyline [ℝ2
midx1, ℝ2
midy2]]
        (Bool
False,  Bool
True,  Bool
True,  Bool
True) -> [[ℝ2] -> Polyline
Polyline [ℝ2
midy2, ℝ2
midx1]]
        ( Bool
True,  Bool
True, Bool
False,  Bool
True) -> [[ℝ2] -> Polyline
Polyline [ℝ2
midx1, ℝ2
midy1]]
        (Bool
False, Bool
False,  Bool
True, Bool
False) -> [[ℝ2] -> Polyline
Polyline [ℝ2
midy1, ℝ2
midx1]]
        ( Bool
True,  Bool
True,  Bool
True, Bool
False) -> [[ℝ2] -> Polyline
Polyline [ℝ2
midy1, ℝ2
midx2]]
        (Bool
False, Bool
False, Bool
False,  Bool
True) -> [[ℝ2] -> Polyline
Polyline [ℝ2
midx2, ℝ2
midy1]]
        ( Bool
True, Bool
False,  Bool
True,  Bool
True) -> [[ℝ2] -> Polyline
Polyline [ℝ2
midx2, ℝ2
midy2]]
        (Bool
False,  Bool
True, Bool
False, Bool
False) -> [[ℝ2] -> Polyline
Polyline [ℝ2
midy2, ℝ2
midx2]]

        -- Dual Corner Cases
        (Bool
True,  Bool
False, Bool
False, Bool
True)  -> if c ℝ -> ℝ -> Bool
forall a. Ord a => a -> a -> Bool
<= 0
            then [[ℝ2] -> Polyline
Polyline [ℝ2
midx1, ℝ2
midy1], [ℝ2] -> Polyline
Polyline [ℝ2
midx2, ℝ2
midy2]]
            else [[ℝ2] -> Polyline
Polyline [ℝ2
midx1, ℝ2
midy2], [ℝ2] -> Polyline
Polyline [ℝ2
midx2, ℝ2
midy1]]

        (Bool
False, Bool
True, Bool
True,  Bool
False) -> if c ℝ -> ℝ -> Bool
forall a. Ord a => a -> a -> Bool
<= 0
            then [[ℝ2] -> Polyline
Polyline [ℝ2
midy2, ℝ2
midx1], [ℝ2] -> Polyline
Polyline [ℝ2
midy1, ℝ2
midx2]]
            else [[ℝ2] -> Polyline
Polyline [ℝ2
midy1, ℝ2
midx1], [ℝ2] -> Polyline
Polyline [ℝ2
midy2, ℝ2
midx2]]