Sync with ghc-8.2.2 and megaparsec-6.3.0.
authorJulien Moutinho <julm+symantic@autogeree.net>
Tue, 13 Feb 2018 04:38:24 +0000 (05:38 +0100)
committerJulien Moutinho <julm+symantic@autogeree.net>
Tue, 13 Feb 2018 04:49:53 +0000 (05:49 +0100)
43 files changed:
GNUmakefile
HLint.hs
symantic-document/stack.yaml
symantic-grammar/Language/Symantic/Grammar/ContextFree.hs
symantic-grammar/Language/Symantic/Grammar/EBNF.hs
symantic-grammar/Language/Symantic/Grammar/Fixity.hs
symantic-grammar/Language/Symantic/Grammar/Operators.hs
symantic-grammar/Language/Symantic/Grammar/Regular.hs
symantic-grammar/Language/Symantic/Grammar/Terminal.hs
symantic-grammar/Language/Symantic/Grammar/Test.hs
symantic-grammar/stack.yaml
symantic-grammar/symantic-grammar.cabal
symantic-lib/Language/Symantic/Compiling/Test.hs
symantic-lib/Language/Symantic/Grammar/Megaparsec.hs
symantic-lib/Language/Symantic/Lib/Alternative.hs
symantic-lib/Language/Symantic/Lib/Applicative.hs
symantic-lib/Language/Symantic/Lib/Applicative/Test.hs
symantic-lib/Language/Symantic/Lib/Char.hs
symantic-lib/Language/Symantic/Lib/Foldable.hs
symantic-lib/Language/Symantic/Lib/Foldable/Test.hs
symantic-lib/Language/Symantic/Lib/Functor/Test.hs
symantic-lib/Language/Symantic/Lib/Map/Test.hs
symantic-lib/Language/Symantic/Lib/MonoFunctor/Test.hs
symantic-lib/Language/Symantic/Lib/Test.hs
symantic-lib/Language/Symantic/Lib/Text.hs
symantic-lib/Language/Symantic/Lib/Tuple2/Test.hs
symantic-lib/Language/Symantic/Lib/Unit.hs
symantic-lib/Language/Symantic/Typing/Test.hs
symantic-lib/stack.yaml
symantic/Language/Symantic/Compiling/Beta.hs
symantic/Language/Symantic/Compiling/Grammar.hs
symantic/Language/Symantic/Compiling/Module.hs
symantic/Language/Symantic/Compiling/Term.hs
symantic/Language/Symantic/Interpreting/View.hs
symantic/Language/Symantic/Typing/Document.hs
symantic/Language/Symantic/Typing/Grammar.hs
symantic/Language/Symantic/Typing/Peano.hs
symantic/Language/Symantic/Typing/Type.hs
symantic/Language/Symantic/Typing/Unify.hs
symantic/Language/Symantic/Typing/Variable.hs
symantic/README.md
symantic/stack.yaml
symantic/symantic.cabal

index b29029b2fdc23a29e7b531ab230e6923d5af1d79..36d2a3382e902d64d80abba96501e879d1694818 100644 (file)
@@ -1,5 +1,5 @@
 PKGS := symantic-grammar symantic-document symantic symantic-lib
-HS := $(shell find $(PKGS) -name '*.hs')
+HS := $(shell find $(PKGS) -name '*.hs' -not -name 'HLint.hs')
 
 all: build
 
@@ -45,7 +45,7 @@ lint: $(PKGS:=/lint) $(HS)
        cd $*; if hlint --quiet --report=hlint.html -XNoCPP \
         $(shell cabal-cargs --format=ghc --only=default_extensions --sourcefile=$*) $(HLINT_FLAGS) .; \
        then rm -f hlint.html; \
-       else sensible-browser hlint.html & fi
+       else sensible-browser ./hlint.html & fi
 
 tag: $(PKGS:=/tag)
 %/tag:
index 0ebb5b37d4beb2d1dc6d2449e1bbeec1087f92df..e1ae96d2791a11dd653bb5d9ab40cd8423d7f5dc 100644 (file)
--- a/HLint.hs
+++ b/HLint.hs
@@ -6,9 +6,4 @@ ignore "Use import/export shortcut"
 ignore "Use fmap"
 
 -- BEGIN: generated hints
-infixl 5 `ebnf_arg`
-infixl 5 `setSource`
-infixl 9 :@
-infixr 0 :$
-infixr 5 `VarS`
 -- END: generated hints
index 5bbd150485fcf6bf52d131bfb756b7bbc1079d32..1adfccdb0295049cc1d8bc836e4a0130325b53a4 100644 (file)
@@ -1,3 +1,3 @@
-resolver: lts-9.0
+resolver: lts-10.5
 packages:
 - '.'
index 9f67fd580bc253d666db9773f179cdcf867d7c4a..cde5c6a51cc1469dfaec8c1bdad6817c77e3864c 100644 (file)
@@ -17,7 +17,7 @@ import Language.Symantic.Grammar.Regular
 -- * Type 'CF'
 -- | Context-free grammar.
 newtype CF g a = CF { unCF :: g a }
- deriving (IsString, Functor, Gram_Terminal, Applicative, Gram_App)
+ deriving (IsString, Functor, Gram_Char, Gram_String, Applicative, Gram_App)
 deriving instance Gram_Error err g => Gram_Error err (CF g)
 deriving instance Gram_Reader st g => Gram_Reader st (CF g)
 deriving instance Gram_State st g => Gram_State st (CF g)
@@ -111,7 +111,8 @@ instance Gram_AltApp EBNF where
 -- * Class 'Gram_Comment'
 -- | Symantics for handling comments after each 'lexeme'.
 class
