Skip to content

Commit f5eb11b

Browse files
committed
Cheap and dirty CLI parsing for tail call option
1 parent 4466f8f commit f5eb11b

File tree

2 files changed

+70
-14
lines changed

2 files changed

+70
-14
lines changed

frontend/Compiler.hs

+36-10
Original file line numberDiff line numberDiff line change
@@ -8,10 +8,30 @@ import CaseLift
88
import Fresh
99
import Data.List
1010

11-
compileToGCode = labelProgram . compile . caseLift . parse
11+
{---------------------------------------------------
12+
------------- Compiler Options --------------------
13+
---------------------------------------------------}
1214

13-
writeGCodeFile name =
14-
writeFile name . iDisplay . printInstructions . compileToGCode
15+
data Option = TCO
16+
| OZ
17+
| File String
18+
deriving (Eq, Show)
19+
20+
isFile :: Option -> Bool
21+
isFile (File _) = True
22+
isFile _ = False
23+
24+
noTC :: [Option] -> Bool
25+
noTC = not . elem TCO
26+
27+
{---------------------------------------------------
28+
------------- Compiler Output ---------------------
29+
---------------------------------------------------}
30+
31+
compileToGCode opts = labelProgram . compile opts . caseLift . parse
32+
33+
writeGCodeFile opts name =
34+
writeFile name . iDisplay . printInstructions . compileToGCode opts
1535

1636
{-
1737
- Code for testing the compilation and labelling of G-Code:
@@ -170,11 +190,13 @@ type GMCompiledSC = (Name, Int, GMCode)
170190
--This function compiles to a list of tuples (one for each supercombinator).
171191
--Each tuple consists of the name of the SC, its arity, and the Code for the
172192
--supercombinator
173-
compile :: CoreProgram -> [GMCompiledSC]
174-
compile prog = map compileSC (prog ++ preludeDefs)
175-
++ compiledPrimitives
193+
compile :: [Option] -> CoreProgram -> [GMCompiledSC]
194+
compile opts prog
195+
| noTC opts = map (compileSC False) (prog ++ preludeDefs) ++ compiledPrimitives
196+
| otherwise = map (compileSC True) (prog ++ preludeDefs) ++ compiledPrimitives
176197

177198

199+
{- Things below not needed?!
178200
--This is the top-level compile function, it creates a heap with all of the
179201
--global function instances
180202
compileToHeap :: CoreProgram -> (GMHeap, GMGlobals)
@@ -196,18 +218,22 @@ allocateSC :: GMHeap -> GMCompiledSC -> (GMHeap, (Name, Addr))
196218
allocateSC heap (name, numArgs, gmCode) = (newHeap, (name, addr))
197219
where
198220
(newHeap, addr) = hAlloc heap (NGlobal numArgs gmCode)
199-
221+
-}
200222

201223
{-Below is the section that compiles the coreExpr to GCode
202224
- ---------------------------------------------------------------------
203225
- ---------------------------------------------------------------------
204226
- -}
205-
compileSC :: (Name, [Name], CoreExpr) -> GMCompiledSC
206-
compileSC (name, env, body)
207-
= (name, d, compileR body (zip env [0..]) d)
227+
compileSC :: Bool -> (Name, [Name], CoreExpr) -> GMCompiledSC
228+
compileSC b (name, env, body)
229+
| b = (name, d, compileR body (zip env [0..]) d)
230+
| otherwise = (name, d, compileRO body (zip env [0..]) d)
208231
where
209232
d = length env
210233

234+
compileRO :: GMCompiler
235+
compileRO exp env d = compileE exp env d ++ [Update d, Pop d, Unwind]
236+
211237
compileR :: GMCompiler
212238
compileR (ELet recursive defs e) env d
213239
| recursive = compileLetRec True compileR defs e env d

frontend/frontend.hs

+34-4
Original file line numberDiff line numberDiff line change
@@ -2,13 +2,43 @@ import Language
22
import Heap
33
import Parser
44
import Compiler
5+
import Data.List (partition)
6+
import Data.Either (partitionEithers)
57
import System.Environment
8+
import System.Exit
69
import System.FilePath.Posix
710

11+
options = [("tco", TCO)
12+
,("O0", OZ)
13+
]
14+
15+
parseArg :: String -> Either String Option
16+
parseArg ('-':op) = maybe err Right lu
17+
where
18+
lu = lookup op options
19+
err = Left $ "CL option " ++ op ++ " is not supported"
20+
parseArg f = Right $ File f
21+
22+
dealWithBadCLAs :: [String] -> IO ()
23+
dealWithBadCLAs [] = return ()
24+
dealWithBadCLAs xs = putStr (unlines xs) >> exitFailure
25+
26+
splitFiles :: [Option] -> ([String], [Option])
27+
splitFiles xs = ([s | File s <- ys], zs)
28+
where
29+
(ys, zs) = partition isFile xs
30+
831
main = do
9-
(file:xs) <- getArgs
10-
source <- readFile file
11-
let outputFile = replaceExtension file "gcode"
12-
writeGCodeFile outputFile source
32+
33+
-- Parse args and exit if a bad argument is given
34+
xs <- getArgs
35+
let (es, as) = partitionEithers $ fmap parseArg xs
36+
(fs, os) = splitFiles as
37+
dealWithBadCLAs es
38+
39+
-- read source files
40+
sources <- sequence $ fmap readFile fs
41+
let outputFiles = fmap (flip replaceExtension "gcode") fs
42+
sequence $ zipWith (writeGCodeFile os) outputFiles sources
1343

1444

0 commit comments

Comments
 (0)