2020-08-10 22:07:09 +00:00
|
|
|
{-# LANGUAGE BlockArguments #-}
|
2020-08-19 21:34:43 +00:00
|
|
|
{-# LANGUAGE DataKinds #-}
|
2020-09-10 16:43:42 +00:00
|
|
|
{-# LANGUAGE DeriveAnyClass #-}
|
2020-08-15 17:11:52 +00:00
|
|
|
{-# LANGUAGE DeriveGeneric #-}
|
2020-11-12 17:34:46 +00:00
|
|
|
{-# LANGUAGE DeriveTraversable #-}
|
|
|
|
{-# LANGUAGE DerivingVia #-}
|
2020-08-20 01:57:26 +00:00
|
|
|
{-# LANGUAGE FlexibleContexts #-}
|
2020-09-08 23:23:25 +00:00
|
|
|
{-# LANGUAGE FlexibleInstances #-}
|
2020-11-12 17:34:46 +00:00
|
|
|
{-# LANGUAGE GADTs #-}
|
2020-09-08 23:23:25 +00:00
|
|
|
{-# LANGUAGE LambdaCase #-}
|
2020-08-10 14:38:27 +00:00
|
|
|
{-# LANGUAGE MultiParamTypeClasses #-}
|
2020-09-08 23:23:25 +00:00
|
|
|
{-# LANGUAGE NamedFieldPuns #-}
|
2020-09-10 16:43:42 +00:00
|
|
|
{-# LANGUAGE OverloadedStrings #-}
|
2020-11-12 17:34:46 +00:00
|
|
|
{-# LANGUAGE PolyKinds #-}
|
|
|
|
{-# LANGUAGE RankNTypes #-}
|
|
|
|
{-# LANGUAGE RecordWildCards #-}
|
|
|
|
{-# LANGUAGE ScopedTypeVariables #-}
|
|
|
|
{-# LANGUAGE StandaloneDeriving #-}
|
2020-08-19 21:34:43 +00:00
|
|
|
{-# LANGUAGE TypeApplications #-}
|
2020-11-12 17:34:46 +00:00
|
|
|
{-# LANGUAGE TypeOperators #-}
|
|
|
|
{-# LANGUAGE UndecidableInstances #-}
|
2020-08-10 14:38:27 +00:00
|
|
|
|
2020-08-15 17:11:52 +00:00
|
|
|
module MetaBrush.Document
|
2020-09-08 23:23:25 +00:00
|
|
|
( AABB(..), mkAABB
|
2020-09-10 16:43:42 +00:00
|
|
|
, Document(..), DocumentContent(..)
|
|
|
|
, emptyDocument
|
2020-11-12 17:34:46 +00:00
|
|
|
, Stroke(..), StrokeSpline, _strokeSpline, overStrokeSpline
|
|
|
|
, PointData(..), BrushPointData(..), DiffPointData(..)
|
2020-09-08 23:23:25 +00:00
|
|
|
, FocusState(..), Hoverable(..), HoverContext(..)
|
|
|
|
, Guide(..)
|
2020-11-12 17:34:46 +00:00
|
|
|
, _selection, _coords, coords
|
2020-09-08 23:23:25 +00:00
|
|
|
, addGuide, selectedGuide
|
2020-08-15 17:11:52 +00:00
|
|
|
)
|
|
|
|
where
|
2020-08-04 06:15:06 +00:00
|
|
|
|
2020-09-01 19:56:59 +00:00
|
|
|
-- base
|
2020-11-12 17:34:46 +00:00
|
|
|
import Data.Coerce
|
|
|
|
( coerce )
|
|
|
|
import Data.Functor.Identity
|
|
|
|
( Identity(..) )
|
2020-09-08 23:23:25 +00:00
|
|
|
import Data.Semigroup
|
|
|
|
( Arg(..), Min(..), ArgMin )
|
2020-09-01 19:56:59 +00:00
|
|
|
import GHC.Generics
|
2020-11-12 17:34:46 +00:00
|
|
|
( Generic, Generic1 )
|
2020-09-01 19:56:59 +00:00
|
|
|
|
2020-09-08 23:23:25 +00:00
|
|
|
-- acts
|
|
|
|
import Data.Act
|
2020-11-12 17:34:46 +00:00
|
|
|
( Act(..), Torsor(..) )
|
2020-09-08 23:23:25 +00:00
|
|
|
|
2020-08-10 22:07:09 +00:00
|
|
|
-- containers
|
2020-09-05 22:35:00 +00:00
|
|
|
import Data.Map.Strict
|
|
|
|
( Map )
|
2020-09-08 23:23:25 +00:00
|
|
|
import qualified Data.Map.Strict as Map
|
2020-11-12 17:34:46 +00:00
|
|
|
( empty, insert )
|
2020-08-10 22:07:09 +00:00
|
|
|
|
2020-09-10 16:43:42 +00:00
|
|
|
-- deepseq
|
|
|
|
import Control.DeepSeq
|
2020-11-12 17:34:46 +00:00
|
|
|
( NFData(..), NFData1, deepseq )
|
2020-09-10 16:43:42 +00:00
|
|
|
|
2020-08-19 21:34:43 +00:00
|
|
|
-- generic-lens
|
|
|
|
import Data.Generics.Product.Fields
|
|
|
|
( field' )
|
2020-11-12 17:34:46 +00:00
|
|
|
|
|
|
|
-- groups
|
|
|
|
import Data.Group
|
|
|
|
( Group(..) )
|
2020-08-19 21:34:43 +00:00
|
|
|
|
|
|
|
-- lens
|
|
|
|
import Control.Lens
|
2020-11-12 17:34:46 +00:00
|
|
|
( Lens'
|
|
|
|
, set, view, over
|
|
|
|
)
|
2020-08-19 21:34:43 +00:00
|
|
|
|
2020-09-08 23:23:25 +00:00
|
|
|
-- stm
|
|
|
|
import Control.Concurrent.STM
|
|
|
|
( STM )
|
|
|
|
|
2020-11-12 17:34:46 +00:00
|
|
|
-- superrecord
|
|
|
|
import qualified SuperRecord as Super
|
|
|
|
( Rec )
|
|
|
|
|
2020-08-10 14:38:27 +00:00
|
|
|
-- text
|
|
|
|
import Data.Text
|
|
|
|
( Text )
|
2020-11-12 17:34:46 +00:00
|
|
|
|
|
|
|
-- transformers
|
|
|
|
import Control.Monad.Trans.Reader
|
|
|
|
( ReaderT, runReaderT )
|
2020-08-10 14:38:27 +00:00
|
|
|
|
|
|
|
-- MetaBrush
|
2020-11-12 17:34:46 +00:00
|
|
|
import Math.Bezier.Spline
|
2020-11-14 22:32:23 +00:00
|
|
|
( Spline(..), KnownSplineType )
|
2020-08-19 21:34:43 +00:00
|
|
|
import Math.Bezier.Stroke
|
2020-11-12 17:34:46 +00:00
|
|
|
( CachedStroke )
|
2020-09-08 23:23:25 +00:00
|
|
|
import Math.Module
|
2020-11-12 17:34:46 +00:00
|
|
|
( Module
|
|
|
|
( origin, (^+^), (^-^), (*^) )
|
|
|
|
, Inner((^.^))
|
|
|
|
, squaredNorm, quadrance
|
|
|
|
)
|
2020-08-10 14:38:27 +00:00
|
|
|
import Math.Vector2D
|
2020-09-05 22:35:00 +00:00
|
|
|
( Point2D(..), Vector2D(..) )
|
2020-11-14 22:32:23 +00:00
|
|
|
import MetaBrush.Brush
|
|
|
|
( Brush, BrushReference )
|
2020-11-12 17:34:46 +00:00
|
|
|
import {-# SOURCE #-} MetaBrush.Document.Serialise
|
|
|
|
( Serialisable(..) )
|
|
|
|
import MetaBrush.MetaParameter.AST
|
2020-11-14 22:32:23 +00:00
|
|
|
( STypesI(..) )
|
2020-11-12 17:34:46 +00:00
|
|
|
import MetaBrush.MetaParameter.Interpolation
|
|
|
|
( Interpolatable(..) ) -- + orphan instances
|
2020-09-08 23:23:25 +00:00
|
|
|
import MetaBrush.UI.Viewport
|
|
|
|
( Ruler(..) )
|
2020-08-16 22:09:16 +00:00
|
|
|
import MetaBrush.Unique
|
2020-09-08 23:23:25 +00:00
|
|
|
( UniqueSupply, Unique, freshUnique )
|
2020-08-10 14:38:27 +00:00
|
|
|
|
2020-08-04 06:15:06 +00:00
|
|
|
--------------------------------------------------------------------------------
|
|
|
|
|
2020-08-10 14:38:27 +00:00
|
|
|
data AABB
|
|
|
|
= AABB
|
2020-08-23 22:40:16 +00:00
|
|
|
{ topLeft, botRight :: !( Point2D Double ) }
|
2020-09-10 16:43:42 +00:00
|
|
|
deriving stock ( Show, Generic )
|
|
|
|
deriving anyclass NFData
|
2020-08-10 14:38:27 +00:00
|
|
|
|
2020-09-08 23:23:25 +00:00
|
|
|
mkAABB :: Point2D Double -> Point2D Double -> AABB
|
|
|
|
mkAABB ( Point2D x1 y1 ) ( Point2D x2 y2 ) = AABB ( Point2D xmin ymin ) ( Point2D xmax ymax )
|
|
|
|
where
|
|
|
|
( xmin, xmax )
|
|
|
|
| x1 > x2 = ( x2, x1 )
|
|
|
|
| otherwise = ( x1, x2 )
|
|
|
|
( ymin, ymax )
|
|
|
|
| y1 > y2 = ( y2, y1 )
|
|
|
|
| otherwise = ( y1, y2 )
|
|
|
|
|
2020-09-10 16:43:42 +00:00
|
|
|
-- | Document, together with some extra metadata.
|
2020-08-04 06:15:06 +00:00
|
|
|
data Document
|
|
|
|
= Document
|
2020-09-10 16:43:42 +00:00
|
|
|
{ displayName :: !Text
|
|
|
|
, mbFilePath :: !( Maybe FilePath )
|
|
|
|
, viewportCenter :: !( Point2D Double )
|
|
|
|
, zoomFactor :: !Double
|
|
|
|
, documentUnique :: Unique
|
|
|
|
, documentContent :: !DocumentContent
|
2020-11-14 22:32:23 +00:00
|
|
|
, documentBrushes :: !( Map Unique Brush )
|
2020-09-10 16:43:42 +00:00
|
|
|
}
|
|
|
|
deriving stock ( Show, Generic )
|
|
|
|
deriving anyclass NFData
|
|
|
|
|
2020-11-12 17:34:46 +00:00
|
|
|
-- | Main content of document (data which we kept track of throughout history).
|
2020-09-10 16:43:42 +00:00
|
|
|
data DocumentContent
|
|
|
|
= Content
|
|
|
|
{ unsavedChanges :: !Bool
|
|
|
|
, latestChange :: !Text
|
|
|
|
, guides :: !( Map Unique Guide )
|
|
|
|
, strokes :: ![ Stroke ]
|
|
|
|
}
|
|
|
|
deriving stock ( Show, Generic )
|
|
|
|
deriving anyclass NFData
|
2020-08-10 14:38:27 +00:00
|
|
|
|
2020-11-12 17:34:46 +00:00
|
|
|
type StrokeSpline ty brushParams = Spline ty CachedStroke ( PointData brushParams )
|
|
|
|
|
|
|
|
data Stroke where
|
|
|
|
Stroke
|
|
|
|
:: ( KnownSplineType clo
|
|
|
|
, pointParams ~ Super.Rec pointFields, STypesI pointFields
|
|
|
|
, Show pointParams, NFData pointParams
|
|
|
|
, Interpolatable pointParams
|
|
|
|
, Serialisable pointParams
|
|
|
|
)
|
|
|
|
=>
|
2020-11-14 22:32:23 +00:00
|
|
|
{ strokeName :: !Text
|
|
|
|
, strokeVisible :: !Bool
|
|
|
|
, strokeUnique :: Unique
|
|
|
|
, strokeBrushRef :: !( BrushReference pointFields )
|
|
|
|
, strokeSpline :: !( StrokeSpline clo pointParams )
|
2020-11-12 17:34:46 +00:00
|
|
|
}
|
|
|
|
-> Stroke
|
|
|
|
deriving stock instance Show Stroke
|
|
|
|
instance NFData Stroke where
|
2020-11-14 22:32:23 +00:00
|
|
|
rnf ( Stroke { strokeName, strokeVisible, strokeUnique, strokeBrushRef, strokeSpline } )
|
2020-11-12 17:34:46 +00:00
|
|
|
= deepseq strokeSpline
|
2020-11-14 22:32:23 +00:00
|
|
|
. deepseq strokeBrushRef
|
2020-11-12 17:34:46 +00:00
|
|
|
. deepseq strokeUnique
|
|
|
|
. deepseq strokeVisible
|
|
|
|
$ rnf strokeName
|
|
|
|
|
|
|
|
_strokeSpline
|
|
|
|
:: forall f
|
|
|
|
. Functor f
|
|
|
|
=> ( forall clo pointParams pointFields
|
|
|
|
. ( KnownSplineType clo
|
|
|
|
, Show pointParams, NFData pointParams
|
|
|
|
, pointParams ~ Super.Rec pointFields, STypesI pointFields
|
|
|
|
, Interpolatable pointParams
|
|
|
|
, Serialisable pointParams
|
|
|
|
)
|
|
|
|
=> StrokeSpline clo pointParams
|
|
|
|
-> f ( StrokeSpline clo pointParams )
|
|
|
|
)
|
|
|
|
-> Stroke -> f Stroke
|
|
|
|
_strokeSpline f ( Stroke { strokeSpline = oldStrokeSpline, .. } )
|
|
|
|
= ( \ newSpline -> Stroke { strokeSpline = newSpline, .. } ) <$> f oldStrokeSpline
|
|
|
|
|
|
|
|
overStrokeSpline
|
|
|
|
:: ( forall clo pointParams pointFields
|
|
|
|
. ( KnownSplineType clo
|
|
|
|
, Show pointParams, NFData pointParams
|
|
|
|
, pointParams ~ Super.Rec pointFields, STypesI pointFields
|
|
|
|
, Interpolatable pointParams
|
|
|
|
, Serialisable pointParams
|
|
|
|
)
|
|
|
|
=> StrokeSpline clo pointParams
|
|
|
|
-> StrokeSpline clo pointParams
|
|
|
|
)
|
|
|
|
-> Stroke -> Stroke
|
|
|
|
overStrokeSpline f = coerce ( _strokeSpline @Identity ( coerce . f ) )
|
|
|
|
|
|
|
|
|
|
|
|
data PointData params
|
2020-08-19 21:34:43 +00:00
|
|
|
= PointData
|
2020-11-12 17:34:46 +00:00
|
|
|
{ pointCoords :: !( Point2D Double )
|
|
|
|
, pointState :: FocusState
|
|
|
|
, brushParams :: !params
|
2020-08-13 17:05:19 +00:00
|
|
|
}
|
2020-08-15 17:11:52 +00:00
|
|
|
deriving stock ( Show, Generic )
|
2020-09-10 16:43:42 +00:00
|
|
|
deriving anyclass NFData
|
2020-08-10 22:07:09 +00:00
|
|
|
|
2020-08-20 01:57:26 +00:00
|
|
|
data BrushPointData
|
|
|
|
= BrushPointData
|
|
|
|
{ brushPointState :: FocusState }
|
|
|
|
deriving stock ( Show, Generic )
|
2020-09-10 16:43:42 +00:00
|
|
|
deriving anyclass NFData
|
2020-08-20 01:57:26 +00:00
|
|
|
|
2020-08-13 17:05:19 +00:00
|
|
|
data FocusState
|
|
|
|
= Normal
|
|
|
|
| Hover
|
|
|
|
| Selected
|
2020-09-10 16:43:42 +00:00
|
|
|
deriving stock ( Show, Eq, Generic )
|
|
|
|
deriving anyclass NFData
|
2020-08-10 22:07:09 +00:00
|
|
|
|
2020-09-08 23:23:25 +00:00
|
|
|
instance Semigroup FocusState where
|
|
|
|
Selected <> _ = Selected
|
|
|
|
Normal <> s = s
|
|
|
|
_ <> Selected = Selected
|
|
|
|
s <> Normal = s
|
|
|
|
_ <> _ = Hover
|
|
|
|
instance Monoid FocusState where
|
|
|
|
mempty = Normal
|
|
|
|
|
2020-09-01 19:56:59 +00:00
|
|
|
emptyDocument :: Text -> Unique -> Document
|
|
|
|
emptyDocument docName unique =
|
|
|
|
Document
|
2020-09-10 16:43:42 +00:00
|
|
|
{ displayName = docName
|
|
|
|
, mbFilePath = Nothing
|
|
|
|
, viewportCenter = Point2D 0 0
|
|
|
|
, zoomFactor = 1
|
|
|
|
, documentUnique = unique
|
|
|
|
, documentContent =
|
|
|
|
Content
|
|
|
|
{ unsavedChanges = False
|
|
|
|
, latestChange = "New document"
|
|
|
|
, strokes = []
|
|
|
|
, guides = Map.empty
|
|
|
|
}
|
2020-11-14 22:32:23 +00:00
|
|
|
, documentBrushes = Map.empty
|
2020-09-01 19:56:59 +00:00
|
|
|
}
|
2020-09-08 23:23:25 +00:00
|
|
|
|
|
|
|
--------------------------------------------------------------------------------
|
|
|
|
|
|
|
|
data HoverContext
|
|
|
|
= MouseHover !( Point2D Double )
|
|
|
|
| RectangleHover !AABB
|
2020-09-10 16:43:42 +00:00
|
|
|
deriving stock ( Show, Generic )
|
|
|
|
deriving anyclass NFData
|
2020-09-08 23:23:25 +00:00
|
|
|
|
|
|
|
instance Act ( Vector2D Double ) HoverContext where
|
|
|
|
v • MouseHover p = MouseHover ( v • p )
|
|
|
|
v • RectangleHover ( AABB p1 p2 ) = RectangleHover ( AABB ( v • p1 ) ( v • p2 ) )
|
|
|
|
|
|
|
|
instance Act ( Vector2D Double ) ( Maybe HoverContext ) where
|
|
|
|
(•) v = fmap ( v • )
|
|
|
|
|
|
|
|
class Hoverable a where
|
|
|
|
hovered :: Maybe HoverContext -> Double -> a -> FocusState
|
|
|
|
|
|
|
|
instance Hoverable ( Point2D Double ) where
|
|
|
|
hovered Nothing _ _ = Normal
|
|
|
|
hovered ( Just ( MouseHover p ) ) zoom q
|
|
|
|
| quadrance @( Vector2D Double ) p q * zoom ^ ( 2 :: Int ) < 16
|
|
|
|
= Hover
|
|
|
|
| otherwise
|
|
|
|
= Normal
|
|
|
|
hovered ( Just ( RectangleHover ( AABB ( Point2D x1 y1 ) ( Point2D x2 y2 ) ) ) ) _ ( Point2D x y )
|
|
|
|
| x >= x1 && x <= x2 && y >= y1 && y <= y2
|
|
|
|
= Hover
|
|
|
|
| otherwise
|
|
|
|
= Normal
|
|
|
|
|
2020-11-12 17:34:46 +00:00
|
|
|
class HasSelection pt where
|
|
|
|
_selection :: Lens' pt FocusState
|
|
|
|
instance HasSelection ( PointData brushParams ) where
|
|
|
|
_selection = field' @"pointState"
|
|
|
|
instance HasSelection BrushPointData where
|
|
|
|
_selection = field' @"brushPointState"
|
|
|
|
|
|
|
|
_coords :: Lens' ( PointData brushParams ) ( Point2D Double )
|
|
|
|
_coords = field' @"pointCoords"
|
|
|
|
|
|
|
|
coords :: PointData brushParams -> Point2D Double
|
|
|
|
coords = view _coords
|
|
|
|
|
|
|
|
data FocusDifference
|
|
|
|
= DifferentFocus
|
|
|
|
| SameFocus
|
|
|
|
deriving stock ( Show, Generic )
|
|
|
|
deriving anyclass NFData
|
|
|
|
|
|
|
|
instance Semigroup FocusDifference where
|
|
|
|
SameFocus <> SameFocus = SameFocus
|
|
|
|
_ <> _ = DifferentFocus
|
|
|
|
|
|
|
|
instance Monoid FocusDifference where
|
|
|
|
mempty = SameFocus
|
|
|
|
|
|
|
|
instance Group FocusDifference where
|
|
|
|
invert = id
|
|
|
|
|
|
|
|
data DiffPointData diffBrushParams
|
|
|
|
= DiffPointData
|
|
|
|
{ diffVector :: !( Vector2D Double )
|
|
|
|
, diffParams :: !diffBrushParams
|
|
|
|
, diffState :: !FocusDifference
|
|
|
|
}
|
|
|
|
deriving stock ( Show, Generic, Generic1, Functor, Foldable, Traversable )
|
|
|
|
deriving anyclass ( NFData, NFData1 )
|
|
|
|
|
|
|
|
instance Module Double diffBrushParams => Semigroup ( DiffPointData diffBrushParams ) where
|
|
|
|
DiffPointData v1 p1 s1 <> DiffPointData v2 p2 s2 =
|
|
|
|
DiffPointData ( v1 <> v2 ) ( p1 ^+^ p2 ) ( s1 <> s2 )
|
|
|
|
instance Module Double diffBrushParams => Monoid ( DiffPointData diffBrushParams ) where
|
|
|
|
mempty = DiffPointData mempty origin mempty
|
|
|
|
instance Module Double diffBrushParams => Group ( DiffPointData diffBrushParams ) where
|
|
|
|
invert ( DiffPointData v1 p1 s1 ) =
|
|
|
|
DiffPointData ( invert v1 ) ( (-1) *^ p1 ) ( invert s1 )
|
|
|
|
|
|
|
|
instance ( Module Double diffBrushParams, Act diffBrushParams brushParams )
|
|
|
|
=> Act ( DiffPointData diffBrushParams ) ( PointData brushParams ) where
|
|
|
|
(•) ( DiffPointData { diffVector = dp, diffParams = db, diffState = focusDiff } )
|
|
|
|
= over _coords ( dp • )
|
|
|
|
. over ( field' @"brushParams" ) ( db • )
|
|
|
|
. ( case focusDiff of { SameFocus -> id; DifferentFocus -> set ( field' @"pointState" ) Normal } )
|
|
|
|
instance ( Module Double diffBrushParams, Torsor diffBrushParams brushParams )
|
|
|
|
=> Torsor ( DiffPointData diffBrushParams ) ( PointData brushParams ) where
|
|
|
|
( PointData { pointCoords = p1, brushParams = b1, pointState = s1 } ) <-- ( PointData { pointCoords = p2, brushParams = b2, pointState = s2 } ) =
|
|
|
|
DiffPointData
|
|
|
|
{ diffVector = p1 <-- p2
|
|
|
|
, diffParams = b1 <-- b2
|
|
|
|
, diffState = if s1 == s2 then SameFocus else DifferentFocus
|
|
|
|
}
|
|
|
|
instance Module Double brushParams => Module Double ( DiffPointData brushParams ) where
|
|
|
|
origin = mempty
|
|
|
|
(^+^) = (<>)
|
|
|
|
x ^-^ y = x <> invert y
|
|
|
|
d *^ DiffPointData v1 p1 s1 = DiffPointData ( d *^ v1 ) ( d *^ p1 ) s1
|
|
|
|
|
|
|
|
|
2020-09-08 23:23:25 +00:00
|
|
|
--------------------------------------------------------------------------------
|
|
|
|
-- Guides.
|
|
|
|
|
|
|
|
data Guide
|
|
|
|
= Guide
|
|
|
|
{ guidePoint :: !( Point2D Double ) -- ^ point on the guide line
|
|
|
|
, guideNormal :: !( Vector2D Double ) -- ^ /normalised/ normal vector of the guide
|
|
|
|
, guideFocus :: !FocusState
|
|
|
|
, guideUnique :: Unique
|
|
|
|
}
|
2020-09-10 16:43:42 +00:00
|
|
|
deriving stock ( Show, Generic )
|
|
|
|
deriving anyclass NFData
|
2020-09-08 23:23:25 +00:00
|
|
|
|
|
|
|
-- | Try to select a guide at the given document coordinates.
|
|
|
|
selectedGuide :: Point2D Double -> Document -> Maybe Guide
|
2020-09-10 16:43:42 +00:00
|
|
|
selectedGuide c ( Document { zoomFactor, documentContent = Content { guides } } ) =
|
2020-09-08 23:23:25 +00:00
|
|
|
\case { Min ( Arg _ g ) -> g } <$> foldMap ( selectGuide_maybe c zoomFactor ) guides
|
|
|
|
|
|
|
|
selectGuide_maybe :: Point2D Double -> Double -> Guide -> Maybe ( ArgMin Double Guide )
|
|
|
|
selectGuide_maybe c zoom guide@( Guide { guidePoint = p, guideNormal = n } )
|
|
|
|
| sqDist * zoom ^ ( 2 :: Int ) < 4
|
|
|
|
= Just ( Min ( Arg sqDist guide ) )
|
|
|
|
| otherwise
|
|
|
|
= Nothing
|
|
|
|
where
|
|
|
|
t :: Double
|
|
|
|
t = ( c --> p ) ^.^ n
|
|
|
|
sqDist :: Double
|
|
|
|
sqDist = t ^ ( 2 :: Int ) / squaredNorm n
|
|
|
|
|
|
|
|
-- | Add new guide after a mouse drag from a ruler area.
|
|
|
|
addGuide :: UniqueSupply -> Ruler -> Point2D Double -> Document -> STM Document
|
2020-11-12 17:34:46 +00:00
|
|
|
addGuide uniqueSupply ruler p doc = ( `runReaderT` uniqueSupply ) $ ( field' @"documentContent" . field' @"guides" ) insertNewGuides doc
|
2020-09-08 23:23:25 +00:00
|
|
|
where
|
2020-11-12 17:34:46 +00:00
|
|
|
insertNewGuides :: Map Unique Guide -> ReaderT UniqueSupply STM ( Map Unique Guide )
|
2020-09-08 23:23:25 +00:00
|
|
|
insertNewGuides gs = case ruler of
|
|
|
|
RulerCorner
|
|
|
|
-> do
|
2020-11-12 17:34:46 +00:00
|
|
|
uniq1 <- freshUnique
|
|
|
|
uniq2 <- freshUnique
|
2020-09-08 23:23:25 +00:00
|
|
|
let
|
|
|
|
guide1, guide2 :: Guide
|
|
|
|
guide1 = Guide { guidePoint = p, guideNormal = Vector2D 0 1, guideFocus = Normal, guideUnique = uniq1 }
|
|
|
|
guide2 = Guide { guidePoint = p, guideNormal = Vector2D 1 0, guideFocus = Normal, guideUnique = uniq2 }
|
|
|
|
pure ( Map.insert uniq2 guide2 . Map.insert uniq1 guide1 $ gs )
|
|
|
|
TopRuler
|
|
|
|
-> do
|
2020-11-12 17:34:46 +00:00
|
|
|
uniq1 <- freshUnique
|
2020-09-08 23:23:25 +00:00
|
|
|
let
|
|
|
|
guide1 :: Guide
|
|
|
|
guide1 = Guide { guidePoint = p, guideNormal = Vector2D 0 1, guideFocus = Normal, guideUnique = uniq1 }
|
|
|
|
pure ( Map.insert uniq1 guide1 gs )
|
|
|
|
LeftRuler
|
|
|
|
-> do
|
2020-11-12 17:34:46 +00:00
|
|
|
uniq2 <- freshUnique
|
2020-09-08 23:23:25 +00:00
|
|
|
let
|
|
|
|
guide2 :: Guide
|
|
|
|
guide2 = Guide { guidePoint = p, guideNormal = Vector2D 1 0, guideFocus = Normal, guideUnique = uniq2 }
|
|
|
|
pure ( Map.insert uniq2 guide2 gs )
|
|
|
|
|
|
|
|
instance Hoverable Guide where
|
|
|
|
hovered ( Just ( MouseHover c ) ) zoom guide
|
|
|
|
| Just _ <- selectGuide_maybe c zoom guide
|
|
|
|
= Hover
|
|
|
|
| otherwise
|
|
|
|
= Normal
|
|
|
|
hovered _ _ _ = Normal
|