- ( Gram_Terminal g
+ ( Gram_Char g
+ , Gram_String g
  , Gram_Rule g
  , Gram_Alt g
  , Gram_App g
@@ -119,8 +120,8 @@ class
  , Gram_CF g
  ) => Gram_Comment g where
        commentable :: g () -> g () -> g () -> g ()
-       commentable = rule3 "Commentable" $ \space line block ->
-               manySkip $ choice [space, line, block]
+       commentable = rule3 "Commentable" $ \sp line block ->
+               manySkip $ choice [sp, line, block]
        commentLine :: CF g String -> CF g String
        commentLine prefix = rule "CommentLine" $
                prefix *> many (any `minus` (void eol <+> eoi))
index 50cb2c8218119df16f940c121917248933bab83f..63d040fe29988d99c3db29ed4b9daece9e847935 100644 (file)
@@ -2,9 +2,8 @@ module Language.Symantic.Grammar.EBNF where
 
 import Control.Applicative (Applicative(..))
 import Control.Monad
-import Data.Semigroup hiding (option)
+import Data.Semigroup
 import Data.Text (Text)
-import Prelude hiding (any)
 import qualified Data.Text as Text
 
 import Language.Symantic.Grammar.Meta
index d11c163cac37cf21ec05efa1bf4a05227b6f0e6d..27645a36c3a7d6dd065b4e729c2de30552dec2aa 100644 (file)
@@ -1,9 +1,8 @@
 module Language.Symantic.Grammar.Fixity where
 
 import Data.Bool as Bool
-import Data.Semigroup hiding (option)
+import Data.Semigroup
 import Data.String (IsString(..))
-import Prelude hiding (any)
 
 -- * Type 'Fixity'
 data Fixity
index f8369d329c365f31957bfbd1d437e0f6874b2a0e..7c70819de3acbd04081742cf948fc73a27aef19c 100644 (file)
@@ -4,8 +4,7 @@ module Language.Symantic.Grammar.Operators where
 
 import Control.Applicative (Applicative(..))
 import Control.Monad (void)
-import Data.Foldable hiding (any)
-import Prelude hiding (any)
+import Data.Foldable
 
 import Language.Symantic.Grammar.Fixity
 import Language.Symantic.Grammar.EBNF
@@ -16,7 +15,8 @@ import Language.Symantic.Grammar.ContextFree
 -- * Class 'Gram_Op'
 -- | Symantics for operators.
 class
- ( Gram_Terminal g
+ ( Gram_Char g
+ , Gram_String g
  , Gram_Rule g
  , Gram_Alt g
  , Gram_Try g
index cf37c0c0dc407b20f5fcfd565a3085c34a9210b0..cd8def7c601c844cf8cbc655f728802f7e045810 100644 (file)
@@ -13,7 +13,7 @@ import Language.Symantic.Grammar.Terminal
 -- * Type 'Reg'
 -- | Left or right regular grammar.
 newtype Reg (lr::Side) g a = Reg { unReg :: g a }
- deriving (IsString, Functor, Gram_Terminal)
+ deriving (IsString, Functor, Gram_Char, Gram_String)
 deriving instance Gram_Alt g => Gram_Alt (Reg lr g)
 deriving instance Gram_Try g => Gram_Try (Reg lr g)
 deriving instance Gram_Rule g => Gram_Rule (Reg lr g)
index 5c6fa614821175c538b22040eabbd788ad14b865..b5ad4b9572aca18d819620b6100f2691b6c2ff25 100644 (file)
@@ -2,14 +2,13 @@
 -- | Symantics for terminal grammars.
 module Language.Symantic.Grammar.Terminal where
 
-import Control.Monad
 import Data.Semigroup (Semigroup(..))
 import Data.String (IsString(..))
-import Prelude hiding (any)
 import qualified Data.Bool as Bool
 import qualified Data.Char as Char
 import qualified Data.List as List
 import qualified Data.Text as Text
+import qualified Data.Text.Lazy as TL
 
 import Language.Symantic.Grammar.Fixity
 import Language.Symantic.Grammar.EBNF
@@ -18,28 +17,24 @@ import Language.Symantic.Grammar.EBNF
 -- | Terminal grammar.
 newtype Terminal g a
  =      Terminal { unTerminal :: g a }
- deriving (Functor, Gram_Terminal)
+ deriving (Functor, Gram_Char, Gram_String)
 deriving instance Gram_Rule g => Gram_Rule (Terminal g)
 
--- ** Class 'Gram_Terminal'
+-- ** Class 'Gram_Char'
 -- | Symantics for terminal grammars.
-class Gram_Rule g => Gram_Terminal g where
+class Gram_Rule g => Gram_Char g where
        any    :: g Char
        but    :: Terminal g Char -> Terminal g Char -> Terminal g Char
        eoi    :: g ()
        eol    :: g Char
        space  :: g Char
        char   :: Char -> g Char
-       string :: String -> g String
        unicat :: Unicat -> g Char
        range  :: (Char, Char) -> g Char
        eol   = rule "NewLine" $ char '\n'
        space = rule "Space" $ char ' '
-       -- string = foldr (\c -> (<*>) ((:) <$> char c)) (pure "")
-       -- string [] = pure []
-       -- string (c:cs) = (:) <$> char c <*> string cs
-deriving instance Gram_Terminal RuleEBNF
-instance Gram_Terminal EBNF where
+deriving instance Gram_Char RuleEBNF
+instance Gram_Char EBNF where
        any  = ebnf_const "_"
        Terminal (EBNF f) `but` Terminal (EBNF g) =
                Terminal $ EBNF $ \bo po -> parenInfix po op $
@@ -52,23 +47,12 @@ instance Gram_Terminal EBNF where
                where
                escape c | Char.isPrint c && c /= '"' = Text.concat $ ["\"", Text.singleton c, "\""]
                escape c = Text.concat ["U+", Text.pack $ show $ Char.ord c]
-       string s =
-               case List.break (\c -> Bool.not (Char.isPrint c) || c == '"') s of
-                (ps, "")   -> raw ps
-                ("", [c])  -> "" <$ char c
-                (ps, [c])  -> "" <$ raw ps <* char c
-                ("", c:rs) -> "" <$ char c <* string rs
-                (ps, c:rs) -> "" <$ raw ps <* char c <* string rs
-               where
-               raw cs = ebnf_const $ Text.concat $ ["\"", Text.pack cs, "\""]
        unicat = ebnf_const . Text.pack . show
        range (l, h) = ebnf_const $ Text.concat
         [ runEBNF $ char l
         , "…"
         , runEBNF $ char h
         ]
-instance IsString (EBNF String) where
-       fromString = string
 
 -- *** Type 'Unicat'
 -- | Unicode category.
@@ -115,3 +99,29 @@ unicode_categories c =
                 , Char.OtherSymbol
                 ]
         Unicat cat -> [cat]
+
+-- ** Class 'Gram_String'
+class Functor g => Gram_String g where
+       string   :: String -> g String
+       {-
+       string = foldr (\c -> (<*>) ((:) <$> char c)) (pure "")
+       string [] = pure []
+       string (c:cs) = (:) <$> char c <*> string cs
+       -}
+       text     :: Text.Text -> g Text.Text
+       textLazy :: TL.Text -> g TL.Text
+       text t     = Text.pack <$> string (Text.unpack t)
+       textLazy t = TL.pack   <$> string (TL.unpack t)
+deriving instance Gram_String RuleEBNF
+instance Gram_String EBNF where
+       string s =
+               case List.break (\c -> Bool.not (Char.isPrint c) || c == '"') s of
+                (ps, "")   -> raw ps
+                ("", [c])  -> "" <$ char c
+                (ps, [c])  -> "" <$ raw ps <* char c
+                ("", c:rs) -> "" <$ char c <* string rs
+                (ps, c:rs) -> "" <$ raw ps <* char c <* string rs
+               where
+               raw cs = ebnf_const $ Text.concat $ ["\"", Text.pack cs, "\""]
+instance IsString (EBNF String) where
+       fromString = string
index 14a219476cdd502d86747947750d61f728de99d0..dc1f71969fb971dfaff6703ba1b9f9e3dcd1abe2 100644 (file)
@@ -9,29 +9,30 @@ import Control.Applicative (Applicative(..))
 import Control.Monad
 import Data.Semigroup ((<>))
 import Data.String (IsString(..))
-import Prelude hiding (any, (^), exp)
 import qualified Control.Applicative as Gram_AltApp
 import qualified Data.Char as Char
 import qualified Data.Text as Text
 import qualified Text.Megaparsec as P
+import qualified Text.Megaparsec.Char as P
 
 import Language.Symantic.Grammar
 
 -- * Type 'ParsecT'
-type ParsecC e s = (P.Token s ~ Char, P.Stream s, P.ErrorComponent e)
-instance ParsecC e s => IsString (P.ParsecT e s m [Char]) where
-       fromString = P.string
+type ParsecC e s = (P.Token s ~ Char, P.Stream s, Ord e)
+instance (ParsecC e s, Gram_String (P.ParsecT e s m)) => IsString (P.ParsecT e s m String) where
+       fromString = string
 instance ParsecC e s => Gram_Rule (P.ParsecT e s m) where
        rule = P.label . Text.unpack
-instance ParsecC e s => Gram_Terminal (P.ParsecT e s m) where
+instance ParsecC e s => Gram_Char (P.ParsecT e s m) where
        any          = P.anyChar
        eoi          = P.eof
        char         = P.char
-       string       = P.string
        unicat cat   = P.satisfy $ (`elem` cats) . Char.generalCategory
                where cats = unicode_categories cat
        range (l, h) = P.satisfy $ \c -> l <= c && c <= h
        but (Terminal f) (Terminal p) = Terminal $ P.notFollowedBy (P.try p) *> f
+instance ParsecC e String => Gram_String (P.ParsecT e String m) where
+       string = P.string
 instance ParsecC e s => Gram_Alt (P.ParsecT e s m) where
        empty  = Gram_AltApp.empty
        (<+>)  = (Gram_AltApp.<|>)
@@ -48,18 +49,18 @@ instance ParsecC e s => Gram_CF (P.ParsecT e s m) where
        CF f <& Reg p      = CF $ P.lookAhead f <*> p
        Reg f &> CF p      = CF $ P.lookAhead f <*> p
        CF f `minus` Reg p = CF $ P.notFollowedBy (P.try p) *> f
-instance ParsecC e s => Gram_Comment (P.ParsecT e s m)
+instance ParsecC e String => Gram_Comment (P.ParsecT e String m)
 
 elide :: Text.Text -> String
 elide s | Text.length s > 42 = take 42 (Text.unpack s) <> ['…']
 elide s = Text.unpack s
 
-tests :: TestTree
-tests = testGroup "Grammar"
+hunits :: TestTree
+hunits = testGroup "Grammar"
  [ testGroup "Terminal" $
-       let (==>) inp exp =
-               testCase (elide exp) $
-               runEBNF (unTerminal (void inp)) @?= exp
+       let (==>) input expected =
+               testCase (elide expected) $
+               runEBNF (unTerminal (void input)) @?= expected
                ; infix 1 ==> in
         [ string "" ==> "\"\""
         , string "abé\"to" ==> "\"abé\", U+34, \"to\""
@@ -69,17 +70,17 @@ tests = testGroup "Grammar"
         , unicat (Unicat Char.LowercaseLetter) ==> "Unicat LowercaseLetter"
         ]
  , testGroup "Reg" $
-       let (==>) inp exp =
-               testCase (elide exp) $
-               runEBNF (unReg (void inp)) @?= exp
+       let (==>) input expected =
+               testCase (elide expected) $
+               runEBNF (unReg (void input)) @?= expected
                ; infix 1 ==> in
         [ (<>) <$> string "0" .*> someR (char '1') ==> "\"0\", {\"1\"}-"
         , (<>) <$> someL (char '1') <*. string "0" ==> "{\"1\"}-, \"0\""
         ]
  , testGroup "CF" $
-       let (==>) inp exp =
-               testCase (elide exp) $
-               runEBNF (unCF (void inp)) @?= exp
+       let (==>) input expected =
+               testCase (elide expected) $
+               runEBNF (unCF (void input)) @?= expected
                ; infix 1 ==> in
         [ (<>) <$> string "0" <*> string "1" ==> "\"0\", \"1\""
         , (<>) <$> string "0" <* string "X" <*> string "1" ==> "\"0\", \"X\", \"1\""
@@ -110,4 +111,4 @@ main :: IO ()
 main =
        defaultMain $
        testGroup "Language.Symantic"
-        [tests]
+        [hunits]
index 5bbd150485fcf6bf52d131bfb756b7bbc1079d32..1adfccdb0295049cc1d8bc836e4a0130325b53a4 100644 (file)
@@ -1,3 +1,3 @@
-resolver: lts-9.0
+resolver: lts-10.5
 packages:
 - '.'
index edb7c6339e5a6418037c4de805b95b5179086cc3..0159f03c344b96b14e692449df6983f64c7981e9 100644 (file)
@@ -22,7 +22,7 @@ tested-with: GHC==8.0.2
 -- PVP:  +-+------- breaking API changes
 --       | | +----- non-breaking API additions
 --       | | | +--- code changes with no API change
-version: 0.2.1.20170818
+version: 0.3.1.20180213
 
 Source-Repository head
   location: git://git.autogeree.net/symantic
index 5bb79829b861b307131ddbc56054b7683dbf4604..033349f2824ba65cebd2c0cfd61929efdf806762 100644 (file)
@@ -13,6 +13,7 @@ import Control.Arrow (left)
 import Data.Functor.Identity (Identity(..))
 import Data.Text (Text)
 import Data.Type.Equality
+import Data.Void (Void)
 import qualified Control.Monad.Classes.Run as MC
 import qualified Control.Monad.Trans.State.Strict as SS
 import qualified Data.List as List
@@ -26,7 +27,7 @@ import Language.Symantic.Lib ()
 import Grammar.Megaparsec ()
 
 type G src ss =
- P.ParsecT P.Dec Text
+ P.ParsecT Void Text
            (SS.StateT (Imports NameTe, Modules src ss)
                       ((SS.StateT (Imports NameTy, ModulesTy src))
                                   Identity))
@@ -37,7 +38,7 @@ parseTe ::
  ModulesTyInj ss =>
  ModulesInj src ss =>
  Gram_Term src ss (G src ss) =>
- Text -> Either (P.ParseError Char P.Dec) (AST_Term src ss)
+ Text -> Either (P.ParseError Char Void) (AST_Term src ss)
 parseTe inp =
        let modsTe :: Modules src ss = either (error . show) id modulesInj in
        let impsTe = [] `importModules` modsTe in
@@ -69,7 +70,7 @@ readTe ::
  ) =>
  Text ->
  Either ( Type src '[] t
-        , Either (P.ParseError Char P.Dec)
+        , Either (P.ParseError Char Void)
                  (Error_Term src) )
         (Type src '[] t, t, Text) ->
  TestTree
index 424c41a7912d14625746b8a00f0d8c38999f1979..2e50260f28f3141f0c91cea77358270910932661 100644 (file)
@@ -19,7 +19,9 @@ import qualified Control.Applicative as Alt
 import qualified Control.Monad.Classes as MC
 import qualified Data.Char as Char
 import qualified Data.Text as Text
+import qualified Data.Text.Lazy as TL
 import qualified Text.Megaparsec as P
+import qualified Text.Megaparsec.Char as P
 
 import Language.Symantic.Grammar as Sym
 import qualified Language.Symantic as Sym
@@ -27,8 +29,8 @@ import Language.Symantic.Lib ()
 
 -- * Type 'ParsecC'
 -- | Convenient alias for defining instances involving 'P.ParsecT'.
-type ParsecC e s = (P.Token s ~ Char, P.Stream s, P.ErrorComponent e)
-instance ParsecC e s => IsString (P.ParsecT e s m [Char]) where
+type ParsecC e s = (P.Token s ~ Char, P.Stream s, Ord e)
+instance ParsecC e [Char] => IsString (P.ParsecT e [Char] m [Char]) where
        fromString = P.string
 
 --
@@ -105,15 +107,20 @@ instance (ParsecC e s, Show err) => Sym.Gram_Error err (P.ParsecT e s m) where
                 Right a -> return a
 instance ParsecC e s => Sym.Gram_Rule (P.ParsecT e s m) where
        rule = P.label . Text.unpack
-instance ParsecC e s => Sym.Gram_Terminal (P.ParsecT e s m) where
+instance ParsecC e s => Sym.Gram_Char (P.ParsecT e s m) where
        any          = P.anyChar
        eoi          = P.eof
        char         = P.char
-       string       = P.string
        unicat cat   = P.satisfy $ (`elem` cats) . Char.generalCategory
                where cats = unicode_categories cat
        range (l, h) = P.satisfy $ \c -> l <= c && c <= h
        Terminal f `but` Terminal p = Terminal $ P.notFollowedBy (P.try p) *> f
+instance ParsecC e String => Sym.Gram_String (P.ParsecT e String m) where
+       string = P.string
+instance ParsecC e Text.Text => Sym.Gram_String (P.ParsecT e Text.Text m) where
+       string t   = Text.unpack <$> P.string (Text.pack t)
+       text       = P.string
+       textLazy t = TL.fromStrict <$> P.string (TL.toStrict t)
 instance ParsecC e s => Sym.Gram_Alt (P.ParsecT e s m) where
        empty  = Alt.empty
        (<+>)  = (Alt.<|>)
@@ -136,32 +143,39 @@ instance ParsecC e s => Sym.Gram_CF (P.ParsecT e s m) where
        CF f <& Reg p        = CF $ P.lookAhead f <*> p
        Reg f &> CF p        = CF $ P.lookAhead f <*> p
        minus (CF f) (Reg p) = CF $ P.notFollowedBy (P.try p) *> f
-instance ParsecC e s => Sym.Gram_Comment (P.ParsecT e s m)
-instance ParsecC e s => Sym.Gram_Op (P.ParsecT e s m)
-instance ParsecC e s => Sym.Gram_Mod (P.ParsecT e s m)
-instance ParsecC e s => Sym.Gram_Type_Name (P.ParsecT e s m)
-instance ParsecC e s => Sym.Gram_Term_Name (P.ParsecT e s m)
+instance (ParsecC e s, Sym.Gram_String (P.ParsecT e s m)) => Sym.Gram_Comment (P.ParsecT e s m)
+instance (ParsecC e s, Sym.Gram_String (P.ParsecT e s m)) => Sym.Gram_Op (P.ParsecT e s m)
+instance (ParsecC e s, Sym.Gram_String (P.ParsecT e s m)) => Sym.Gram_Mod (P.ParsecT e s m)
+instance (ParsecC e s, Sym.Gram_String (P.ParsecT e s m)) => Sym.Gram_Type_Name (P.ParsecT e s m)
+instance (ParsecC e s, Sym.Gram_String (P.ParsecT e s m)) => Sym.Gram_Term_Name (P.ParsecT e s m)
 instance -- Sym.Gram_Type
  ( ParsecC e s
+ , Sym.Gram_String (P.ParsecT e s m)
  , Gram_Source src (P.ParsecT e s m)
  , Show src
  , MC.MonadState ( Sym.Imports Sym.NameTy
-                 , Sym.ModulesTy src ) (P.ParsecT e s m)
+                 , Sym.ModulesTy src )
+                 (P.ParsecT e s m)
  ) => Sym.Gram_Type src (P.ParsecT e s m)
 instance -- Sym.Gram_Term_Type
  ( ParsecC e s
+ , Sym.Gram_String (P.ParsecT e s m)
  , Show src
  , MC.MonadState ( Sym.Imports Sym.NameTy
-                 , Sym.ModulesTy src ) (P.ParsecT e s m)
+                 , Sym.ModulesTy src )
+                 (P.ParsecT e s m)
  , Gram_Source src           (P.ParsecT e s m)
  ) => Sym.Gram_Term_Type src (P.ParsecT e s m)
 instance -- Sym.Gram_Term
  ( ParsecC e s
+ , Sym.Gram_String (P.ParsecT e s m)
  , Show src
  , MC.MonadState ( Sym.Imports Sym.NameTy
-                 , Sym.ModulesTy src )  (P.ParsecT e s m)
+                 , Sym.ModulesTy src )
+                 (P.ParsecT e s m)
  , MC.MonadState ( Sym.Imports Sym.NameTe
-                 , Sym.Modules src ss ) (P.ParsecT e s m)
+                 , Sym.Modules src ss )
+                 (P.ParsecT e s m)
  , Sym.Gram_Source src        (P.ParsecT e s m)
  , Sym.Gram_Term_Atoms src ss (P.ParsecT e s m)
  ) => Sym.Gram_Term src ss    (P.ParsecT e s m)
