Safe Haskell | None |
---|
Documentation
claferIGVersion :: StringSource
IGArgs | |
|
data ClaferIGEnv Source
ClaferIGEnv | |
|
getClaferEnv :: Monad m => ClaferIGT m ClaferEnvSource
getClaferIGArgs :: Monad m => ClaferIGT m IGArgsSource
getConstraints :: Monad m => ClaferIGT m [Constraint]Source
getClaferModel :: Monad m => ClaferIGT m StringSource
ClaferIGT (StateT ClaferIGEnv (AlloyIGT m) a) |
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) |
Instance | |
| |
UnsatCore | |
| |
NoInstance |
data Counterexample Source
runClaferIGT :: MonadIO m => IGArgs -> ClaferIGT m a -> m (Either ClaferErrs a)Source
getAlloyModel :: MonadIO m => ClaferIGT m StringSource
getClafers :: MonadIO m => ClaferIGT m [String]Source
getGlobalScope :: MonadIO m => ClaferIGT m IntegerSource
getBitwidth :: MonadIO m => ClaferIGT m IntegerSource
setGlobalScope :: MonadIO m => Integer -> ClaferIGT m ()Source
getQNameMaps :: MonadIO m => ClaferIGT m QNameMapsSource
valueOfScope :: MonadIO m => String -> ClaferIGT m IntegerSource
increaseScope :: MonadIO m => Integer -> (String, Integer) -> ClaferIGT m (Either String ())Source
setAlloyScope :: MonadIO m => Integer -> String -> ClaferIGT m (Either String ())Source
setUnsatCoreMinimization :: MonadIO m => Integer -> ClaferIGT m ()Source
setBitwidth :: MonadIO m => Integer -> ClaferIGT m ()Source
reload :: MonadIO m => ClaferIGT m (Either ClaferErrs ())Source
findRemovable :: ClaferEnv -> [Span] -> [Constraint] -> [Maybe Constraint]Source
getlineNumMap :: Monad m => ClaferIGT m (Map Integer String)Source
strictReadFile :: FilePath -> IO StringSource
sigToClaferName :: String -> StringSource