Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
Documentation
type SymmetricAdapter s t v = Adapter s s t t v v Source #
bidirectional :: (CoderDirection -> b -> Flow s b) -> Coder s s b b Source #
chooseAdapter :: (Eq t, Ord t, Show t) => (t -> [Flow so (SymmetricAdapter si t v)]) -> (t -> Bool) -> (t -> String) -> t -> Flow so (SymmetricAdapter si t v) Source #
encodeDecode :: CoderDirection -> Coder s s a a -> a -> Flow s a Source #
floatTypeIsSupported :: LanguageConstraints m -> FloatType -> Bool Source #
idAdapter :: t -> SymmetricAdapter s t v Source #
integerTypeIsSupported :: LanguageConstraints m -> IntegerType -> Bool Source #
literalTypeIsSupported :: LanguageConstraints m -> LiteralType -> Bool Source #
nameToFilePath :: Bool -> FileExtension -> Name -> FilePath Source #
typeIsSupported :: LanguageConstraints m -> Type m -> Bool Source #
unidirectionalCoder :: (a -> Flow s b) -> Coder s s a b Source #
module Hydra.Adapters.Utils
module Hydra.Common