index 8338b49f3a4722530374480713c1fd22f786f6a1..4f69790290d208933af2a82067786a5100d1cf83 100644 (file)
@@ -4,7 +4,7 @@
 module Language.Symantic.Lib.Alternative where
 
 import Control.Applicative (Alternative)
-import Prelude hiding (Functor(..), (<$>), id, const)
+import Prelude hiding (Functor(..))
 import qualified Control.Applicative as Alternative
 
 import Language.Symantic
index b83346ccb4a720bc4c0b7c5c2be6566e8645320a..7212b904ca84cbcb2cd0ca1fdf4f6bde59c298c3 100644 (file)
@@ -4,7 +4,7 @@
 module Language.Symantic.Lib.Applicative where
 
 import Control.Applicative (Applicative)
-import Prelude hiding (Functor(..), (<$>), Applicative(..), id, const)
+import Prelude hiding (Functor(..), (<$>), Applicative(..))
 import qualified Control.Applicative as Applicative
 import qualified Data.Function as Fun
 
index 150714abb9b3caa0520e0ec8a827ef3c23a0acb8..5e2153ed95c8ffa939e3329849904dfbbeca716c 100644 (file)
@@ -4,7 +4,6 @@ module Lib.Applicative.Test where
 import Test.Tasty
 
 import Data.Proxy (Proxy(..))
