-
Notifications
You must be signed in to change notification settings - Fork 2
/
Copy pathEvaluator.hs
188 lines (160 loc) · 6.01 KB
/
Evaluator.hs
1
2
3
4
5
6
7
8
9
10
11
12
13
14
15
16
17
18
19
20
21
22
23
24
25
26
27
28
29
30
31
32
33
34
35
36
37
38
39
40
41
42
43
44
45
46
47
48
49
50
51
52
53
54
55
56
57
58
59
60
61
62
63
64
65
66
67
68
69
70
71
72
73
74
75
76
77
78
79
80
81
82
83
84
85
86
87
88
89
90
91
92
93
94
95
96
97
98
99
100
101
102
103
104
105
106
107
108
109
110
111
112
113
114
115
116
117
118
119
120
121
122
123
124
125
126
127
128
129
130
131
132
133
134
135
136
137
138
139
140
141
142
143
144
145
146
147
148
149
150
151
152
153
154
155
156
157
158
159
160
161
162
163
164
165
166
167
168
169
170
171
172
173
174
175
176
177
178
179
180
181
182
183
184
185
186
187
188
module Evaluator where
import Protolude
import Data.List (last)
import qualified Data.Map.Strict as M
import Evaluator.Object
import Evaluator.Types
import Parser.AST
import Utils (at)
evalProgram :: Program -> Evaluator Object
evalProgram (Program blockStmt) = returned <$> evalBlockStmt blockStmt
evalBlockStmt :: BlockStmt -> Evaluator Object
evalBlockStmt [] = return nil
evalBlockStmt (s:[]) = evalStmt s
evalBlockStmt (s:ss) = do
o <- evalStmt s
if isReturned o
then return o
else evalBlockStmt ss
evalStmt :: Stmt -> Evaluator Object
evalStmt (ExprStmt expr) = evalExpr expr
evalStmt (ReturnStmt expr) = ret <$> evalExpr expr
evalStmt (LetStmt ident expr) = evalExpr expr >>= registerIdent ident
registerIdent :: Ident -> Object -> Evaluator Object
registerIdent ident o = do
ref <- getEnvRef
lift $ insertVar ident o ref
return o
evalError :: Text -> Evaluator a
evalError = throwError . EvalError
evalExpr :: Expr -> Evaluator Object
evalExpr (IdentExpr i) = evalIdent i
evalExpr (LitExpr l) = evalLiteral l
evalExpr (PrefixExpr p e) = evalPrefix p e
evalExpr (InfixExpr i l r) = evalInfix i l r
evalExpr (IfExpr cond conse maybeAlter) = evalIf cond conse maybeAlter
evalExpr (FnExpr params body) = evalFn params body
evalExpr (CallExpr fn args) = evalCall fn args
evalExpr (ArrayExpr es) = evalArray es
evalExpr (HashExpr hs) = evalHash hs
evalExpr (IndexExpr a i) = evalIndex a i
evalIdent :: Ident -> Evaluator Object
evalIdent i = do
env <- getEnvRef
var <- lift $ getVar i env
case var of
Just o -> return o
Nothing -> evalError $ "identifier not found: " <> show i
evalLiteral :: Literal -> Evaluator Object
evalLiteral (IntLiteral i) = return $ OInt i
evalLiteral (BoolLiteral b) = return $ OBool b
evalLiteral (StringLiteral s) = return $ OString s
evalPrefix :: Prefix -> Expr -> Evaluator Object
evalPrefix Not = fmap (OBool . not) . (evalExpr >=> o2b)
evalPrefix PrefixPlus = fmap OInt . (evalExpr >=> o2n)
evalPrefix PrefixMinus = fmap (OInt . negate) . (evalExpr >=> o2n)
evalInfix :: Infix -> Expr -> Expr -> Evaluator Object
evalInfix Plus = (join .) . ee2x (oAdd) return
evalInfix Minus = (fmap OInt .) . ee2x (-) o2n
evalInfix Multiply = (fmap OInt .) . ee2x (*) o2n
evalInfix Divide = (fmap OInt .) . ee2x div o2n
evalInfix Eq = (fmap OBool .) . ee2x (==) return
evalInfix NotEq = (fmap OBool .) . ee2x (/=) return
evalInfix GreaterThan = (fmap OBool .) . ee2x (>) o2n
evalInfix LessThan = (fmap OBool .) . ee2x (<) o2n
oAdd :: Object -> Object -> Evaluator Object
oAdd (OInt x) (OInt y) = return . OInt $ x + y
oAdd (OString x) (OString y) = return . OString $ x <> y
oAdd x y = evalError $ show x <> " and " <> show y <> " are not addable"
evalIf :: Expr -> BlockStmt -> Maybe BlockStmt -> Evaluator Object
evalIf cond conse maybeAlter = do
condBool <- evalExpr cond >>= o2b
if condBool
then evalBlockStmt conse
else case maybeAlter of
Just alter -> evalBlockStmt alter
Nothing -> return nil
evalFn :: [Ident] -> BlockStmt -> Evaluator Object
evalFn params body = do
ref <- getEnvRef
return $ OFn params body ref
evalCall :: Expr -> [Expr] -> Evaluator Object
evalCall fnExpr argExprs = do
fn <- evalExpr fnExpr >>= o2f
case fn of
OFn params body fRef -> evalFnCall params body fRef
OBuiltInFn _ numParams fn -> evalBuiltInFnCall numParams fn
where
evalFnCall :: [Ident] -> BlockStmt -> EnvRef -> Evaluator Object
evalFnCall params body fRef = do
if length params /= length argExprs
then evalError $ "wrong number of arguments: "
<> show (length params) <> " expected but "
<> show (length argExprs) <> " given"
else do
args <- traverse evalExpr argExprs
origRef <- getEnvRef
lift (wrapEnv fRef $ zip params args) >>= setEnvRef
o <- returned <$> evalBlockStmt body
setEnvRef origRef
return o
evalBuiltInFnCall :: Int -> BuiltInFn -> Evaluator Object
evalBuiltInFnCall numParams fn = do
if numParams /= length argExprs
then evalError $ "wrong number of arguments: "
<> show (numParams) <> " expected but "
<> show (length argExprs) <> " given"
else do
args <- traverse evalExpr argExprs
res <- lift $ fn args
case res of
Left t -> evalError t
Right o -> return o
evalArray :: [Expr] -> Evaluator Object
evalArray = fmap OArray . traverse evalExpr
evalHash :: [(Literal, Expr)] -> Evaluator Object
evalHash hs = do
ps <- traverse evalPair hs
return . OHash $ M.fromList ps
where
evalPair :: (Literal, Expr) -> Evaluator (Hashable, Object)
evalPair (l, e) = do
h <- l2h l
o <- evalExpr e
return (h, o)
evalIndex :: Expr -> Expr -> Evaluator Object
evalIndex targetE idxE = do
target <- evalExpr targetE
case target of
OArray arr -> do
idx <- evalExpr idxE >>= o2n
return $ fromMaybe nil (arr `at` idx)
OHash hash -> do
h <- evalExpr idxE >>= o2h
return $ M.findWithDefault nil h hash
o -> evalError $ "unexpected index target: " <> show o
o2b :: Object -> Evaluator Bool
o2b (OBool b) = return b
o2b o = evalError $ show o <> " is not a bool"
o2n :: Object -> Evaluator Integer
o2n (OInt i) = return i
o2n o = evalError $ show o <> " is not a number"
o2f :: Object -> Evaluator Object
o2f o@(OFn _ _ _) = return o
o2f o@(OBuiltInFn _ _ _) = return o
o2f o = evalError $ show o <> " is not a function"
o2h :: Object -> Evaluator Hashable
o2h (OInt i) = return $ IntHash i
o2h (OBool b) = return $ BoolHash b
o2h (OString t) = return $ StringHash t
o2h o = evalError $ show o <> " is not hashable"
l2h :: Literal -> Evaluator Hashable
l2h = evalLiteral >=> o2h
ee2x :: (a -> a -> b) -> (Object -> Evaluator a) -> Expr -> Expr -> Evaluator b
ee2x f = (liftM2 f `on`) . (evalExpr >=>)
eval :: Program -> IO (Either EvalError Object)
eval p = do
s <- createEmptyState
fmap fst <$> evalWithState p s
evalWithState :: Program -> EvalState -> IO (Either EvalError (Object, EvalState))
evalWithState p s = execEvaluatorT (evalProgram p) s