Added support for enumerations

This commit is contained in:
VegOwOtenks 2025-01-25 21:37:13 +01:00
parent 01fafec1c0
commit 2cd9b04b85
8 changed files with 57 additions and 35 deletions

View file

@ -6,4 +6,4 @@ main :: IO ()
main = do main = do
text <- getContents text <- getContents
print $ Parsec.parse File.parse "<stdin>" text print $ Parsec.parse (File.parse <* Parsec.eof) "<stdin>" text

View file

@ -1,23 +0,0 @@
module Ubc.Parse.Syntax.Data.Struct
( Struct(..)
, addVariable
, addFunction)
where
import Ubc.Parse.Syntax.VariableType (VariableType)
import Ubc.Parse.Syntax.Function (Function)
type VariableName = String
data Struct = Struct
{ name :: String
, variables :: [(VariableName, VariableType)]
, functions :: [Function]
}
deriving (Show)
addVariable :: Struct -> VariableName -> VariableType -> Struct
addVariable (Struct sn vs fs) n t = Struct sn ((n, t): vs) fs
addFunction :: Struct -> Function -> Struct
addFunction (Struct sn vs fs) f = Struct sn vs (f:fs)

View file

@ -0,0 +1,23 @@
module Ubc.Parse.Syntax.Enumeration
( Enumeration(..)
, parse
)
where
import qualified Ubc.Parse.Syntax.Language as UbcLanguage
import Text.Parsec (ParsecT, many)
type EnumerationMember = String
data Enumeration = Enumeration
{ name :: String
, members :: [EnumerationMember]
}
deriving (Show)
parse :: Monad m => ParsecT String u m Enumeration
parse = do
UbcLanguage.reserved "enum"
identifier <- UbcLanguage.identifier
values <- UbcLanguage.braces $ many UbcLanguage.identifier
return $ Enumeration identifier values

View file

@ -8,38 +8,45 @@ import Control.Monad ((<$!>))
import Text.Parsec (choice, ParsecT, many) import Text.Parsec (choice, ParsecT, many)
import Ubc.Parse.Syntax.Data.Struct ( Struct ) import Ubc.Parse.Syntax.Struct ( Struct )
import Ubc.Parse.Syntax.Function (Function) import Ubc.Parse.Syntax.Function (Function)
import Ubc.Parse.Syntax.Statement (Statement) import Ubc.Parse.Syntax.Statement (Statement)
import Ubc.Parse.Syntax.Enumeration (Enumeration)
import qualified Ubc.Parse.Syntax.Struct as Struct import qualified Ubc.Parse.Syntax.Struct as Struct
import qualified Ubc.Parse.Syntax.Function as Function import qualified Ubc.Parse.Syntax.Function as Function
import qualified Ubc.Parse.Syntax.Statement as Statement import qualified Ubc.Parse.Syntax.Statement as Statement
import qualified Ubc.Parse.Syntax.Enumeration as Enumeration
data File = File data File = File
{ name :: String { name :: String
, structs :: [Struct] , structs :: [Struct]
, functions :: [Function] , functions :: [Function]
, statements :: [Statement] , statements :: [Statement]
, enumerations :: [Enumeration]
} }
deriving (Show) deriving (Show)
data FileMember = FileFunction Function data FileMember = FileFunction Function
| FileStruct Struct | FileStruct Struct
| FileEnumeration Enumeration
| FileStatement Statement | FileStatement Statement
accumulateFile :: File -> FileMember -> File accumulateFile :: File -> FileMember -> File
accumulateFile (File name_ struct_ functions_ statements_) (FileFunction f) = File name_ struct_ (f:functions_) statements_ accumulateFile (File name_ sss fs sts es) (FileStruct s) = File name_ (s:sss) fs sts es
accumulateFile (File name_ struct_ functions_ statements_) (FileStatement s) = File name_ struct_ functions_ (s:statements_) accumulateFile (File name_ sss fs sts es) (FileFunction f) = File name_ sss (f:fs) sts es
accumulateFile (File name_ struct_ functions_ statements_) (FileStruct s) = File name_ (s:struct_) functions_ statements_ accumulateFile (File name_ sss fs sts es) (FileStatement s) = File name_ sss fs (s:sts) es
accumulateFile (File name_ sss fs sts es) (FileEnumeration e) = File name_ sss fs sts (e:es)
parse :: Monad m => ParsecT String u m File parse :: Monad m => ParsecT String u m File
parse = foldl accumulateFile (File "" [] [] []) <$!> many fileMember parse = foldr (flip accumulateFile) (File "" [] [] [] []) <$!> many fileMember
fileMember :: Monad m => ParsecT String u m FileMember fileMember :: Monad m => ParsecT String u m FileMember
fileMember = choice fileMember = choice
[ FileStruct <$!> Struct.parse [ FileStruct <$!> Struct.parse
, FileFunction <$!> Function.parse , FileFunction <$!> Function.parse
, FileStatement <$!> Statement.parse , FileStatement <$!> Statement.parse
, FileEnumeration <$!> Enumeration.parse
] ]

