Skip to content

Commit 4d7998c

Browse files
committed
Ability to call expressions in parentheses
1 parent d8ebab0 commit 4d7998c

File tree

7 files changed

+80
-13
lines changed

7 files changed

+80
-13
lines changed

lib/AST.hs

+3
Original file line numberDiff line numberDiff line change
@@ -59,6 +59,7 @@ data Expr
5959
| StrictEval Expr
6060
| External String [Expr]
6161
| CharLit Char
62+
| ParenApply Expr [Expr] Position
6263
deriving
6364
( Show
6465
, Generic
@@ -119,6 +120,7 @@ children (StrictEval a) = [a]
119120
children (External _ a) = a
120121
children (CharLit _) = []
121122
children (DoubleLit _) = []
123+
children (ParenApply a b _) = a : b
122124

123125
newtype Position = Position (Int, Int) deriving (Show, Generic, Ord)
124126

@@ -241,6 +243,7 @@ typeOf (StrictEval x) = typeOf x
241243
typeOf (External _ _) = error "Cannot infer type of external"
242244
typeOf (CharLit _) = StructT "Char"
243245
typeOf (DoubleLit _) = StructT "Double"
246+
typeOf (ParenApply a _ _) = typeOf a
244247

245248
typesMatch :: [Type] -> [Type] -> Bool
246249
typesMatch [] [] = True

lib/BytecodeCompiler.hs

+6-2
Original file line numberDiff line numberDiff line change
@@ -17,6 +17,7 @@ import Data.String
1717
import Data.Text (isPrefixOf, splitOn)
1818
import Data.Text qualified
1919
import Data.Text qualified as T
20+
import Debug.Trace
2021
import Foreign (nullPtr, ptrToWordPtr)
2122
import Foreign.C.Types ()
2223
import GHC.Generics (Generic)
@@ -381,14 +382,17 @@ compileExpr (Parser.FuncDef origName args body) = do
381382
return [Dup, Push $ DInt $ fromIntegral x, Eq, Jf nextFunName]
382383
compileParameter Parser.Placeholder _ = return []
383384
compileParameter x _ = error $ show x ++ ": not implemented as a function parameter"
385+
compileExpr (Parser.ParenApply x y _) = do
386+
fun <- compileExpr x
387+
args <- concatMapM compileExpr y
388+
return $ args ++ fun ++ [CallS]
384389
compileExpr (Parser.Var x _) = do
385390
functions' <- gets functions
386391
curCon <- gets currentContext
387392
externals' <- gets externals
388-
389393
let fun =
390394
any ((== x) . baseName) functions'
391-
|| any ((== curCon ++ "@" ++ x) . baseName) functions'
395+
|| any ((\context -> any ((== context ++ "@" ++ x) . baseName) functions') . intercalate "@") (inits (Data.List.Split.splitOn "@" curCon))
392396
|| any ((== x) . ((Data.Text.unpack . last . splitOn "::") . fromString . baseName)) functions'
393397
if fun || x `elem` internalFunctions || x `elem` map (\f -> f.name) externals'
394398
then compileExpr (Parser.FuncCall x [] zeroPosition)

lib/Parser.hs

+16-1
Original file line numberDiff line numberDiff line change
@@ -85,7 +85,7 @@ binOpTable =
8585
, [binary "as" Cast]
8686
, [prefix "$" StrictEval]
8787
, [prefix "!" Not]
88-
, [prefix "-" UnaryMinus]
88+
-- , [prefix "-" UnaryMinus]
8989
, [binary "**" Power, binary "*" Mul, binary "/" Div]
9090
, [binary "%" Modulo]
9191
, [binary "+" Add, binary "-" Sub]
@@ -265,6 +265,14 @@ funcCall = do
265265
end <- getOffset
266266
return $ FuncCall name args (Position (start, end))
267267

268+
parenApply :: Parser Expr
269+
parenApply = do
270+
start <- getOffset
271+
paren <- parens expr
272+
args <- sepBy1 expr (symbol ",") <?> "function arguments"
273+
end <- getOffset
274+
return $ ParenApply paren args (Position (start, end))
275+
268276
letExpr :: Parser Expr
269277
letExpr = do
270278
keyword "let"
@@ -537,10 +545,17 @@ external = do
537545
symbol "end"
538546
return $ External from decs
539547

548+
unaryMinus :: Parser Expr
549+
unaryMinus = parens $ do
550+
symbol "-"
551+
UnaryMinus <$> expr
552+
540553
term :: Parser Expr
541554
term =
542555
choice
543556
[ placeholder
557+
, try unaryMinus
558+
, try parenApply
544559
, parens expr
545560
, CharLit <$> try charLit
546561
, DoubleLit <$> try double

lib/Verifier.hs

+1
Original file line numberDiff line numberDiff line change
@@ -136,6 +136,7 @@ typeOf' x@Impl{} = return $ typeOf x
136136
typeOf' x@External{} = return $ typeOf x
137137
typeOf' x@Placeholder{} = return $ typeOf x
138138
typeOf' x@Let{} = return $ typeOf x
139+
typeOf' x@ParenApply{} = return $ typeOf x
139140

140141
compareTypes' :: Type -> Type -> [AST.GenericExpr] -> StateT VerifierState IO Bool
141142
compareTypes' (List x) (List y) generics = compareTypes' x y generics

share/std/prelude.in

+4-1
Original file line numberDiff line numberDiff line change
@@ -155,7 +155,7 @@ sqrt x = x ** 0.5
155155
abs :: Float -> Float
156156
abs x = do
157157
if x < 0.0 then do
158-
-x
158+
(-x)
159159
else do
160160
x
161161
end
@@ -187,3 +187,6 @@ let void (x: Any) => Any = _
187187

188188
let head ((x:xs): [Any]) => Any = x
189189
let tail ((_:xs): [Any]) => [Any] = xs
190+
191+
compose :: Any -> Any -> Any
192+
compose f g = \x -> f (g x)

tests/IntegrationSpec.hs

+34-6
Original file line numberDiff line numberDiff line change
@@ -51,9 +51,9 @@ spec = do
5151
describe "Hello World" $ do
5252
it "Should print Hello, world!" $ do
5353
compileAndRun "let main => IO = println \"Hello, world!\"" `shouldReturn` "Hello, world!\n"
54-
describe "println" $ do
55-
it "Can print any string" $ do
56-
property $ \s -> compileAndRun ("let main => IO = println " ++ show s) `shouldReturn` (s ++ "\n")
54+
-- describe "println" $ do
55+
-- it "Can print any string" $ do
56+
-- property $ \s -> compileAndRun ("let main => IO = println " ++ show s) `shouldReturn` (s ++ "\n")
5757
describe "Operator precedence" $ do
5858
it "Has working precedence for multiplication" $ do
5959
compileAndRun "let main => IO = println 1 + 2 * 3" `shouldReturn` "7\n"
@@ -120,7 +120,7 @@ spec = do
120120
f :: Int -> Int
121121
f x = x + 1
122122
f :: String -> String
123-
f x = "'":x:"'"
123+
f x = "'":x:"'"
124124
let main => IO = do
125125
println f 1
126126
println f "test"
@@ -297,7 +297,7 @@ spec = do
297297
external "__default" = do
298298
puts :: String -> IO
299299
end
300-
300+
301301
let main => IO = do
302302
puts "Hello, World!\n"
303303
end
@@ -309,13 +309,41 @@ spec = do
309309
external "__default" = do
310310
strlen :: String -> Int
311311
end
312-
312+
313313
let main => IO = do
314314
println strlen "Hello, World!\n"
315315
end
316316
|]
317317
`shouldReturn` "14\n"
318318

319+
describe "Function composition" $ do
320+
it "Direct" $ do
321+
compileAndRun
322+
[r|
323+
compose :: Any -> Any -> Any
324+
compose f g = \x -> f (g x)
325+
326+
increase :: Int -> Int
327+
increase x = x + 1
328+
329+
println (compose increase, increase) 2
330+
|]
331+
`shouldReturn` "4\n"
332+
it "Indirect" $
333+
compileAndRun
334+
[r|
335+
compose :: Any -> Any -> Any
336+
compose f g = \x -> f (g x)
337+
338+
increase :: Int -> Int
339+
increase x = x + 1
340+
341+
increaseByTwo :: Int -> Int
342+
increaseByTwo x = (compose increase, increase) x
343+
344+
println increaseByTwo 2
345+
|]
346+
`shouldReturn` "4\n"
319347
describe "No main" $ do
320348
it "Hello World" $ do
321349
compileAndRun

tests/ParserSpec.hs

+16-3
Original file line numberDiff line numberDiff line change
@@ -114,14 +114,27 @@ spec = do
114114
(Program [FuncCall "filter" [FuncCall "==" [IntLit 1] anyPosition, ListLit [IntLit 1, IntLit 2, IntLit 3]] anyPosition])
115115
describe "Unary minus" $ do
116116
it "Should parse unary minus" $
117-
parseProgram "-1" parserCompilerFlags
117+
parseProgram "(-1)" parserCompilerFlags
118118
`shouldBe` Right
119119
(Program [UnaryMinus (IntLit 1)])
120120
it "Should be able to use negative numbers in multiplication" $
121-
parseProgram "1 *-1" parserCompilerFlags
121+
parseProgram "1 * (-1)" parserCompilerFlags
122122
`shouldBe` Right
123123
(Program [Mul (IntLit 1) (UnaryMinus (IntLit 1))])
124124
it "Should be able to negate expressions in parentheses" $
125-
parseProgram "2 * -(3-x*5)" parserCompilerFlags
125+
parseProgram "2 * (-(3-x*5))" parserCompilerFlags
126126
`shouldBe` Right
127127
(Program [Mul (IntLit 2) (UnaryMinus (Sub (IntLit 3) (Mul (Var "x" anyPosition) (IntLit 5))))])
128+
describe "Parentheses" $ do
129+
it "Should parse parentheses" $
130+
parseProgram "(1 + 2) * 3" parserCompilerFlags
131+
`shouldBe` Right
132+
(Program [Mul (Add (IntLit 1) (IntLit 2)) (IntLit 3)])
133+
it "Should parse parenthesis application correctly" $
134+
parseProgram "(x y) z" parserCompilerFlags
135+
`shouldBe` Right
136+
(Program [ParenApply (FuncCall "x" [Var "y" anyPosition] anyPosition) [Var "z" anyPosition] anyPosition])
137+
it "bottles (i)-1" $
138+
parseProgram "bottles (i)-1" parserCompilerFlags
139+
`shouldBe` Right
140+
(Program [FuncCall "bottles" [Sub (Var "i" anyPosition) (IntLit 1)] anyPosition])

0 commit comments

Comments
 (0)