Safe Haskell | None |
---|---|
Language | Haskell2010 |
Tip.Haskell.Translate
Contents
- prelude :: String -> HsId a
- tipDSL :: String -> HsId a
- quickCheck :: String -> HsId a
- quickCheckUnsafe :: String -> HsId a
- quickCheckAll :: String -> HsId a
- quickSpec :: String -> HsId a
- sysEnv :: String -> HsId a
- smtenSym :: String -> HsId a
- smtenEnv :: String -> HsId a
- smtenMinisat :: String -> HsId a
- smtenMonad :: String -> HsId a
- feat :: String -> HsId a
- lsc :: String -> HsId a
- typeable :: String -> HsId a
- data HsId a
- addHeader :: String -> Decls a -> Decls a
- addImports :: Ord a => Decls (HsId a) -> Decls (HsId a)
- trTheory :: (Ord a, PrettyVar a) => Mode -> Theory a -> Decls (HsId a)
- data Kind
- theorySigs :: Theory (HsId a) -> [HsId a]
- ufInfo :: Theory (HsId a) -> (Bool, [Type (HsId a)])
- data Mode
- = Feat
- | QuickCheck
- | LazySmallCheck Bool
- | Smten
- | QuickSpec
- | Plain
- isLazySmallCheck :: Mode -> Bool
- isSmten :: Mode -> Bool
- trTheory' :: forall a b. (a ~ HsId b, Ord b, PrettyVar b) => Mode -> Theory a -> Decls a
- arbitrary :: [Type (HsId a)] -> [Type (HsId a)]
- trType :: (a ~ HsId b) => Type a -> Type a
- trBuiltinType :: BuiltinType -> Type (HsId a)
- withBool :: (a ~ HsId b) => (a -> [c] -> d) -> Bool -> d
- hsBuiltinTys :: [(BuiltinType, String)]
- hsBuiltins :: [(Builtin, String)]
- typeOfBuiltin :: Builtin -> Type a
- makeSig :: forall a. (PrettyVar a, Ord a) => Theory (HsId a) -> Decl (HsId a)
- theoryBuiltins :: Ord a => Theory a -> [Builtin]
Documentation
quickCheck :: String -> HsId a Source
quickCheckUnsafe :: String -> HsId a Source
quickCheckAll :: String -> HsId a Source
smtenMinisat :: String -> HsId a Source
smtenMonad :: String -> HsId a Source
theorySigs :: Theory (HsId a) -> [HsId a] Source
Constructors
Feat | |
QuickCheck | |
LazySmallCheck Bool | |
Smten | |
QuickSpec | |
Plain |
isLazySmallCheck :: Mode -> Bool Source
trBuiltinType :: BuiltinType -> Type (HsId a) Source
Builtins
hsBuiltinTys :: [(BuiltinType, String)] Source
hsBuiltins :: [(Builtin, String)] Source
typeOfBuiltin :: Builtin -> Type a Source
QuickSpec signatures
theoryBuiltins :: Ord a => Theory a -> [Builtin] Source