-import Prelude hiding ((&&), not, (||))
 
 import Language.Symantic.Lib
 import Compiling.Test
index 0086facb4c5e1ed97a6a05223b4a8ad656c03af7..2c4e5d850745e8dd9f4da68b31e50e6695b062b9 100644 (file)
@@ -6,7 +6,7 @@ module Language.Symantic.Lib.Char where
 import qualified Data.Char as Char
 import qualified Data.Text as Text
 
-import Language.Symantic.Grammar hiding (char, any)
+import Language.Symantic.Grammar hiding (char)
 import qualified Language.Symantic.Grammar as G
 import Language.Symantic
 import Language.Symantic.Lib.List (tyList)
@@ -78,7 +78,7 @@ instance
                 )
         ]
                where
-               tickG :: Gram_Terminal g' => g' Char
+               tickG :: Gram_Char g' => g' Char
                tickG = G.char '\''
 instance (Source src, SymInj ss Char) => ModuleFor src ss Char where
        moduleFor = ["Char"] `moduleWhere`
index 94e582322d98dc0eddca2ec7db3ab06665c2fd0a..2596c48f18573c65a444fdcdc28c35284692ec61 100644 (file)
@@ -10,7 +10,7 @@ import Data.Foldable (Foldable)
 import qualified Data.Foldable as Foldable
 import Prelude hiding (Foldable(..)
  , all, and, any, concat, concatMap
- , mapM_, notElem, or, sequence, sequence_)
+ , mapM_, notElem, or, sequence_)
 
 import Language.Symantic
 import Language.Symantic.Lib.Alternative (tyAlternative)