View file

@ -56,6 +56,7 @@ languageDef = LanguageDef {
, opStart = oneOf "+-*/%" , opStart = oneOf "+-*/%"
, opLetter = oneOf "+-*/%" , opLetter = oneOf "+-*/%"
, reservedNames = [ "struct" , reservedNames = [ "struct"
, "enum"
, "u32" , "u32"
, "i32" , "i32"
, "f32" , "f32"

View file

@ -13,18 +13,32 @@ import Text.Parsec
ParsecT, ParsecT,
) )
import Ubc.Parse.Syntax.Data.Struct (Struct(..))
import Ubc.Parse.Syntax.VariableType (VariableType) import Ubc.Parse.Syntax.VariableType (VariableType)
import Ubc.Parse.Syntax.Function (Function)
import qualified Ubc.Parse.Syntax.Language as UbcLanguage import qualified Ubc.Parse.Syntax.Language as UbcLanguage
import qualified Ubc.Parse.Syntax.VariableType as VariableType import qualified Ubc.Parse.Syntax.VariableType as VariableType
import qualified Ubc.Parse.Syntax.Data.Struct as Struct
import qualified Ubc.Parse.Syntax.Function as Function import qualified Ubc.Parse.Syntax.Function as Function
type VariableName = String type VariableName = String
data StructStatement = Variable VariableName VariableType data StructStatement = Variable VariableName VariableType
| Function Function.Function | Function Function.Function
data Struct = Struct
{ name :: String
, variables :: [(VariableName, VariableType)]
, functions :: [Function]
}
deriving (Show)
addVariable :: Struct -> VariableName -> VariableType -> Struct
addVariable (Struct sn vs fs) n t = Struct sn ((n, t): vs) fs
addFunction :: Struct -> Function -> Struct
addFunction (Struct sn vs fs) f = Struct sn vs (f:fs)
parse :: Monad m => ParsecT String u m Struct parse :: Monad m => ParsecT String u m Struct
parse = do parse = do
_ <- UbcLanguage.reserved "struct" _ <- UbcLanguage.reserved "struct"
@ -33,8 +47,8 @@ parse = do
foldl accumulateStruct (Struct structIdentifier [] []) <$!> UbcLanguage.braces (many structMember) foldl accumulateStruct (Struct structIdentifier [] []) <$!> UbcLanguage.braces (many structMember)
accumulateStruct :: Struct -> StructStatement -> Struct accumulateStruct :: Struct -> StructStatement -> Struct
accumulateStruct s (Variable n t) = Struct.addVariable s n t accumulateStruct s (Variable n t) = addVariable s n t
accumulateStruct s (Function f) = Struct.addFunction s f accumulateStruct s (Function f) = addFunction s f
structMember :: Monad m => ParsecT String u m StructStatement structMember :: Monad m => ParsecT String u m StructStatement
structMember = choice [ structVariableOrFunction ] structMember = choice [ structVariableOrFunction ]

View file

@ -9,7 +9,7 @@ import Control.Monad ((<$!>))
import Text.Parsec (choice, ParsecT) import Text.Parsec (choice, ParsecT)
import Ubc.Parse.Syntax.VariableType (VariableType) import Ubc.Parse.Syntax.VariableType (VariableType)
import Ubc.Parse.Syntax.Data.Struct (Struct) import Ubc.Parse.Syntax.Struct (Struct)
import qualified Ubc.Parse.Syntax.Language as UbcLanguage import qualified Ubc.Parse.Syntax.Language as UbcLanguage
import qualified Ubc.Parse.Syntax.VariableType as VariableType import qualified Ubc.Parse.Syntax.VariableType as VariableType

View file

@ -26,7 +26,7 @@ source-repository head
library library
exposed-modules: exposed-modules:
Ubc.Parse.Syntax.Config Ubc.Parse.Syntax.Config
Ubc.Parse.Syntax.Data.Struct Ubc.Parse.Syntax.Enumeration
Ubc.Parse.Syntax.Expression Ubc.Parse.Syntax.Expression
Ubc.Parse.Syntax.File Ubc.Parse.Syntax.File
Ubc.Parse.Syntax.Function Ubc.Parse.Syntax.Function