{-# LANGUAGE MultiParamTypeClasses #-}
{-# LANGUAGE LambdaCase #-}
module Language.Drasil.WellTyped where
import qualified Data.Map.Strict as M
import Language.Drasil.UID (UID)
import Data.List (intercalate)
type TypeError = String
type TypingContext t = M.Map UID t
inferFromContext :: TypingContext t -> UID -> Either t TypeError
inferFromContext :: forall t. TypingContext t -> UID -> Either t TypeError
inferFromContext TypingContext t
cxt UID
u = forall b a. b -> (a -> b) -> Maybe a -> b
maybe
(forall a b. b -> Either a b
Right forall a b. (a -> b) -> a -> b
$ TypeError
"`" forall a. [a] -> [a] -> [a]
++ forall a. Show a => a -> TypeError
show UID
u forall a. [a] -> [a] -> [a]
++ TypeError
"` lacks type binding in context")
forall a b. a -> Either a b
Left
(forall k a. Ord k => k -> Map k a -> Maybe a
M.lookup UID
u TypingContext t
cxt)
class (Eq t, Show t) => Typed e t where
infer :: TypingContext t -> e -> Either t TypeError
check :: TypingContext t -> e -> t -> Either t TypeError
class Typed e t => RequiresChecking c e t where
requiredChecks :: c -> [(e, t)]
typeCheckByInfer :: Typed e t => TypingContext t -> e -> t -> Either t TypeError
typeCheckByInfer :: forall e t.
Typed e t =>
TypingContext t -> e -> t -> Either t TypeError
typeCheckByInfer TypingContext t
cxt e
e t
t = forall a c b. (a -> c) -> (b -> c) -> Either a b -> c
either
(\t
infT -> if t
t forall a. Eq a => a -> a -> Bool
== t
infT
then forall a b. a -> Either a b
Left t
t
else forall a b. b -> Either a b
Right forall a b. (a -> b) -> a -> b
$ TypeError
"Inferred type `" forall a. [a] -> [a] -> [a]
++ forall a. Show a => a -> TypeError
show t
t forall a. [a] -> [a] -> [a]
++ TypeError
"` does not match expected type `" forall a. [a] -> [a] -> [a]
++ forall a. Show a => a -> TypeError
show t
infT forall a. [a] -> [a] -> [a]
++ TypeError
"`")
forall a b. b -> Either a b
Right
(forall e t. Typed e t => TypingContext t -> e -> Either t TypeError
infer TypingContext t
cxt e
e)
allOfType :: Typed e t => TypingContext t -> [e] -> t -> t -> TypeError -> Either t TypeError
allOfType :: forall e t.
Typed e t =>
TypingContext t -> [e] -> t -> t -> TypeError -> Either t TypeError
allOfType TypingContext t
cxt [e]
es t
expect t
ret TypeError
s
| Bool
allTsAreSp = forall a b. a -> Either a b
Left t
ret
| Bool
otherwise = forall a b. b -> Either a b
Right forall a b. (a -> b) -> a -> b
$ TypeError -> TypeError -> TypeError
temporaryIndent TypeError
" " (TypeError
s forall a. [a] -> [a] -> [a]
++ TypeError
"\nReceived:\n" forall a. [a] -> [a] -> [a]
++ TypeError
dumpAllTs)
where
allTs :: [Either t TypeError]
allTs = forall a b. (a -> b) -> [a] -> [b]
map (forall e t. Typed e t => TypingContext t -> e -> Either t TypeError
infer TypingContext t
cxt) [e]
es
allTsAreSp :: Bool
allTsAreSp = forall (t :: * -> *) a. Foldable t => (a -> Bool) -> t a -> Bool
all (\case
Left t
t -> t
t forall a. Eq a => a -> a -> Bool
== t
expect
Right TypeError
_ -> Bool
False) [Either t TypeError]
allTs
dumpAllTs :: TypeError
dumpAllTs = forall a. [a] -> [[a]] -> [a]
intercalate TypeError
"\n" forall a b. (a -> b) -> a -> b
$ forall a b. (a -> b) -> [a] -> [b]
map ((TypeError
"- " forall a. [a] -> [a] -> [a]
++) forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall a c b. (a -> c) -> (b -> c) -> Either a b -> c
either forall a. Show a => a -> TypeError
show (TypeError
"ERROR: " forall a. [a] -> [a] -> [a]
++)) [Either t TypeError]
allTs
temporaryIndent :: String -> String -> String
temporaryIndent :: TypeError -> TypeError -> TypeError
temporaryIndent TypeError
r (Char
'\n' : TypeError
s) = Char
'\n' forall a. a -> [a] -> [a]
: (TypeError
r forall a. [a] -> [a] -> [a]
++ TypeError -> TypeError -> TypeError
temporaryIndent TypeError
r TypeError
s)
temporaryIndent TypeError
r (Char
c : TypeError
s) = Char
c forall a. a -> [a] -> [a]
: TypeError -> TypeError -> TypeError
temporaryIndent TypeError
r TypeError
s
temporaryIndent TypeError
_ [] = []