index 1cb2476fe2452db9f995f2401ac41901f2adc1d9..82b406c11155179b116ca13baa037ed4e3b25809 100644 (file)
@@ -4,7 +4,6 @@ module Lib.Foldable.Test where
 import Test.Tasty
 
 import Data.Proxy (Proxy(..))
-import Prelude hiding ((&&), not, (||))
 
 import Language.Symantic.Lib
 import Compiling.Test
index 9b7bb52b2f9af83c22f0144fb9b92ad794319caf..508e7ebd4fdc5a131d802e5115ec780ec8f0e8a2 100644 (file)
@@ -4,7 +4,6 @@ module Lib.Functor.Test where
 import Test.Tasty
 
 import Data.Proxy (Proxy(..))
-import Prelude hiding ((&&), not, (||))
 
 import Language.Symantic ()
 import Language.Symantic.Lib
index a50bec701494e665bab9e82743dbe11ad50791bc..ff112e2d211c3f43c44028259f92568b81eafc6c 100644 (file)
@@ -6,7 +6,6 @@ import Test.Tasty
 import Data.Map.Strict (Map)
 import Data.Proxy (Proxy(..))
 import Data.Text as Text
-import Prelude hiding (zipWith)
 import qualified Data.Map.Strict as Map
 
 import Language.Symantic.Lib
index 8271117830c935110658e8e6fbc1cfbdc109ee29..11a578460df248aaf14baae0ea2a19df499673b9 100644 (file)
@@ -4,7 +4,6 @@ module Lib.MonoFunctor.Test where
 import Test.Tasty
 
 import Data.Proxy (Proxy(..))
