mirror of
https://gitlab.com/sheaf/metabrush.git
synced 2024-11-05 14:53:37 +00:00
WIP 2
This commit is contained in:
parent
e2e5296bd1
commit
dae99934ec
|
@ -233,6 +233,8 @@ executable MetaBrush
|
||||||
^>= 0.5
|
^>= 0.5
|
||||||
, unordered-containers
|
, unordered-containers
|
||||||
>= 0.2.11 && < 0.2.14
|
>= 0.2.11 && < 0.2.14
|
||||||
|
, vector
|
||||||
|
>= 0.12 && < 0.13
|
||||||
, waargonaut
|
, waargonaut
|
||||||
^>= 0.8.0.2
|
^>= 0.8.0.2
|
||||||
|
|
||||||
|
|
|
@ -9,8 +9,6 @@
|
||||||
{-# LANGUAGE RecursiveDo #-}
|
{-# LANGUAGE RecursiveDo #-}
|
||||||
{-# LANGUAGE TypeApplications #-}
|
{-# LANGUAGE TypeApplications #-}
|
||||||
|
|
||||||
{-# OPTIONS_GHC -fplugin=Data.Record.Anonymous.Plugin #-}
|
|
||||||
|
|
||||||
module MetaBrush.Application
|
module MetaBrush.Application
|
||||||
( runApplication )
|
( runApplication )
|
||||||
where
|
where
|
||||||
|
@ -67,12 +65,6 @@ import qualified GI.GLib as GLib
|
||||||
-- gi-gtk
|
-- gi-gtk
|
||||||
import qualified GI.Gtk as GTK
|
import qualified GI.Gtk as GTK
|
||||||
|
|
||||||
-- large-anon
|
|
||||||
import Data.Record.Anonymous
|
|
||||||
( I(..) )
|
|
||||||
import qualified Data.Record.Anonymous as Rec
|
|
||||||
( empty, insert )
|
|
||||||
|
|
||||||
-- lens
|
-- lens
|
||||||
import Control.Lens
|
import Control.Lens
|
||||||
( (.~) )
|
( (.~) )
|
||||||
|
@ -125,7 +117,9 @@ import MetaBrush.Document.Update
|
||||||
import MetaBrush.Event
|
import MetaBrush.Event
|
||||||
( handleEvents )
|
( handleEvents )
|
||||||
import MetaBrush.Records
|
import MetaBrush.Records
|
||||||
( Rec )
|
( Rec, I(..) )
|
||||||
|
import qualified MetaBrush.Records as Rec
|
||||||
|
( empty, insert )
|
||||||
import MetaBrush.Render.Document
|
import MetaBrush.Render.Document
|
||||||
( blankRender, getDocumentRender )
|
( blankRender, getDocumentRender )
|
||||||
import MetaBrush.Render.Rulers
|
import MetaBrush.Render.Rulers
|
||||||
|
|
|
@ -13,8 +13,6 @@
|
||||||
{-# LANGUAGE TypeApplications #-}
|
{-# LANGUAGE TypeApplications #-}
|
||||||
{-# LANGUAGE TypeOperators #-}
|
{-# LANGUAGE TypeOperators #-}
|
||||||
|
|
||||||
{-# OPTIONS_GHC -fplugin GHC.TypeLits.KnownNat.Solver #-}
|
|
||||||
|
|
||||||
module MetaBrush.Brush
|
module MetaBrush.Brush
|
||||||
( Brush(..), SomeBrush(..)
|
( Brush(..), SomeBrush(..)
|
||||||
, BrushFunction
|
, BrushFunction
|
||||||
|
@ -31,10 +29,6 @@ import GHC.Exts
|
||||||
import Unsafe.Coerce
|
import Unsafe.Coerce
|
||||||
( unsafeCoerce )
|
( unsafeCoerce )
|
||||||
|
|
||||||
-- containers
|
|
||||||
import qualified Data.Map.Strict as Map
|
|
||||||
( fromList )
|
|
||||||
|
|
||||||
-- deepseq
|
-- deepseq
|
||||||
import Control.DeepSeq
|
import Control.DeepSeq
|
||||||
( NFData(..), deepseq )
|
( NFData(..), deepseq )
|
||||||
|
@ -43,14 +37,6 @@ import Control.DeepSeq
|
||||||
import Data.Hashable
|
import Data.Hashable
|
||||||
( Hashable(..) )
|
( Hashable(..) )
|
||||||
|
|
||||||
-- large-anon
|
|
||||||
import Data.Record.Anonymous
|
|
||||||
( RecordDicts, Dict(..) )
|
|
||||||
import qualified Data.Record.Anonymous as Rec
|
|
||||||
( map )
|
|
||||||
import Data.Record.Anonymous.Internal
|
|
||||||
( Record(MkR) )
|
|
||||||
|
|
||||||
-- text
|
-- text
|
||||||
import Data.Text
|
import Data.Text
|
||||||
( Text )
|
( Text )
|
||||||
|
@ -69,9 +55,12 @@ import MetaBrush.DSL.Types
|
||||||
import MetaBrush.DSL.Interpolation
|
import MetaBrush.DSL.Interpolation
|
||||||
( Interpolatable(..) )
|
( Interpolatable(..) )
|
||||||
import MetaBrush.Records
|
import MetaBrush.Records
|
||||||
( Rec, WithParams(..)
|
( Rec, Record, WithParams(..)
|
||||||
, proveRecordDicts
|
, AllFields, KnownFields, Dict(..)
|
||||||
|
, recordFromList, proveRecordDicts
|
||||||
)
|
)
|
||||||
|
import qualified MetaBrush.Records as Rec
|
||||||
|
( map )
|
||||||
|
|
||||||
--------------------------------------------------------------------------------
|
--------------------------------------------------------------------------------
|
||||||
|
|
||||||
|
@ -134,7 +123,8 @@ data SomeBrushFields where
|
||||||
, rec ~ Rec kvs
|
, rec ~ Rec kvs
|
||||||
, Show rec, NFData rec
|
, Show rec, NFData rec
|
||||||
, Serialisable rec
|
, Serialisable rec
|
||||||
, RecordDicts kvs Interpolatable
|
, KnownFields kvs
|
||||||
|
, AllFields kvs Interpolatable
|
||||||
)
|
)
|
||||||
=> Proxy# kvs -> SomeBrushFields
|
=> Proxy# kvs -> SomeBrushFields
|
||||||
|
|
||||||
|
@ -154,17 +144,16 @@ reflectBrushFieldsNoDups elts =
|
||||||
mkField (SomeFieldSType px) = unsafeCoerce $ FieldSType px
|
mkField (SomeFieldSType px) = unsafeCoerce $ FieldSType px
|
||||||
in
|
in
|
||||||
proveSomeSTypes (map (second mkSomeSType) elts) \ ( px :: Proxy# kvs ) ->
|
proveSomeSTypes (map (second mkSomeSType) elts) \ ( px :: Proxy# kvs ) ->
|
||||||
|
recordFromList @FieldSType @kvs (map (Text.unpack *** mkField) elts) \ dictsRec ->
|
||||||
let
|
let
|
||||||
dictsRec :: Record FieldSType kvs
|
|
||||||
dictsRec = MkR (Map.fromList $ map (Text.unpack *** mkField) elts)
|
|
||||||
showDicts :: Record (Dict Show) kvs
|
showDicts :: Record (Dict Show) kvs
|
||||||
showDicts = Rec.map ( \ ( ( FieldSType ( _ :: Proxy# a ) ) ) -> Dict @Show @a ) dictsRec
|
showDicts = Rec.map ( \ ( FieldSType ( _ :: Proxy# a ) ) -> Dict @Show @a ) dictsRec
|
||||||
nfDataDicts :: Record (Dict NFData) kvs
|
nfDataDicts :: Record (Dict NFData) kvs
|
||||||
nfDataDicts = Rec.map ( \ ( ( FieldSType ( _ :: Proxy# a ) ) ) -> Dict @NFData @a ) dictsRec
|
nfDataDicts = Rec.map ( \ ( FieldSType ( _ :: Proxy# a ) ) -> Dict @NFData @a ) dictsRec
|
||||||
serialisableDicts :: Record (Dict Serialisable) kvs
|
serialisableDicts :: Record (Dict Serialisable) kvs
|
||||||
serialisableDicts = Rec.map ( \ ( ( FieldSType ( _ :: Proxy# a ) ) ) -> Dict @Serialisable @a ) dictsRec
|
serialisableDicts = Rec.map ( \ ( FieldSType ( _ :: Proxy# a ) ) -> Dict @Serialisable @a ) dictsRec
|
||||||
interpolatableDicts :: Record (Dict Interpolatable) kvs
|
interpolatableDicts :: Record (Dict Interpolatable) kvs
|
||||||
interpolatableDicts = Rec.map ( \ ( ( FieldSType ( _ :: Proxy# a ) ) ) -> Dict @Interpolatable @a ) dictsRec
|
interpolatableDicts = Rec.map ( \ ( FieldSType ( _ :: Proxy# a ) ) -> Dict @Interpolatable @a ) dictsRec
|
||||||
in
|
in
|
||||||
proveRecordDicts @Show showDicts $
|
proveRecordDicts @Show showDicts $
|
||||||
proveRecordDicts @NFData nfDataDicts $
|
proveRecordDicts @NFData nfDataDicts $
|
||||||
|
|
|
@ -21,7 +21,6 @@
|
||||||
{-# LANGUAGE TypeOperators #-}
|
{-# LANGUAGE TypeOperators #-}
|
||||||
{-# LANGUAGE UndecidableInstances #-}
|
{-# LANGUAGE UndecidableInstances #-}
|
||||||
|
|
||||||
{-# OPTIONS_GHC -fplugin GHC.TypeLits.KnownNat.Solver #-}
|
|
||||||
{-# OPTIONS_GHC -Wno-unrecognised-pragmas #-}
|
{-# OPTIONS_GHC -Wno-unrecognised-pragmas #-}
|
||||||
|
|
||||||
module MetaBrush.DSL.AST
|
module MetaBrush.DSL.AST
|
||||||
|
@ -56,10 +55,6 @@ import Data.Tree
|
||||||
import Control.DeepSeq
|
import Control.DeepSeq
|
||||||
( NFData(..) )
|
( NFData(..) )
|
||||||
|
|
||||||
-- large-anon
|
|
||||||
import Data.Record.Anonymous
|
|
||||||
( Record )
|
|
||||||
|
|
||||||
-- text
|
-- text
|
||||||
import Data.Text
|
import Data.Text
|
||||||
( Text )
|
( Text )
|
||||||
|
@ -79,7 +74,7 @@ import Math.Bezier.Spline
|
||||||
import MetaBrush.DSL.Types
|
import MetaBrush.DSL.Types
|
||||||
( STypeI(..) )
|
( STypeI(..) )
|
||||||
import MetaBrush.Records
|
import MetaBrush.Records
|
||||||
( WithParams, foldRec )
|
( Record, WithParams, foldRec )
|
||||||
import MetaBrush.Unique
|
import MetaBrush.Unique
|
||||||
( Unique )
|
( Unique )
|
||||||
|
|
||||||
|
|
|
@ -37,11 +37,6 @@ import qualified Data.Map.Strict as Map
|
||||||
import Data.Generics.Product.Fields
|
import Data.Generics.Product.Fields
|
||||||
( field' )
|
( field' )
|
||||||
|
|
||||||
-- large-anon
|
|
||||||
import Data.Record.Anonymous
|
|
||||||
( Record, I(..) )
|
|
||||||
import qualified Data.Record.Anonymous as Rec
|
|
||||||
|
|
||||||
-- lens
|
-- lens
|
||||||
import Control.Lens
|
import Control.Lens
|
||||||
( assign, modifying, use )
|
( assign, modifying, use )
|
||||||
|
@ -83,9 +78,12 @@ import MetaBrush.DSL.Types
|
||||||
import MetaBrush.DSL.Rename
|
import MetaBrush.DSL.Rename
|
||||||
( UniqueName(..) )
|
( UniqueName(..) )
|
||||||
import MetaBrush.Records
|
import MetaBrush.Records
|
||||||
( Rec, WithParams(..)
|
( Record, Rec, WithParams(..)
|
||||||
|
, I(..)
|
||||||
, foldRec
|
, foldRec
|
||||||
)
|
)
|
||||||
|
import qualified MetaBrush.Records as Rec
|
||||||
|
( map, zipWith, mapM )
|
||||||
import MetaBrush.Unique
|
import MetaBrush.Unique
|
||||||
( Unique )
|
( Unique )
|
||||||
|
|
||||||
|
|
|
@ -35,17 +35,15 @@ import Data.Act
|
||||||
import Data.Group
|
import Data.Group
|
||||||
( Group(..) )
|
( Group(..) )
|
||||||
|
|
||||||
-- large-anon
|
|
||||||
import Data.Record.Anonymous
|
|
||||||
( Record, RecordDicts, I(..) )
|
|
||||||
import qualified Data.Record.Anonymous as Rec
|
|
||||||
( cpure, cmap, czipWith )
|
|
||||||
|
|
||||||
-- MetaBrush
|
-- MetaBrush
|
||||||
import Math.Module
|
import Math.Module
|
||||||
( Module(..) )
|
( Module(..) )
|
||||||
import Math.Vector2D
|
import Math.Vector2D
|
||||||
( Point2D, Vector2D )
|
( Point2D, Vector2D )
|
||||||
|
import MetaBrush.Records
|
||||||
|
( Record, KnownFields, AllFields, I(..) )
|
||||||
|
import qualified MetaBrush.Records as Rec
|
||||||
|
( cpure, cmap, czipWith )
|
||||||
|
|
||||||
--------------------------------------------------------------------------------
|
--------------------------------------------------------------------------------
|
||||||
|
|
||||||
|
@ -77,28 +75,28 @@ instance Interpolatable a => Module Double (D a) where
|
||||||
D a ^+^ D b = D (a ^+^ b)
|
D a ^+^ D b = D (a ^+^ b)
|
||||||
d *^ D a = D (d *^ a)
|
d *^ D a = D (d *^ a)
|
||||||
|
|
||||||
instance RecordDicts kvs Interpolatable
|
instance AllFields kvs Interpolatable
|
||||||
=> Semigroup (Record D kvs) where
|
=> Semigroup (Record D kvs) where
|
||||||
(<>) = Rec.czipWith (Proxy @Interpolatable) (<>)
|
(<>) = Rec.czipWith (Proxy @Interpolatable) (<>)
|
||||||
instance RecordDicts kvs Interpolatable
|
instance (KnownFields kvs, AllFields kvs Interpolatable)
|
||||||
=> Monoid (Record D kvs) where
|
=> Monoid (Record D kvs) where
|
||||||
mempty = Rec.cpure (Proxy @Interpolatable) mempty
|
mempty = Rec.cpure (Proxy @Interpolatable) mempty
|
||||||
instance RecordDicts kvs Interpolatable
|
instance (KnownFields kvs, AllFields kvs Interpolatable)
|
||||||
=> Group (Record D kvs) where
|
=> Group (Record D kvs) where
|
||||||
invert = Rec.cmap (Proxy @Interpolatable) invert
|
invert = Rec.cmap (Proxy @Interpolatable) invert
|
||||||
|
|
||||||
instance RecordDicts kvs Interpolatable
|
instance AllFields kvs Interpolatable
|
||||||
=> Act (Record D kvs) (Record I kvs) where
|
=> Act (Record D kvs) (Record I kvs) where
|
||||||
act = Rec.czipWith (Proxy @Interpolatable) act
|
act = Rec.czipWith (Proxy @Interpolatable) act
|
||||||
instance RecordDicts kvs Interpolatable
|
instance (KnownFields kvs, AllFields kvs Interpolatable)
|
||||||
=> Torsor (Record D kvs) (Record I kvs) where
|
=> Torsor (Record D kvs) (Record I kvs) where
|
||||||
(-->) = Rec.czipWith (Proxy @Interpolatable) (-->)
|
(-->) = Rec.czipWith (Proxy @Interpolatable) (-->)
|
||||||
instance RecordDicts kvs Interpolatable
|
instance (KnownFields kvs, AllFields kvs Interpolatable)
|
||||||
=> Module Double (Record D kvs) where
|
=> Module Double (Record D kvs) where
|
||||||
origin = Rec.cpure (Proxy @Interpolatable) origin
|
origin = Rec.cpure (Proxy @Interpolatable) origin
|
||||||
(^+^) = Rec.czipWith (Proxy @Interpolatable) (^+^)
|
(^+^) = Rec.czipWith (Proxy @Interpolatable) (^+^)
|
||||||
d *^ r = Rec.cmap (Proxy @Interpolatable) (d *^) r
|
d *^ r = Rec.cmap (Proxy @Interpolatable) (d *^) r
|
||||||
|
|
||||||
instance RecordDicts kvs Interpolatable
|
instance (KnownFields kvs, AllFields kvs Interpolatable)
|
||||||
=> Interpolatable (Record I kvs) where
|
=> Interpolatable (Record I kvs) where
|
||||||
type Diff (Record I kvs) = Record D kvs
|
type Diff (Record I kvs) = Record D kvs
|
||||||
|
|
|
@ -15,8 +15,6 @@
|
||||||
{-# LANGUAGE TypeFamilyDependencies #-}
|
{-# LANGUAGE TypeFamilyDependencies #-}
|
||||||
{-# LANGUAGE UndecidableInstances #-}
|
{-# LANGUAGE UndecidableInstances #-}
|
||||||
|
|
||||||
{-# OPTIONS_GHC -fplugin GHC.TypeLits.KnownNat.Solver #-}
|
|
||||||
|
|
||||||
module MetaBrush.DSL.TypeCheck
|
module MetaBrush.DSL.TypeCheck
|
||||||
( typeCheck, MonadTc, TcM
|
( typeCheck, MonadTc, TcM
|
||||||
, TcMessage, TcError
|
, TcMessage, TcError
|
||||||
|
@ -43,8 +41,6 @@ import Unsafe.Coerce
|
||||||
-- containers
|
-- containers
|
||||||
import Data.Map.Strict
|
import Data.Map.Strict
|
||||||
( Map )
|
( Map )
|
||||||
import qualified Data.Map.Strict as Map
|
|
||||||
( fromList )
|
|
||||||
import Data.Sequence
|
import Data.Sequence
|
||||||
( Seq(..) )
|
( Seq(..) )
|
||||||
|
|
||||||
|
@ -56,13 +52,6 @@ import Data.DList
|
||||||
import Data.Generics.Product.Fields
|
import Data.Generics.Product.Fields
|
||||||
( field' )
|
( field' )
|
||||||
|
|
||||||
-- large-anon
|
|
||||||
import Data.Record.Anonymous
|
|
||||||
( Record
|
|
||||||
)
|
|
||||||
import Data.Record.Anonymous.Internal
|
|
||||||
( Record(MkR) )
|
|
||||||
|
|
||||||
-- lens
|
-- lens
|
||||||
import Control.Lens
|
import Control.Lens
|
||||||
( assign, at, use )
|
( assign, at, use )
|
||||||
|
@ -112,6 +101,8 @@ import MetaBrush.DSL.Types
|
||||||
)
|
)
|
||||||
import MetaBrush.DSL.Rename
|
import MetaBrush.DSL.Rename
|
||||||
( Env(..), UniqueName(..) )
|
( Env(..), UniqueName(..) )
|
||||||
|
import MetaBrush.Records
|
||||||
|
( Record, recordFromList )
|
||||||
import MetaBrush.Unique
|
import MetaBrush.Unique
|
||||||
( UniqueSupply, MonadUnique, Unique )
|
( UniqueSupply, MonadUnique, Unique )
|
||||||
|
|
||||||
|
@ -297,11 +288,13 @@ withDeclsRecord decls f = do
|
||||||
let
|
let
|
||||||
mkSomeSType :: forall a. UniqueTerm a -> SomeSType
|
mkSomeSType :: forall a. UniqueTerm a -> SomeSType
|
||||||
mkSomeSType ( UniqueTerm {} ) = SomeSType @a proxy#
|
mkSomeSType ( UniqueTerm {} ) = SomeSType @a proxy#
|
||||||
proveSomeSTypes (map (second mkSomeSType) names) \ ( _ :: Proxy# kvs ) -> do
|
return $
|
||||||
let
|
proveSomeSTypes (map (second mkSomeSType) names) \ ( _ :: Proxy# kvs ) ->
|
||||||
declsRecord :: Record UniqueTerm kvs
|
let
|
||||||
declsRecord = MkR (Map.fromList . map (first Text.unpack) $ names)
|
terms = map (first Text.unpack) $ names
|
||||||
return $ f declsRecord
|
in
|
||||||
|
recordFromList @UniqueTerm @kvs terms \ declsRecord ->
|
||||||
|
f declsRecord
|
||||||
|
|
||||||
getDeclName :: MonadTc m => Decl Tc -> m ( Text, UniqueTerm Any )
|
getDeclName :: MonadTc m => Decl Tc -> m ( Text, UniqueTerm Any )
|
||||||
getDeclName ( ValDecl pat ( Located eqLoc _ ) term ) = case pat of
|
getDeclName ( ValDecl pat ( Located eqLoc _ ) term ) = case pat of
|
||||||
|
|
|
@ -74,10 +74,6 @@ import Data.Generics.Product.Fields
|
||||||
import Data.Group
|
import Data.Group
|
||||||
( Group(..) )
|
( Group(..) )
|
||||||
|
|
||||||
-- large-anon
|
|
||||||
import Data.Record.Anonymous
|
|
||||||
( RecordDicts )
|
|
||||||
|
|
||||||
-- lens
|
-- lens
|
||||||
import Control.Lens
|
import Control.Lens
|
||||||
( Lens'
|
( Lens'
|
||||||
|
@ -118,7 +114,7 @@ import MetaBrush.DSL.Types
|
||||||
import MetaBrush.DSL.Interpolation
|
import MetaBrush.DSL.Interpolation
|
||||||
( Interpolatable(..) )
|
( Interpolatable(..) )
|
||||||
import MetaBrush.Records
|
import MetaBrush.Records
|
||||||
( Rec )
|
( Rec, KnownFields, AllFields )
|
||||||
import MetaBrush.UI.Viewport
|
import MetaBrush.UI.Viewport
|
||||||
( Ruler(..) )
|
( Ruler(..) )
|
||||||
import MetaBrush.Unique
|
import MetaBrush.Unique
|
||||||
|
@ -199,7 +195,8 @@ data Stroke where
|
||||||
, pointParams ~ Rec pointFields
|
, pointParams ~ Rec pointFields
|
||||||
, STypesI pointFields, STypesI brushFields
|
, STypesI pointFields, STypesI brushFields
|
||||||
, Show pointParams, NFData pointParams
|
, Show pointParams, NFData pointParams
|
||||||
, RecordDicts pointFields Interpolatable
|
, KnownFields pointFields
|
||||||
|
, AllFields pointFields Interpolatable
|
||||||
, Serialisable pointParams
|
, Serialisable pointParams
|
||||||
)
|
)
|
||||||
=>
|
=>
|
||||||
|
@ -225,7 +222,8 @@ _strokeSpline
|
||||||
=> ( forall clo pointParams pointFields
|
=> ( forall clo pointParams pointFields
|
||||||
. ( KnownSplineType clo
|
. ( KnownSplineType clo
|
||||||
, Show pointParams, NFData pointParams
|
, Show pointParams, NFData pointParams
|
||||||
, RecordDicts pointFields Interpolatable
|
, KnownFields pointFields
|
||||||
|
, AllFields pointFields Interpolatable
|
||||||
, pointParams ~ Rec pointFields, STypesI pointFields
|
, pointParams ~ Rec pointFields, STypesI pointFields
|
||||||
, Serialisable pointParams
|
, Serialisable pointParams
|
||||||
)
|
)
|
||||||
|
@ -240,7 +238,8 @@ overStrokeSpline
|
||||||
:: ( forall clo pointParams pointFields
|
:: ( forall clo pointParams pointFields
|
||||||
. ( KnownSplineType clo
|
. ( KnownSplineType clo
|
||||||
, Show pointParams, NFData pointParams
|
, Show pointParams, NFData pointParams
|
||||||
, RecordDicts pointFields Interpolatable
|
, KnownFields pointFields
|
||||||
|
, AllFields pointFields Interpolatable
|
||||||
, pointParams ~ Rec pointFields, STypesI pointFields
|
, pointParams ~ Rec pointFields, STypesI pointFields
|
||||||
, Serialisable pointParams
|
, Serialisable pointParams
|
||||||
)
|
)
|
||||||
|
|
|
@ -10,8 +10,6 @@
|
||||||
{-# LANGUAGE ScopedTypeVariables #-}
|
{-# LANGUAGE ScopedTypeVariables #-}
|
||||||
{-# LANGUAGE TypeApplications #-}
|
{-# LANGUAGE TypeApplications #-}
|
||||||
|
|
||||||
{-# OPTIONS_GHC -fplugin=Data.Record.Anonymous.Plugin #-}
|
|
||||||
|
|
||||||
module MetaBrush.Document.Draw
|
module MetaBrush.Document.Draw
|
||||||
( DrawAnchor(..), anchorsAreComplementary
|
( DrawAnchor(..), anchorsAreComplementary
|
||||||
, getOrCreateDrawAnchor, addToAnchor
|
, getOrCreateDrawAnchor, addToAnchor
|
||||||
|
@ -43,12 +41,6 @@ import Control.DeepSeq
|
||||||
import Data.Generics.Product.Fields
|
import Data.Generics.Product.Fields
|
||||||
( field, field' )
|
( field, field' )
|
||||||
|
|
||||||
-- large-anon
|
|
||||||
import Data.Record.Anonymous
|
|
||||||
( RecordDicts )
|
|
||||||
import qualified Data.Record.Anonymous as Rec
|
|
||||||
( empty )
|
|
||||||
|
|
||||||
-- lens
|
-- lens
|
||||||
import Control.Lens
|
import Control.Lens
|
||||||
( set, over, mapped )
|
( set, over, mapped )
|
||||||
|
@ -97,7 +89,11 @@ import MetaBrush.DSL.Types
|
||||||
import MetaBrush.DSL.Interpolation
|
import MetaBrush.DSL.Interpolation
|
||||||
( Interpolatable )
|
( Interpolatable )
|
||||||
import MetaBrush.Records
|
import MetaBrush.Records
|
||||||
( Rec )
|
( Rec
|
||||||
|
, KnownFields, AllFields
|
||||||
|
)
|
||||||
|
import qualified MetaBrush.Records as Rec
|
||||||
|
( empty )
|
||||||
import MetaBrush.Unique
|
import MetaBrush.Unique
|
||||||
( Unique, UniqueSupply, freshUnique, uniqueText )
|
( Unique, UniqueSupply, freshUnique, uniqueText )
|
||||||
|
|
||||||
|
@ -261,7 +257,8 @@ withAnchorBrushData
|
||||||
, STypesI pointFields, STypesI brushFields
|
, STypesI pointFields, STypesI brushFields
|
||||||
, Show pointParams, NFData pointParams
|
, Show pointParams, NFData pointParams
|
||||||
, Serialisable pointParams
|
, Serialisable pointParams
|
||||||
, RecordDicts pointFields Interpolatable
|
, KnownFields pointFields
|
||||||
|
, AllFields pointFields Interpolatable
|
||||||
)
|
)
|
||||||
=> Maybe (Brush brushFields)
|
=> Maybe (Brush brushFields)
|
||||||
-> pointParams
|
-> pointParams
|
||||||
|
|
|
@ -87,14 +87,6 @@ import System.FilePath
|
||||||
import Data.Generics.Product.Typed
|
import Data.Generics.Product.Typed
|
||||||
( HasType(typed) )
|
( HasType(typed) )
|
||||||
|
|
||||||
-- large-anon
|
|
||||||
import Data.Record.Anonymous
|
|
||||||
( Record, RecordDicts(..)
|
|
||||||
, K(..), I(..), unI
|
|
||||||
)
|
|
||||||
import qualified Data.Record.Anonymous as Rec
|
|
||||||
( collapse )
|
|
||||||
|
|
||||||
-- lens
|
-- lens
|
||||||
import Control.Lens
|
import Control.Lens
|
||||||
( view )
|
( view )
|
||||||
|
@ -190,9 +182,11 @@ import MetaBrush.DSL.Types
|
||||||
import MetaBrush.DSL.Driver
|
import MetaBrush.DSL.Driver
|
||||||
( SomeBrushFunction(..), interpretBrush )
|
( SomeBrushFunction(..), interpretBrush )
|
||||||
import MetaBrush.Records
|
import MetaBrush.Records
|
||||||
( Rec, WithParams
|
( Record, Rec, WithParams
|
||||||
, cpureM, cmapWithKey
|
, KnownFields, AllFields, K(..), I(..), unI
|
||||||
|
, cpureM, cmapWithKey, collapse
|
||||||
)
|
)
|
||||||
|
|
||||||
import MetaBrush.Unique
|
import MetaBrush.Unique
|
||||||
( Unique, UniqueSupply, freshUnique )
|
( Unique, UniqueSupply, freshUnique )
|
||||||
import qualified Paths_MetaBrush as Cabal
|
import qualified Paths_MetaBrush as Cabal
|
||||||
|
@ -275,13 +269,13 @@ instance Serialisable a => Serialisable (I a) where
|
||||||
encoder = contramap unI encoder
|
encoder = contramap unI encoder
|
||||||
decoder = fmap I decoder
|
decoder = fmap I decoder
|
||||||
|
|
||||||
instance ( RecordDicts kvs Serialisable )
|
instance ( KnownFields kvs, AllFields kvs Serialisable )
|
||||||
=> Serialisable ( Record I kvs ) where
|
=> Serialisable ( Record I kvs ) where
|
||||||
encoder :: forall f. Monad f => JSON.Encoder f ( Rec kvs )
|
encoder :: forall f. Monad f => JSON.Encoder f ( Rec kvs )
|
||||||
encoder = contramap encodeFields ( JSON.Encoder.keyValueTupleFoldable JSON.Encoder.json )
|
encoder = contramap encodeFields ( JSON.Encoder.keyValueTupleFoldable JSON.Encoder.json )
|
||||||
where
|
where
|
||||||
encodeFields :: Record I kvs -> [ ( Text, Json ) ]
|
encodeFields :: Record I kvs -> [ ( Text, Json ) ]
|
||||||
encodeFields = Rec.collapse . cmapWithKey (Proxy @Serialisable) keyVal
|
encodeFields = collapse . cmapWithKey (Proxy @Serialisable) keyVal
|
||||||
keyVal :: (Serialisable x, KnownSymbol k) => Proxy k -> I x -> K (Text, Json) x
|
keyVal :: (Serialisable x, KnownSymbol k) => Proxy k -> I x -> K (Text, Json) x
|
||||||
keyVal k (I x) = K ( Text.pack $ symbolVal k, JSON.Encoder.runPureEncoder encoder x )
|
keyVal k (I x) = K ( Text.pack $ symbolVal k, JSON.Encoder.runPureEncoder encoder x )
|
||||||
|
|
||||||
|
|
|
@ -6,10 +6,6 @@ module MetaBrush.Document.Serialise
|
||||||
( Serialisable(..) )
|
( Serialisable(..) )
|
||||||
where
|
where
|
||||||
|
|
||||||
-- large-anon
|
|
||||||
import Data.Record.Anonymous
|
|
||||||
( Record, RecordDicts, I )
|
|
||||||
|
|
||||||
-- waargonaut
|
-- waargonaut
|
||||||
import qualified Waargonaut.Decode as JSON
|
import qualified Waargonaut.Decode as JSON
|
||||||
( Decoder )
|
( Decoder )
|
||||||
|
@ -19,6 +15,8 @@ import qualified Waargonaut.Encode as JSON
|
||||||
-- MetaBrush
|
-- MetaBrush
|
||||||
import Math.Vector2D
|
import Math.Vector2D
|
||||||
( Point2D, Vector2D )
|
( Point2D, Vector2D )
|
||||||
|
import MetaBrush.Records
|
||||||
|
( Record, KnownFields, AllFields, I )
|
||||||
|
|
||||||
--------------------------------------------------------------------------------
|
--------------------------------------------------------------------------------
|
||||||
|
|
||||||
|
@ -32,5 +30,5 @@ instance Serialisable a => Serialisable ( Point2D a )
|
||||||
|
|
||||||
instance Serialisable a => Serialisable ( Vector2D a )
|
instance Serialisable a => Serialisable ( Vector2D a )
|
||||||
|
|
||||||
instance ( RecordDicts kvs Serialisable )
|
instance ( KnownFields kvs, AllFields kvs Serialisable )
|
||||||
=> Serialisable ( Record I kvs ) where
|
=> Serialisable ( Record I kvs ) where
|
||||||
|
|
|
@ -6,6 +6,7 @@
|
||||||
{-# LANGUAGE FlexibleContexts #-}
|
{-# LANGUAGE FlexibleContexts #-}
|
||||||
{-# LANGUAGE FlexibleInstances #-}
|
{-# LANGUAGE FlexibleInstances #-}
|
||||||
{-# LANGUAGE GADTs #-}
|
{-# LANGUAGE GADTs #-}
|
||||||
|
{-# LANGUAGE MagicHash #-}
|
||||||
{-# LANGUAGE MultiParamTypeClasses #-}
|
{-# LANGUAGE MultiParamTypeClasses #-}
|
||||||
{-# LANGUAGE NamedFieldPuns #-}
|
{-# LANGUAGE NamedFieldPuns #-}
|
||||||
{-# LANGUAGE PolyKinds #-}
|
{-# LANGUAGE PolyKinds #-}
|
||||||
|
@ -18,11 +19,29 @@
|
||||||
|
|
||||||
{-# OPTIONS_GHC -Wno-orphans #-}
|
{-# OPTIONS_GHC -Wno-orphans #-}
|
||||||
|
|
||||||
module MetaBrush.Records where
|
module MetaBrush.Records
|
||||||
|
( Rec, WithParams(..)
|
||||||
|
, cpureM, cmapWithKey, foldRec
|
||||||
|
, recordFromList
|
||||||
|
, proveRecordDicts
|
||||||
|
, MyIntersection(..), myIntersect
|
||||||
|
|
||||||
|
-- * Re-exports
|
||||||
|
, Record, KnownFields, AllFields
|
||||||
|
, I(..), unI, K(..), Dict(..)
|
||||||
|
, Rec.empty
|
||||||
|
, Rec.map, Rec.mapM, Rec.zipWith, Rec.collapse
|
||||||
|
, Rec.cpure, Rec.cmap, Rec.czipWith
|
||||||
|
)
|
||||||
|
where
|
||||||
|
|
||||||
-- base
|
-- base
|
||||||
|
import Control.Monad.ST
|
||||||
|
( runST )
|
||||||
import Data.Coerce
|
import Data.Coerce
|
||||||
( coerce )
|
( coerce )
|
||||||
|
import Data.Foldable
|
||||||
|
( for_ )
|
||||||
import Data.Functor.Const
|
import Data.Functor.Const
|
||||||
( Const(..) )
|
( Const(..) )
|
||||||
import Data.Functor.Product
|
import Data.Functor.Product
|
||||||
|
@ -60,19 +79,88 @@ import Data.Group
|
||||||
( Group(..) )
|
( Group(..) )
|
||||||
|
|
||||||
-- large-anon
|
-- large-anon
|
||||||
import Data.Record.Anonymous
|
import Data.Record.Anonymous.Advanced
|
||||||
( Record , RecordDicts(..)
|
( Record )
|
||||||
, Dict(..), I(..), K(..)
|
import qualified Data.Record.Anonymous.Advanced as Rec
|
||||||
)
|
( empty, insert
|
||||||
import Data.Record.Anonymous.Internal
|
, map, mapM, zipWith
|
||||||
( Record(MkR) )
|
, cpure, cmap, czipWith, collapse
|
||||||
import qualified Data.Record.Anonymous as Rec
|
)
|
||||||
( mapM, cpure, cmap, czipWith, collapse )
|
import Data.Record.Anonymous.Internal.Canonical
|
||||||
|
( Canonical(..), withShapeOf )
|
||||||
|
import qualified Data.Record.Anonymous.Internal.Combinators.Simple as Simple
|
||||||
|
import Data.Record.Anonymous.Internal.Constraints
|
||||||
|
( Constrained(..), constrain )
|
||||||
|
import Data.Record.Anonymous.Internal.Record
|
||||||
|
( canonicalize, unsafeFromCanonical )
|
||||||
|
import Data.Record.Anonymous.Internal.Row
|
||||||
|
( AllFields(fieldDicts), KnownFields )
|
||||||
|
|
||||||
|
-- large-generics
|
||||||
|
import Data.Record.Generic
|
||||||
|
( Dict(..), I(..), unI, K(..) )
|
||||||
|
|
||||||
|
-- vector
|
||||||
|
import qualified Data.Vector as Boxed
|
||||||
|
( Vector )
|
||||||
|
import qualified Data.Vector.Mutable as Boxed.MVector
|
||||||
|
import qualified Data.Vector as Boxed.Vector
|
||||||
|
|
||||||
--------------------------------------------------------------------------------
|
--------------------------------------------------------------------------------
|
||||||
|
|
||||||
-- This instance only uses RecordDicts and not generic metadata.
|
data NextOffsets = NextOffsets { nextOffsetsArray :: ByteArray# }
|
||||||
instance {-# OVERLAPPING #-} RecordDicts kvs Show => Show (Record I kvs) where
|
|
||||||
|
type KnownFields :: [(Symbol, Type)] -> Constraint
|
||||||
|
class KnownFields kvs where
|
||||||
|
fieldNames :: Array ShortText
|
||||||
|
nextOffsets :: NextOffsets
|
||||||
|
|
||||||
|
type AllFields :: (Type -> Constraint) -> [(Symbol, Type)] -> Constraint
|
||||||
|
class AllFields kvs c where
|
||||||
|
allFieldsDict :: Array (Dict (c Any))
|
||||||
|
|
||||||
|
type Record :: (Type -> Type) -> [(Symbol, Type)] -> Type
|
||||||
|
data Record f kvs = UnsafeMkRecord { recordArray :: ByteArray }
|
||||||
|
|
||||||
|
|
||||||
|
nextOffset :: NextOffsets -> Int# -> Int#
|
||||||
|
nextOffset ( NextOffsets { nextOffsetsArray = ba } ) i
|
||||||
|
= indexIntArray# ba i
|
||||||
|
|
||||||
|
lastIndex :: NextOffsets -> Int#
|
||||||
|
lastIndex ( NextOffsets { nextOffsetsArray = PrimArray ba } ) =
|
||||||
|
((sizeofByteArray# ba) `div#` sizeOf# (undefined :: Int)) -# 1#
|
||||||
|
|
||||||
|
cpureM
|
||||||
|
:: forall c m f kvs
|
||||||
|
. ( PrimMonad m, KnownFields kvs, AllFields c kvs )
|
||||||
|
=> ( forall x. c x => m (f x) )
|
||||||
|
-> m ( Record f kvs )
|
||||||
|
cpureM f = do
|
||||||
|
let !nxts = nextOffsets @nxt
|
||||||
|
!last_i = lastIndex nxt
|
||||||
|
!sz = nextOffset nxts last_i
|
||||||
|
!dicts = allFieldsDict @kvs @c
|
||||||
|
mba <- newByteArray sz
|
||||||
|
let
|
||||||
|
go :: Int# -> Int# -> m ()
|
||||||
|
go i off
|
||||||
|
| isTrue# (i ># last_i)
|
||||||
|
= return ()
|
||||||
|
| otherwise
|
||||||
|
= do
|
||||||
|
case indexArray dicts (I# i) of
|
||||||
|
(Dict :: Dict (c x)) -> do
|
||||||
|
v <- f @x
|
||||||
|
writeByteArray mba v
|
||||||
|
go (i +# 1) (nextOffset nxts i)
|
||||||
|
go 0# 0#
|
||||||
|
ba <- freezeByteArray mba
|
||||||
|
pure $ UnsafeMkRecord { recordArray = ba }
|
||||||
|
|
||||||
|
|
||||||
|
-- This instance only uses AllFields and not generic metadata.
|
||||||
|
instance {-# OVERLAPPING #-} (KnownFields kvs, AllFields kvs Show) => Show (Record I kvs) where
|
||||||
showsPrec d =
|
showsPrec d =
|
||||||
aux
|
aux
|
||||||
. Rec.collapse
|
. Rec.collapse
|
||||||
|
@ -103,29 +191,31 @@ foldRec f r = coerce $ Rec.mapM g r
|
||||||
g :: ( forall x. f x -> Const (Endo y) (I x) )
|
g :: ( forall x. f x -> Const (Endo y) (I x) )
|
||||||
g x = coerce (f x)
|
g x = coerce (f x)
|
||||||
|
|
||||||
instance RecordDicts kvs Semigroup
|
instance AllFields kvs Semigroup
|
||||||
=> Semigroup (Record I kvs) where
|
=> Semigroup (Record I kvs) where
|
||||||
(<>) = Rec.czipWith (Proxy @Semigroup) (<>)
|
(<>) = Rec.czipWith (Proxy @Semigroup) (<>)
|
||||||
|
|
||||||
instance ( RecordDicts kvs Semigroup
|
instance ( KnownFields kvs
|
||||||
, RecordDicts kvs Monoid )
|
, AllFields kvs Semigroup
|
||||||
|
, AllFields kvs Monoid )
|
||||||
=> Monoid (Record I kvs) where
|
=> Monoid (Record I kvs) where
|
||||||
mempty = Rec.cpure (Proxy @Monoid) mempty
|
mempty = Rec.cpure (Proxy @Monoid) mempty
|
||||||
|
|
||||||
instance ( RecordDicts kvs Semigroup
|
instance ( KnownFields kvs
|
||||||
, RecordDicts kvs Monoid
|
, AllFields kvs Semigroup
|
||||||
, RecordDicts kvs Group )
|
, AllFields kvs Monoid
|
||||||
|
, AllFields kvs Group )
|
||||||
=> Group (Record I kvs) where
|
=> Group (Record I kvs) where
|
||||||
invert = Rec.cmap (Proxy @Group) ( \ (I g) -> I (invert g) )
|
invert = Rec.cmap (Proxy @Group) ( \ (I g) -> I (invert g) )
|
||||||
|
|
||||||
instance RecordDicts kvs NFData
|
instance AllFields kvs NFData
|
||||||
=> NFData ( Record I kvs ) where
|
=> NFData ( Record I kvs ) where
|
||||||
rnf _ = () -- TODO
|
rnf _ = () -- TODO
|
||||||
|
|
||||||
data MyIntersection r1 g r2 c where
|
data MyIntersection r1 g r2 c where
|
||||||
MyIntersection
|
MyIntersection
|
||||||
:: forall i r1 g r2 c
|
:: forall i r1 g r2 c
|
||||||
. ( RecordDicts i c )
|
. ( KnownFields i, AllFields i c )
|
||||||
=> { myProject :: forall f. Record f r1 -> Record (f `Product` g) i
|
=> { myProject :: forall f. Record f r1 -> Record (f `Product` g) i
|
||||||
, myInject :: Record g i -> Record g r2
|
, myInject :: Record g i -> Record g r2
|
||||||
}
|
}
|
||||||
|
@ -133,9 +223,11 @@ data MyIntersection r1 g r2 c where
|
||||||
|
|
||||||
myIntersect
|
myIntersect
|
||||||
:: forall c r1 g r2
|
:: forall c r1 g r2
|
||||||
. ( RecordDicts r1 c )
|
. ( AllFields r1 c )
|
||||||
=> Record g r2
|
=> Record g r2
|
||||||
-> MyIntersection r1 g r2 c
|
-> MyIntersection r1 g r2 c
|
||||||
|
myIntersect = undefined -- TODO
|
||||||
|
{-
|
||||||
myIntersect (MkR r2) =
|
myIntersect (MkR r2) =
|
||||||
proveRecordDicts @c @Any intersectionDict
|
proveRecordDicts @c @Any intersectionDict
|
||||||
( MyIntersection { myProject, myInject } )
|
( MyIntersection { myProject, myInject } )
|
||||||
|
@ -148,45 +240,64 @@ myIntersect (MkR r2) =
|
||||||
intersectionDict =
|
intersectionDict =
|
||||||
case recordDicts @r1 @c Proxy of
|
case recordDicts @r1 @c Proxy of
|
||||||
MkR d -> MkR (Map.intersection d r2)
|
MkR d -> MkR (Map.intersection d r2)
|
||||||
|
-}
|
||||||
|
|
||||||
cpureM ::
|
cpureM
|
||||||
(Applicative m, RecordDicts r c)
|
:: forall c m f r
|
||||||
|
. (Applicative m, KnownFields r, AllFields r c)
|
||||||
=> Proxy c
|
=> Proxy c
|
||||||
-> (forall x. c x => m (f x))
|
-> (forall x. c x => m (f x))
|
||||||
-> m (Record f r)
|
-> m (Record f r)
|
||||||
cpureM p f = Rec.mapM (\Dict -> f) (recordDicts p)
|
cpureM p f = Simple.mapM aux (constrain p (Simple.pure (K ())))
|
||||||
|
where
|
||||||
|
aux :: Constrained c (K ()) x -> m (f x)
|
||||||
|
aux (Constrained _) = f
|
||||||
|
|
||||||
cmapWithKey ::
|
cmapWithKey ::
|
||||||
forall c r f g
|
forall c r f g
|
||||||
. RecordDicts r c
|
. (KnownFields r, AllFields r c)
|
||||||
=> Proxy c
|
=> Proxy c
|
||||||
-> (forall k x. (c x, KnownSymbol k) => Proxy k -> f x -> g x)
|
-> (forall k x. (c x, KnownSymbol k) => Proxy k -> f x -> g x)
|
||||||
-> Record f r
|
-> Record f r
|
||||||
-> Record g r
|
-> Record g r
|
||||||
cmapWithKey p f =
|
cmapWithKey p f =
|
||||||
zipWithKey ( \ px Dict x -> f px x ) (recordDicts p)
|
zipWithKey ( \ px (Constrained _) x -> f px x ) (constrain p (Simple.pure (K ())))
|
||||||
|
|
||||||
zipWithKey ::
|
zipWithKey ::
|
||||||
forall r f g h
|
forall r f g h
|
||||||
. ( forall k x. KnownSymbol k => Proxy k -> f x -> g x -> h x )
|
. ( forall k x. KnownSymbol k => Proxy k -> f x -> g x -> h x )
|
||||||
-> Record f r -> Record g r -> Record h r
|
-> Record f r -> Record g r -> Record h r
|
||||||
zipWithKey f (MkR a) (MkR b) = MkR $
|
zipWithKey f r1 r2
|
||||||
Map.intersectionWithKey g a b
|
| Canonical { canonFields = flds, canonValues = vals1 } <- canonicalize r1
|
||||||
where
|
, c2@( Canonical { canonValues = vals2 } ) <- canonicalize r2
|
||||||
g :: String -> f x -> g x -> h x
|
= let
|
||||||
g s = case someSymbolVal s of
|
vec :: Boxed.Vector (h Any)
|
||||||
SomeSymbol px -> f px
|
vec = runST do
|
||||||
|
mvec <- Boxed.MVector.unsafeNew (Boxed.Vector.length vals2)
|
||||||
|
for_ flds \ (fld, i) ->
|
||||||
|
let v1 = vals1 Boxed.Vector.! i
|
||||||
|
v2 = vals2 Boxed.Vector.! i
|
||||||
|
in
|
||||||
|
case someSymbolVal fld of
|
||||||
|
SomeSymbol px ->
|
||||||
|
Boxed.MVector.unsafeWrite mvec i (f px v1 v2)
|
||||||
|
Boxed.Vector.unsafeFreeze mvec
|
||||||
|
in unsafeFromCanonical (withShapeOf c2 vec)
|
||||||
|
|
||||||
proveRecordDicts :: forall c r x. Record (Dict c) r -> (RecordDicts r c => x) -> x
|
proveRecordDicts :: forall c r x. Record (Dict c) r -> (AllFields r c => x) -> x
|
||||||
proveRecordDicts r f = case myDict of { MyDict -> f }
|
proveRecordDicts r f = case myDict of { MyDict -> f }
|
||||||
where
|
where
|
||||||
myDict :: MyDict r c
|
myDict :: MyDict r c
|
||||||
myDict = unsafeCoerce ( MyDict' $ RecordDictsDict ( const $ unsafeCoerce r ) )
|
myDict = unsafeCoerce ( MyDict' $ RecordDictsDict ( \ _ _ -> unsafeCoerce r ) )
|
||||||
|
|
||||||
-- Dictionary passing nonsense.
|
-- Dictionary passing nonsense.
|
||||||
newtype RecordDictsDict r c
|
newtype RecordDictsDict r c
|
||||||
= RecordDictsDict (Proxy c -> Record (Dict c) r)
|
= RecordDictsDict (Proxy r -> Proxy c -> Record (Dict c) r)
|
||||||
data MyDict r c where
|
data MyDict r c where
|
||||||
MyDict :: RecordDicts r c => MyDict r c
|
MyDict :: AllFields r c => MyDict r c
|
||||||
data MyDict' r c where
|
data MyDict' r c where
|
||||||
MyDict' :: RecordDictsDict r c -> MyDict' r c
|
MyDict' :: RecordDictsDict r c -> MyDict' r c
|
||||||
|
|
||||||
|
|
||||||
|
recordFromList :: forall f kvs r. [(String, f Any)] -> ( KnownFields kvs => Record f kvs -> r ) -> r
|
||||||
|
recordFromList _ _ = undefined
|
||||||
|
|
|
@ -65,15 +65,6 @@ import Generic.Data
|
||||||
-- gi-cairo-render
|
-- gi-cairo-render
|
||||||
import qualified GI.Cairo.Render as Cairo
|
import qualified GI.Cairo.Render as Cairo
|
||||||
|
|
||||||
-- large-anon
|
|
||||||
import Data.Record.Anonymous
|
|
||||||
( Record
|
|
||||||
|
|
||||||
, I
|
|
||||||
)
|
|
||||||
import qualified Data.Record.Anonymous as Rec
|
|
||||||
( map )
|
|
||||||
|
|
||||||
-- lens
|
-- lens
|
||||||
import Control.Lens
|
import Control.Lens
|
||||||
( view )
|
( view )
|
||||||
|
@ -134,9 +125,12 @@ import MetaBrush.Document.Update
|
||||||
import MetaBrush.DSL.Interpolation
|
import MetaBrush.DSL.Interpolation
|
||||||
( Interpolatable, DRec )
|
( Interpolatable, DRec )
|
||||||
import MetaBrush.Records
|
import MetaBrush.Records
|
||||||
( Rec, WithParams(..)
|
( Record, Rec, WithParams(..)
|
||||||
, MyIntersection (..), myIntersect
|
, MyIntersection (..), myIntersect
|
||||||
|
, I(..)
|
||||||
)
|
)
|
||||||
|
import qualified MetaBrush.Records as Rec
|
||||||
|
( map )
|
||||||
import MetaBrush.UI.ToolBar
|
import MetaBrush.UI.ToolBar
|
||||||
( Mode(..) )
|
( Mode(..) )
|
||||||
import MetaBrush.Unique
|
import MetaBrush.Unique
|
||||||
|
|
Loading…
Reference in a new issue