2018-02-27 11:50:20 +03:00
|
|
|
{-# LANGUAGE DeriveDataTypeable #-}
|
|
|
|
{-# OPTIONS_GHC -fno-cse #-}
|
|
|
|
|
|
|
|
module Main where
|
|
|
|
|
2020-12-02 18:33:37 +03:00
|
|
|
import Data.Char (isUpper, toLower)
|
|
|
|
import Obj
|
2020-05-21 20:57:40 +03:00
|
|
|
import Options.Applicative hiding ((<|>))
|
2020-12-02 18:33:37 +03:00
|
|
|
import Path
|
|
|
|
import Reify
|
2018-02-27 11:50:20 +03:00
|
|
|
import Text.Parsec ((<|>))
|
|
|
|
import qualified Text.Parsec as Parsec
|
|
|
|
import Types
|
2020-12-02 18:33:37 +03:00
|
|
|
import Util
|
2018-02-27 11:50:20 +03:00
|
|
|
|
2020-12-03 14:02:58 +03:00
|
|
|
data Args = Args
|
|
|
|
{ prefixToRemove :: String,
|
|
|
|
kebabCase :: Bool,
|
2021-11-03 11:09:26 +03:00
|
|
|
emitCName :: Bool,
|
2020-12-03 14:02:58 +03:00
|
|
|
sourcePath :: String
|
|
|
|
}
|
2020-12-02 18:33:37 +03:00
|
|
|
deriving (Show)
|
2018-02-27 11:50:20 +03:00
|
|
|
|
2020-05-21 20:57:40 +03:00
|
|
|
parseArgs :: Parser Args
|
2020-12-02 18:33:37 +03:00
|
|
|
parseArgs =
|
|
|
|
Args
|
|
|
|
<$> strOption (long "prefixtoremove" <> short 'p' <> metavar "ITEM" <> value "")
|
|
|
|
<*> switch (long "kebabcase" <> short 'f')
|
2021-11-03 11:09:26 +03:00
|
|
|
<*> switch (long "emitcname" <> short 'c')
|
2020-12-02 18:33:37 +03:00
|
|
|
<*> argument str (metavar "FILE")
|
|
|
|
|
|
|
|
main = do
|
|
|
|
parsedArgs <- execParser $ Options.Applicative.info (parseArgs <**> helper) fullDesc
|
|
|
|
let path = sourcePath parsedArgs
|
|
|
|
if path /= ""
|
|
|
|
then do
|
|
|
|
source <- slurp path
|
|
|
|
putStrLn
|
|
|
|
( joinWith
|
|
|
|
"\n"
|
|
|
|
( map
|
|
|
|
pretty
|
|
|
|
( parseHeaderFile
|
|
|
|
path
|
|
|
|
source
|
|
|
|
(prefixToRemove parsedArgs)
|
|
|
|
(kebabCase parsedArgs)
|
2021-11-03 11:09:26 +03:00
|
|
|
(emitCName parsedArgs)
|
2020-12-02 18:33:37 +03:00
|
|
|
)
|
|
|
|
)
|
|
|
|
)
|
|
|
|
else print parsedArgs
|
2018-02-27 11:50:20 +03:00
|
|
|
|
2021-11-03 11:09:26 +03:00
|
|
|
parseHeaderFile :: FilePath -> String -> String -> Bool -> Bool -> [XObj]
|
|
|
|
parseHeaderFile path src prefix kebab cName =
|
2018-02-27 11:50:20 +03:00
|
|
|
case Parsec.runParser cSyntax () path src of
|
|
|
|
Left err -> error (show err)
|
2018-02-27 12:32:25 +03:00
|
|
|
Right ok -> concat ok
|
2018-02-27 11:50:20 +03:00
|
|
|
where
|
2020-12-02 18:33:37 +03:00
|
|
|
cSyntax :: Parsec.Parsec String () [[XObj]]
|
|
|
|
cSyntax = Parsec.sepBy line (Parsec.char '\n')
|
|
|
|
line :: Parsec.Parsec String () [XObj]
|
|
|
|
line =
|
|
|
|
Parsec.try prefixedFunctionPrototype
|
|
|
|
<|> Parsec.try functionPrototype
|
|
|
|
<|> Parsec.try define
|
|
|
|
<|> discarded
|
|
|
|
define :: Parsec.Parsec String () [XObj]
|
|
|
|
define = do
|
|
|
|
Parsec.many spaceOrTab
|
|
|
|
Parsec.string "#define"
|
|
|
|
Parsec.many spaceOrTab
|
|
|
|
name <- Parsec.many1 identifierChar
|
|
|
|
argList <- Parsec.optionMaybe argList
|
|
|
|
Parsec.many spaceOrTab
|
|
|
|
_ <- defineBody
|
|
|
|
Parsec.many spaceOrTab
|
|
|
|
-- OBS! Never kebab
|
|
|
|
case argList of
|
|
|
|
Nothing ->
|
|
|
|
let tyXObj =
|
|
|
|
XObj (Sym (SymPath [] "a") Symbol) Nothing Nothing
|
2021-11-03 11:09:26 +03:00
|
|
|
in pure (createRegisterForm name tyXObj prefix False cName)
|
2020-12-02 18:33:37 +03:00
|
|
|
Just args ->
|
|
|
|
let argsTy = genTypes (length args)
|
|
|
|
tyXObj = toFnTypeXObj argsTy ("a", 0)
|
2021-11-03 11:09:26 +03:00
|
|
|
in pure (createRegisterForm name tyXObj prefix False cName)
|
2020-12-02 18:33:37 +03:00
|
|
|
where
|
|
|
|
argList = do
|
|
|
|
_ <- Parsec.char '('
|
|
|
|
args <-
|
|
|
|
Parsec.sepBy
|
|
|
|
( Parsec.many spaceOrTab
|
|
|
|
>> Parsec.many1 identifierChar
|
|
|
|
)
|
|
|
|
(Parsec.char ',')
|
|
|
|
_ <- Parsec.char ')'
|
|
|
|
pure args
|
|
|
|
genTypes 0 = []
|
|
|
|
genTypes n = (("a" ++ show n), 0) : genTypes (n - 1)
|
|
|
|
defineBody :: Parsec.Parsec String () ()
|
|
|
|
defineBody = do
|
|
|
|
s <- Parsec.many (Parsec.noneOf "\\\n")
|
|
|
|
ending <- Parsec.optionMaybe (Parsec.string "\\\n")
|
|
|
|
case ending of
|
|
|
|
Nothing ->
|
|
|
|
do
|
|
|
|
c <- Parsec.optionMaybe (Parsec.noneOf "\n")
|
|
|
|
case c of
|
|
|
|
Just _ -> defineBody
|
|
|
|
Nothing -> pure ()
|
|
|
|
Just _ -> defineBody
|
|
|
|
prefixedFunctionPrototype :: Parsec.Parsec String () [XObj]
|
|
|
|
prefixedFunctionPrototype = do
|
|
|
|
Parsec.many spaceOrTab
|
|
|
|
_ <- Parsec.many1 identifierChar
|
|
|
|
functionPrototype
|
|
|
|
functionPrototype :: Parsec.Parsec String () [XObj]
|
|
|
|
functionPrototype = do
|
|
|
|
Parsec.many spaceOrTab
|
|
|
|
returnTypeString <- Parsec.many1 identifierChar
|
|
|
|
stars1 <- stars
|
|
|
|
Parsec.many1 spaceOrTab
|
|
|
|
stars2 <- stars
|
|
|
|
name <- Parsec.many1 identifierChar
|
|
|
|
Parsec.many spaceOrTab
|
|
|
|
argTypeStrings <-
|
|
|
|
Parsec.try voidArg
|
|
|
|
<|> argList
|
|
|
|
Parsec.many spaceOrTab
|
|
|
|
Parsec.char ';'
|
|
|
|
Parsec.many (Parsec.noneOf "\n")
|
|
|
|
let tyXObj = toFnTypeXObj argTypeStrings (returnTypeString, length stars1 + length stars2)
|
2021-11-03 11:09:26 +03:00
|
|
|
pure (createRegisterForm name tyXObj prefix kebab cName)
|
2020-12-02 18:33:37 +03:00
|
|
|
voidArg :: Parsec.Parsec String () [(String, Int)]
|
|
|
|
voidArg = do
|
|
|
|
_ <- Parsec.string "(void)"
|
|
|
|
pure []
|
|
|
|
argList :: Parsec.Parsec String () [(String, Int)]
|
|
|
|
argList = do
|
|
|
|
Parsec.char '('
|
|
|
|
args <- Parsec.sepBy arg (Parsec.char ',')
|
|
|
|
Parsec.char ')'
|
|
|
|
pure args
|
|
|
|
arg :: Parsec.Parsec String () (String, Int)
|
|
|
|
arg = do
|
|
|
|
Parsec.many spaceOrTab
|
|
|
|
_ <- Parsec.option "" $ do
|
|
|
|
Parsec.string "const"
|
|
|
|
Parsec.many spaceOrTab
|
|
|
|
argTypeAsString <- Parsec.many1 identifierChar
|
|
|
|
stars1 <- stars
|
|
|
|
Parsec.many1 spaceOrTab
|
|
|
|
stars2 <- stars
|
|
|
|
_ <- Parsec.many1 identifierChar
|
|
|
|
Parsec.many spaceOrTab
|
|
|
|
pure (argTypeAsString, length stars1 + length stars2)
|
|
|
|
stars :: Parsec.Parsec String () String
|
|
|
|
stars = Parsec.many (Parsec.char '*')
|
|
|
|
spaceOrTab :: Parsec.Parsec String () Char
|
|
|
|
spaceOrTab = Parsec.choice [Parsec.char ' ', Parsec.char '\t']
|
|
|
|
discarded :: Parsec.Parsec String () [XObj]
|
|
|
|
discarded = do
|
|
|
|
discardedLine <- Parsec.many (Parsec.noneOf "\n")
|
|
|
|
pure []
|
|
|
|
|
|
|
|
--pure [(XObj (Str ("DISCARDED: " ++ discardedLine)) Nothing Nothing)]
|
2018-02-27 12:32:25 +03:00
|
|
|
|
2021-11-03 11:09:26 +03:00
|
|
|
createRegisterForm :: String -> XObj -> String -> Bool -> Bool -> [XObj]
|
|
|
|
createRegisterForm name tyXObj prefix kebab cName =
|
2020-12-02 18:33:37 +03:00
|
|
|
let carpName =
|
|
|
|
(if kebab then (toKebab . lowerFirst) else id)
|
|
|
|
(if prefix == "" then name else removePrefix prefix name)
|
2018-03-06 15:47:53 +03:00
|
|
|
emitName = name
|
2020-12-02 18:33:37 +03:00
|
|
|
in [ XObj
|
|
|
|
( Lst
|
|
|
|
( [ (XObj (Sym (SymPath [] "register") Symbol) Nothing Nothing),
|
|
|
|
(XObj (Sym (SymPath [] carpName) Symbol) Nothing Nothing),
|
|
|
|
tyXObj
|
|
|
|
]
|
2021-11-03 11:09:26 +03:00
|
|
|
++ if (prefix /= "") || kebab || cName
|
|
|
|
then [(XObj (Str emitName) Nothing Nothing)]
|
|
|
|
else []
|
2020-12-02 18:33:37 +03:00
|
|
|
)
|
|
|
|
)
|
|
|
|
Nothing
|
|
|
|
Nothing
|
|
|
|
]
|
2018-03-06 15:47:53 +03:00
|
|
|
|
|
|
|
toFnTypeXObj :: [(String, Int)] -> (String, Int) -> XObj
|
|
|
|
toFnTypeXObj argTypeStrings returnTypeString =
|
2020-12-02 18:33:37 +03:00
|
|
|
( XObj
|
|
|
|
( Lst
|
|
|
|
[ (XObj (Sym (SymPath [] "λ") Symbol) Nothing Nothing),
|
|
|
|
(XObj (Arr (map (reify . cTypeToCarpType) argTypeStrings)) Nothing Nothing),
|
|
|
|
(XObj (Sym (SymPath [] (show (cTypeToCarpType returnTypeString))) Symbol) Nothing Nothing)
|
|
|
|
]
|
|
|
|
)
|
|
|
|
Nothing
|
|
|
|
Nothing
|
|
|
|
)
|
2018-02-27 12:32:25 +03:00
|
|
|
|
2018-03-06 15:47:53 +03:00
|
|
|
toTypeXObj :: (String, Int) -> XObj
|
|
|
|
toTypeXObj typeString =
|
|
|
|
(XObj (Sym (SymPath [] (show (cTypeToCarpType typeString))) Symbol) Nothing Nothing)
|
|
|
|
|
2018-02-27 13:00:39 +03:00
|
|
|
cTypeToCarpType :: (String, Int) -> Ty
|
2021-11-03 11:09:26 +03:00
|
|
|
cTypeToCarpType ("char", 0) = CCharTy
|
2018-02-27 13:00:39 +03:00
|
|
|
cTypeToCarpType ("int", 0) = IntTy
|
|
|
|
cTypeToCarpType ("bool", 0) = BoolTy
|
|
|
|
cTypeToCarpType ("long", 0) = LongTy
|
|
|
|
cTypeToCarpType ("double", 0) = DoubleTy
|
|
|
|
cTypeToCarpType ("float", 0) = FloatTy
|
|
|
|
cTypeToCarpType ("void", 0) = UnitTy
|
Refactor: clean up Env module, store type environments in modules (#1207)
* refactor: major environment mgmt refactor
This big refactor primarily changes two things in terms of behavior:
1. Stores a SymPath on concretely named (non-generic) struct types;
before we stored a string.
2. The SymPath mentioned in (1.) designates where the struct is stored
in the current environment chain. Modules now carry a local type
environment in addition to their local value environments. Any types
defined in the module are added to this environment rather than the
global type environment.
To resolve a type such as `Foo.Bar` we now do the following:
- Search the *global value environment* for the Foo module.
- Get the type environment stored in the Foo module.
- Search for Bar in the Foo module's type environment.
Additionally, this commit eliminates the Lookup module entirely and
refactors the Env module to handle all aspects of environment management
in hopefully a more reusable fashion.
I also took the opportunity to refactor primitiveDeftype in Primitives
and qualifySym in Qualify, both of which were hefty functions that I
found difficult to grok and needed refactoring anyway as a result of
lookup changes (lookups now return an Either instead of a Maybe).
Subsequent commits will clean up and clarify this work further.
This does include one minor regression. Namely, an implementation of
`hash` in core/Color that was maximally generic now needs type casting.
* refactor: clean up recent Env changes
This commit removes some redundant functions, unifies some logic, and
renames some routines across the Env module in efforts to make it
cleaner. Call sites have been updated accordingly.
* chore: format code with ormolu
* fix: update lookup tests
Changes references to renamed functions in the Env module.
* refactor: style + additional improvements from eriksvedang@
- Rename arrayTy -> arrayTyA in ArrayTemplates.hs to disambiguate.
- Add maybeId util function.
- Remove commented code.
- Refactor a few functions for readability.
* fix: fix type inference regression
Recent commits introduced one minor regression whereby an instance of
type inference in core/Color.carp no longer worked and required
explicit type annotation. The problem ultimately had to do with
qualification:
- Prior to the recent changes, type inference worked because the call in
question was qualified to Color.Id.get-tag, fixing the type.
- Failing to copy over a local envs Use modules to function envs
resulted in finding more than just Color.Id.get-tag for this instance.
We now copy use modules over to function envs generated during
qualification to ensure we resolve to Use'd definitions before more
general cases.
Similarly, I made a small change to primitiveUse to support contextual
use calls (e.g. the `(use Id)` in Color.carp, which really means `(use
Color.Id)`)
* chore: Update some clarificatory comments
* chore: fix inline comment
2021-05-19 20:20:48 +03:00
|
|
|
cTypeToCarpType (s, 0) = (StructTy (ConcreteNameTy (SymPath [] s)) [])
|
2018-02-27 13:00:39 +03:00
|
|
|
cTypeToCarpType (x, stars) = (PointerTy (cTypeToCarpType (x, stars - 1)))
|
2018-02-27 15:40:40 +03:00
|
|
|
|
2018-02-27 17:57:00 +03:00
|
|
|
identifierChar :: Parsec.Parsec String () Char
|
|
|
|
identifierChar = Parsec.choice [Parsec.letter, Parsec.digit, Parsec.char '_']
|
|
|
|
|
|
|
|
removePrefix :: String -> String -> String
|
|
|
|
removePrefix prefix s =
|
|
|
|
case Parsec.runParser match () "" s of
|
|
|
|
Left err -> s
|
|
|
|
Right ok -> ok
|
2020-12-02 18:33:37 +03:00
|
|
|
where
|
|
|
|
match =
|
|
|
|
do
|
|
|
|
_ <- Parsec.string prefix
|
|
|
|
Parsec.many1 identifierChar
|
2018-02-27 17:57:00 +03:00
|
|
|
|
|
|
|
lowerFirst :: String -> String
|
|
|
|
lowerFirst (c : cs) = toLower c : cs
|
|
|
|
|
|
|
|
toKebab :: String -> String
|
|
|
|
toKebab [] = []
|
|
|
|
toKebab (c : cs) = (if isUpper c then ['-', toLower c] else [c]) ++ toKebab cs
|