-import Prelude hiding (zipWith)
 import qualified Data.MonoTraversable as MT
 
 import Language.Symantic.Lib
index f36ba58cd201c5580319723fbd026d9ddbd29ccd..ad901e941365877079200872eb50c152d58b30bc 100644 (file)
@@ -4,7 +4,7 @@ module Lib.Test where
 
 import Test.Tasty
 
-import Prelude hiding ((&&), not, (||), (==), id)
+import Prelude hiding ((&&), not, (||), id)
 
 import Language.Symantic
 import Language.Symantic.Lib
index 49e93752d3390499b8b79eeb1e24ad9e5f41f5f9..9598127add1a19abb70f9fbab5d14384aca78685 100644 (file)
@@ -8,7 +8,7 @@ import qualified Data.MonoTraversable as MT
 import qualified Data.Sequences as Seqs
 import qualified Data.Text as Text
 
-import Language.Symantic.Grammar
+import Language.Symantic.Grammar hiding (text)
 import Language.Symantic
 import Language.Symantic.Lib.Char ()
 import Language.Symantic.Lib.MonoFunctor (Element)
index 96e01afe788d7a4eb3ba526112aae26a738d29d1..348f056f2bc3e5a9edb59550662ad43bd0604dc3 100644 (file)
@@ -4,7 +4,6 @@ module Lib.Tuple2.Test where
 import Test.Tasty
 
 import Data.Proxy (Proxy(..))
-import Prelude hiding ((&&), not, (||))
 
 import Language.Symantic.Lib
 import Compiling.Test
index 71fd7af9520e211659ae3136516f53c8a5a56b69..c4bd79c2edcd16082f6e45a2a34a3bb979669aee 100644 (file)
@@ -3,8 +3,6 @@
 -- | Symantic for '()'.
 module Language.Symantic.Lib.Unit where
 
-import Prelude hiding ((&&), not, (||))
-
 import Language.Symantic
 import Language.Symantic.Grammar
 
