clafer-0.3.5.1: clafer compiles Clafer models to other formats, such as Alloy, XML, HTML, Dot.

Safe HaskellSafe-Inferred

Language.Clafer.Common

Documentation

type Result = StringSource

mkIdent :: String -> PosIdentSource

mkInteger :: Read a => PosInteger -> aSource

getSuper :: IClafer -> StringSource

getSuperId :: [PExp] -> StringSource

isEqClaferId :: String -> IClafer -> BoolSource

idToPExp :: String -> Span -> String -> String -> Bool -> PExpSource

mkLClaferId :: String -> Bool -> IExpSource

mkPLClaferId :: String -> Bool -> PExpSource

pExpDef :: String -> Span -> IExp -> PExpSource

isParent :: PExp -> BoolSource

mapHierarchy :: (IClafer -> b) -> (IClafer -> String) -> [IClafer] -> IClafer -> [b]Source

findHierarchy :: (IClafer -> String) -> [IClafer] -> IClafer -> [IClafer]Source

apply :: forall t t1. (t -> t1) -> t -> (t, t1)Source

bfs :: forall b b1. (b1 -> (b, [b1])) -> [b1] -> [b]Source

lurry :: forall t t1. ([t1] -> t) -> t1 -> t1 -> tSource

fst3 :: forall t t1 t2. (t, t1, t2) -> tSource

snd3 :: forall t t1 t2. (t, t1, t2) -> t1Source

trd3 :: forall t t1 t2. (t, t1, t2) -> t2Source

toTriple :: forall t t1 t2. t -> (t1, t2) -> (t, t1, t2)Source

toMTriple :: forall t t1 t2. t -> (t1, t2) -> Maybe (t, t1, t2)Source

iNot :: StringSource

iCSet :: StringSource

iMin :: StringSource

iGMax :: StringSource

iGMin :: StringSource

iSumSet :: StringSource

unOps :: [String]Source

iIff :: StringSource

iImpl :: StringSource

iOr :: StringSource

iXor :: StringSource

iAnd :: StringSource

logBinOps :: [String]Source

iLt :: StringSource

iGt :: StringSource

iEq :: StringSource

iLte :: StringSource

iGte :: StringSource

iNeq :: StringSource

iIn :: StringSource

iNin :: StringSource

relGenBinOps :: [String]Source

relSetBinOps :: [String]Source

relBinOps :: [String]Source

iPlus :: StringSource

iSub :: StringSource

iMul :: StringSource

iDiv :: StringSource

iSumSet' :: StringSource

arithBinOps :: [String]Source

iUnion :: StringSource

iDomain :: StringSource

iRange :: StringSource

iJoin :: StringSource

setBinOps :: [String]Source

binOps :: [String]Source

mkIFunExp :: String -> [IExp] -> IExpSource

toLowerS :: String -> StringSource

this :: StringSource

parent :: StringSource

children :: StringSource

ref :: StringSource

specialNames :: [String]Source

strType :: StringSource

intType :: StringSource

modSep :: StringSource

isPrimitive :: String -> BoolSource

data GEnv Source

Constructors

GEnv 

Fields

identCountMap :: Map String Int
 
expCount :: Int
 
stable :: Map UID [[UID]]
 
sClafers :: [IClafer]
 

Instances

Eq GEnv 
Show GEnv 

voidf :: Monad m => m t -> m ()Source