| Safe Haskell | None | 
|---|---|
| Language | Haskell2010 | 
Language.Clafer.IG.ClaferIG
Documentation
Constructors
| IGArgs | |
Fields 
  | |
data ClaferIGEnv Source
Constructors
| ClaferIGEnv | |
Fields 
  | |
getClaferEnv :: Monad m => ClaferIGT m ClaferEnv Source
getClaferIGArgs :: Monad m => ClaferIGT m IGArgs Source
getConstraints :: Monad m => ClaferIGT m [Constraint] Source
getClaferModel :: Monad m => ClaferIGT m String Source
Constructors
| ClaferIGT (StateT ClaferIGEnv (AlloyIGT m) a) | 
Instances
| MonadTrans ClaferIGT | |
| Monad m => Monad (ClaferIGT m) | |
| Functor m => Functor (ClaferIGT m) | |
| (Monad m, Functor m) => Applicative (ClaferIGT m) | |
| MonadIO m => MonadIO (ClaferIGT m) | |
| MonadException m => MonadException (ClaferIGT m) | 
Constructors
| Instance | |
Fields  | |
| UnsatCore | |
Fields  | |
| NoInstance | |
data Counterexample Source
Constructors
| Counterexample | |
runClaferIGT :: MonadIO m => IGArgs -> ClaferIGT m a -> m (Either ClaferErrs a) Source
getAlloyModel :: MonadIO m => ClaferIGT m String Source
getClafers :: MonadIO m => ClaferIGT m [String] Source
getGlobalScope :: MonadIO m => ClaferIGT m Integer Source
getBitwidth :: MonadIO m => ClaferIGT m Integer Source
setGlobalScope :: MonadIO m => Integer -> ClaferIGT m () Source
getQNameMaps :: MonadIO m => ClaferIGT m QNameMaps Source
setUnsatCoreMinimization :: MonadIO m => Integer -> ClaferIGT m () Source
setBitwidth :: MonadIO m => Integer -> ClaferIGT m () Source
findRemovable :: ClaferEnv -> [Span] -> [Constraint] -> [Maybe Constraint] Source
strictReadFile :: FilePath -> IO String Source
sigToClaferName :: String -> String Source