index 194f0a5ef4e4873c2ea370173244088151e407df..7033170d3a6904d3e5953d0ddf311dd385dfecf4 100644 (file)
@@ -1,4 +1,5 @@
 {-# LANGUAGE AllowAmbiguousTypes #-}
+{-# LANGUAGE TypeApplications #-}
 {-# LANGUAGE UndecidableInstances #-}
 {-# OPTIONS_GHC -fno-warn-orphans #-}
 module Typing.Test where
@@ -16,6 +17,7 @@ import Data.NonNull (NonNull)
 import Data.Proxy
 import Data.Ratio (Ratio)
 import Data.Text (Text)
+import Data.Void (Void)
 import GHC.Exts (Constraint)
 import Prelude hiding (exp)
 import qualified Control.Monad.Classes.Run as MC
@@ -26,11 +28,10 @@ import qualified Data.MonoTraversable as MT
 import qualified Data.Sequences as Seqs
 import qualified System.IO as IO
 import qualified Text.Megaparsec as P
-import qualified Text.Megaparsec.Prim as P
 
 import Language.Symantic.Grammar
 import Language.Symantic
-import Language.Symantic.Lib hiding ((<$>), (<*), show)
+import Language.Symantic.Lib hiding ((<$>), (<*))
 
 import Grammar.Megaparsec ()
 
@@ -105,7 +106,7 @@ tests = testGroup "Typing" $
        let run inp (TypeT exp :: TypeT SRC '[]) =
                testCase inp $ got @?= Right (Right $ TypeVT exp)
                where
-               got :: Either (P.ParseError Char P.Dec)
+               got :: Either (P.ParseError Char Void)
                              (Either (Error_Type SRC) (TypeVT SRC))
                got = readType <$> parseTy inp
                in
@@ -151,7 +152,7 @@ tests = testGroup "Typing" $
                let run inp = testCase inp $ got @?= Left ()
                        where
                        got :: Either () (AST_Type SRC)
-                       got = left (\(_::P.ParseError (P.Token String) P.Dec) -> ()) $ parseTy inp in
+                       got = left (\(_::P.ParseError (P.Token String) Void) -> ()) $ parseTy inp in
                run <$>
                 [ "Bool, Int"
                 , "(Bool -> Int) Char"
@@ -160,7 +161,7 @@ tests = testGroup "Typing" $
         , testGroup "Compiling errors" $
                let run inp = testCase inp $ got @?= Right (Left ())
                        where
-                       got :: Either (P.ParseError Char P.Dec) (Either () (TypeVT SRC))
+                       got :: Either (P.ParseError Char Void) (Either () (TypeVT SRC))
                        got = left (Fun.const ()) . readType <$> parseTy inp in
                run <$>
                 [ "Bool Int"
index f68b00470d22bb275932e93f186690f52e5edc3a..79f1dab6600d9c430b9e7a1423939430baa26646 100644 (file)
@@ -1,4 +1,4 @@
-resolver: lts-9.0
+resolver: lts-10.5
 packages:
 - '.'
 - location: '../symantic'
@@ -7,6 +7,7 @@ packages:
   extra-dep: true
 - location: '../symantic-document'
   extra-dep: true
+- location: '../monad-classes'
+  extra-dep: true
 extra-deps:
-- monad-classes-0.3.2.0
 - peano-0.1.0.1
index 6c6fc3743d1590fc4ce672cabb1e211e63486904..5fa44a1e148c4067b6e5b92c657a772786687656 100644 (file)
@@ -11,12 +11,12 @@ import Language.Symantic.Compiling.Term
 -- | Term application: apply second given 'TermT' to the first,
 -- applying embedded 'TeSym's, or return an error.
 betaTerm ::
- forall src ss es vs fun arg.
+ forall src ss ts vs fun arg.
  SourceInj (TypeVT src) src =>
  Constable (->) =>
- Term src ss es vs (fun::K.Type) ->
- Term src ss es vs (arg::K.Type) ->
- Either (Error_Beta src) (TermT src ss es vs)
+ Term src ss ts vs (fun::K.Type) ->
+ Term src ss ts vs (arg::K.Type) ->
+ Either (Error_Beta src) (TermT src ss ts vs)
 betaTerm (Term qf tf (TeSym te_fun)) (Term qa ta (TeSym te_arg)) =
        case tf of
         TyApp _ (TyApp _ a2b a2b_a) a2b_b
@@ -41,8 +41,8 @@ betaTerm (Term qf tf (TeSym te_fun)) (Term qa ta (TeSym te_arg)) =
 betaTerms ::
  SourceInj (TypeVT src) src =>
  Constable (->) =>
- BinTree (TermVT src ss es) ->
- Either (Error_Beta src) (TermVT src ss es)
+ BinTree (TermVT src ss ts) ->
+ Either (Error_Beta src) (TermVT src ss ts)
 betaTerms t =
        collapseBT (\acc ele -> do
                TermVT (Term qf tf te_fun) <- acc
@@ -61,8 +61,10 @@ betaTerms t =
                        let tf'' = subst mgu tf'
                        let ta'' = subst mgu ta'
                        TermT (Term qr tr te_res) <- betaTerm (Term qf'' tf'' te_fun) (Term qa'' ta'' te_arg)
-                       normalizeVarsTy (qr #> tr) $ \(TyApp _ (TyApp _ _c qr') tr') ->
+                       normalizeVarsTy (qr #> tr) $ \case
+                        TyApp _ (TyApp _ _c qr') tr' ->
                                Right $ TermVT $ Term qr' tr' te_res
+                        _ -> undefined -- FIXME: as of GHC 8.2, GHC is no longer clever enough to rule out other cases
         ) (Right <$> t)
 
 -- * Type 'Error_Beta'
index fd3e37e32cb63c1b7924377578d30daf556798f0..a9fec959646cae15f7a0742316207b7ea7a5699d 100644 (file)
@@ -10,7 +10,7 @@ import Control.Arrow (left)
 import Control.Monad (void)
 import Data.Semigroup (Semigroup(..))
 import Data.Map.Strict (Map)
-import Prelude hiding (mod, not, any)
+import Prelude hiding (any)
 import qualified Data.Function as Fun
 import qualified Data.Map.Strict as Map
 import qualified Data.Text as Text
@@ -21,7 +21,7 @@ import Language.Symantic.Compiling.Module
 
 -- * Class 'Gram_Term_Name'
 class
- ( Gram_Terminal g
+ ( Gram_Char g
  , Gram_Rule g
  , Gram_Alt g
  , Gram_Try g
@@ -98,7 +98,7 @@ instance Gram_Term_Name RuleEBNF
 
 -- * Class 'Gram_Term_Type'
 class
- ( Gram_Terminal g
+ ( Gram_Char g
  , Gram_Rule g
  , Gram_Alt g
  , Gram_AltApp g
@@ -145,7 +145,7 @@ data Error_Term_Gram
 class
  ( Gram_Source src g
  , Gram_Error Error_Term_Gram g
- , Gram_Terminal g
+ , Gram_Char g
  , Gram_Rule g
  , Gram_Alt g
  , Gram_App g
@@ -224,7 +224,7 @@ class
                        lexeme $
                                g_ModNameTeId <* g_backquote <+>
                                g_ModNameTeOp
-               g_backquote :: Gram_Terminal g' => g' Char
+               g_backquote :: Gram_Char g' => g' Char
                g_backquote = char '`'
        
        g_term_atom :: CF g  (AST_Term src ss)
index 4436940884e7249bf6c8a7f62d6f0a53fe7c3442..fdab23d579b8ec635ac4552791fa5b63586c2f92 100644 (file)
@@ -2,7 +2,6 @@
 {-# LANGUAGE ConstraintKinds #-}
 {-# LANGUAGE ExistentialQuantification #-}
 {-# LANGUAGE GADTs #-}
-{-# LANGUAGE GeneralizedNewtypeDeriving #-}
 {-# LANGUAGE PolyKinds #-}
 {-# LANGUAGE UndecidableInstances #-}
 module Language.Symantic.Compiling.Module where
@@ -13,7 +12,7 @@ import Data.Maybe (fromMaybe)
 import Data.Semigroup (Semigroup(..))
 import Data.Set (Set)
 import Data.String (IsString(..))
-import Prelude hiding (mod, not, any)
+import Prelude hiding (mod, not)
 import qualified Data.Map.Strict as Map
 
 import Language.Symantic.Grammar
index 752868a4752ec176e72c9b2f58e080d52b661cf8..3b2da6186962e5dd35a67f01dd45b64a87de29b8 100644 (file)
@@ -165,7 +165,7 @@ data CtxTe (term::K.Type -> K.Type) (hs::[K.Type]) where
 infixr 5 `CtxTeS`
 
 -- ** Type 'TermDef'
--- | Convenient type alias for defining 'Term'.
+-- | Convenient type alias to define a 'Term'.
 type TermDef s vs t = forall src ss ts. Source src => SymInj ss s => Term src ss ts vs t
 
 -- ** Type family 'Sym'
index 94d0b0154909a0de1a8ed3814302b748484ffb80..ccff895473b2591f316f1ed61892b36ce3d30530 100644 (file)
@@ -13,10 +13,10 @@ import Language.Symantic.Grammar
 -- | Interpreter's data.
 newtype View a
  =      View
- {    unView -- Inherited attribuctx:
+ {    unView -- Inherited attributes:
              :: (Infix, Side)
              -> DepthLam
-             -- Synthetised attribuctx:
+             -- Synthetised attributes:
              -> Text
  }
 type DepthLam = Int
index 0bf9b9716f138b2fc05896d5d15bf222895d529c..ff7c4b879605ffd8c97c770ed124427551d939e2 100644 (file)
@@ -1,4 +1,5 @@
 {-# LANGUAGE PolyKinds #-}
+{-# LANGUAGE TypeInType #-}
 {-# OPTIONS_GHC -fno-warn-orphans #-}
 module Language.Symantic.Typing.Document where
 
@@ -54,8 +55,8 @@ docType conf@Config_Doc_Type{config_Doc_Type_imports=imps} pr ty =
        go v2n (infixB SideL pr, SideL) ty
        where
        go ::
-        forall x.
-        (Map IndexVar Name) -> -- names of variables
+        forall kx (x::kx).
+        Map IndexVar Name -> -- names of variables
         (Infix, Side) ->
         Type src vs x -> d
        -- Var
index a16d0a6d9f13e3a384dbd630a159382be79397ce..8260ab5fa118d461d6a63327db0ff9e3a98532ff 100644 (file)
@@ -11,7 +11,6 @@ import Data.Map.Strict (Map)
 import Data.Maybe (fromMaybe)
 import Data.Semigroup (Semigroup(..))
 import Data.String (IsString(..))
-import Prelude hiding (any)
 import qualified Data.Char as Char
 import qualified Data.Map.Strict as Map
 import qualified Data.Text as Text
@@ -96,7 +95,7 @@ instance
 
 -- * Class 'Gram_Mod'
 class
- ( Gram_Terminal g
+ ( Gram_Char g
  , Gram_Rule g
  , Gram_Alt g
  , Gram_Try g
@@ -130,7 +129,7 @@ instance Gram_Mod RuleEBNF
 
 -- * Class 'Gram_Type_Name'
 class
- ( Gram_Terminal g
+ ( Gram_Char g
  , Gram_Rule g
  , Gram_Alt g
  , Gram_Try g
@@ -189,7 +188,7 @@ instance Gram_Type_Name RuleEBNF
 -- | Read an 'AST_Type' from a textual source.
 class
  ( Gram_Source src g
- , Gram_Terminal g
+ , Gram_Char g
  , Gram_Rule g
  , Gram_Alt g
  , Gram_Try g
index b05f4197783eb28f0833b0b75d691a4c854b2796..dc93f87460fee67210c1c3de4261cfd9e7cd4025 100644 (file)
@@ -1,5 +1,4 @@
 {-# LANGUAGE GADTs #-}
-{-# OPTIONS_GHC -fno-warn-missing-methods #-}
 -- | Natural numbers inductivey defined at the type-level, and of kind @*@.
 module Language.Symantic.Typing.Peano where
 
index 2b95a5d58936ba0d0b8fcf5d078c3913892e5222..75907e86276b296fce09eebe6fda96304a464e7e 100644 (file)
@@ -727,7 +727,7 @@ kindOfType (TyApp _src f _a) =
 kindOfType (TyVar _src _n v)         = kindOfVar v
 kindOfType (TyFam _src _len fam _as) = kindOfConst fam
 
--- | Remove unused 'Var's from ther context.
+-- | Remove unused 'Var's from the context.
 normalizeVarsTy ::
  Type src vs (t::kt) ->
  (forall vs'. Type src vs' (t::kt) -> ret) -> ret
index ec2129c820ae803633a86db4edac33b75b7e2633..c0709df4d36902bde818bebe67b15a153b770e8c 100644 (file)
@@ -146,7 +146,7 @@ spineTy ::
  (TypeT src vs, [TypeT src vs])
 spineTy typ = go [] typ
        where
-       go :: forall x. [TypeT src vs] -> Type src vs x -> (TypeT src vs, [TypeT src vs])
+       go :: forall kx (x::kx). [TypeT src vs] -> Type src vs x -> (TypeT src vs, [TypeT src vs])
        go ctx (TyApp _ (TyApp _ (TyConst _ _ c) _q) t)
         | Just HRefl <- proj_ConstKi @(K (#>)) @(#>) c
         = go ctx t -- NOTE: skip the constraint @q@.
index e9658bc55cf1066b2b3581a272df840e49c39304..5d1f99161411ed906b532ddba36b1359d28bd4d2 100644 (file)
@@ -9,18 +9,13 @@ module Language.Symantic.Typing.Variable where
 import Data.Proxy (Proxy(..))
 import Data.String (IsString(..))
 import Data.Text (Text)
-import Data.Type.Equality ((:~:)(..))
+import Data.Type.Equality ((:~:)(..), (:~~:)(..))
 import qualified Data.Kind as K
 
 import Language.Symantic.Grammar
 import Language.Symantic.Typing.List
 import Language.Symantic.Typing.Kind
 
--- | /Heterogeneous propositional equality/:
--- like (:~:) but prove also that the kinds are equal.
-data (:~~:) (a::ka) (b::kb) where
-       HRefl :: a :~~: a
-
 -- * Type 'Var'
 -- | A /type variable/, indexed amongst a type-level list.
 -- @v@ is wrapped within a 'Proxy' to have a kind-heterogeneous list.
index e5e7f0c1266aac4e6911fa43501c598c67f8b21a..226c757506c8fe4292e1e4862157a1890c6bf4d3 100644 (file)
@@ -157,7 +157,7 @@ without the following seminal works:
 * `PolyKinds` for avoiding a lot of uses of `Proxy`.
 * `Rank2Types` or `ExistentialQuantification` for parsing `GADT`s.
 * `TypeApplications` for having a more concise syntax
-  to build `Type` (eg. `tyConst `Bool`).
+  to build `Type` (eg. `tyConst @Bool`).
 * `TypeFamilies` for type-level programming.
 * `TypeInType` (introduced in GHC 8.0.1)
   for `Type` to also bind a kind equality for the type `t` it encodes.
index 5383e82995f643612544f79b37ec000e82c7b111..73596c56f338c02f8400ffb3a2ec6efaabcf6654 100644 (file)
@@ -1,4 +1,4 @@
-resolver: lts-9.0
+resolver: lts-10.5
 packages:
 - '.'
 - location: '../symantic-grammar'
index 2fec80551fb44d3c57f5304d3209e351557dd081..8f30af1a014a59ef49eba88e18742aeca2cb3978 100644 (file)
@@ -17,11 +17,11 @@ maintainer: Julien Moutinho <julm+symantic@autogeree.net>
 name: symantic
 stability: experimental
 synopsis: Library for Typed Tagless-Final Higher-Order Composable DSL
-tested-with: GHC==8.0.2
+tested-with: GHC==8.2.2
 -- PVP:  +-+------- breaking API changes
 --       | | +----- non-breaking API additions
 --       | | | +--- code changes with no API change
-version: 6.3.0.20170807
+version: 6.3.1.20180213
 
 Source-Repository head
   location: git://git.autogeree.net/symantic
@@ -44,8 +44,12 @@ Library
     TypeApplications
     TypeFamilies
     TypeOperators
-  ghc-options: -Wall
-               -fno-warn-tabs
+  ghc-options:
+    -Wall
+    -Wincomplete-uni-patterns
+    -Wincomplete-record-updates
+    -fno-warn-tabs
+    -fhide-source-paths
   default-language: Haskell2010
   exposed-modules:
     Language.Symantic