Safe Haskell | None |
---|---|
Language | Haskell2010 |
Key instances defined here are ToEncString
and FromEncString
.
These allow to create encoded ByteString
from a String (ToEncString
) and decode ByteString
back (ToEncString
).
The String Encode
, Decode
instances is less interesting since is works with String
type only.
See the warnings section of Data.TypedEncoding.Pkg.Encoding.Conv
Synopsis
Documentation
>>>
:set -XOverloadedStrings -XDataKinds -XTypeApplications -XFlexibleContexts
>>>
import Data.Functor.Identity
>>>
import qualified Data.TypedEncoding as Usage
Orphan instances
DynEnc s => EncodingSuperset s Source # | All encoding encodings map characters to bytes
This defines |
type EncSuperset s :: Symbol # implEncInto :: Enc (s ': xs) c str -> Enc (EncSuperset s ': (s ': xs)) c str # | |
(UnexpectedDecodeErr f, Monad f, DynEnc s, Algorithm s "enc-pkg/encoding") => Decode f s "enc-pkg/encoding" c String Source # | |
(DynEnc s, Algorithm s "enc-pkg/encoding") => ToEncString (Either EncodeEx) s "enc-pkg/encoding" String ByteString Source # | |
(DynEnc s, Algorithm s "enc-pkg/encoding") => ToEncString (Either EncodeEx) s "enc-pkg/encoding" String ByteString Source # |
|
(DynEnc s, Algorithm s "enc-pkg/encoding") => Encode (Either EncodeEx) s "enc-pkg/encoding" c String Source # | |
(UnexpectedDecodeErr f, Monad f, DynEnc s, Algorithm s "enc-pkg/encoding") => FromEncString (f :: Type -> Type) s "enc-pkg/encoding" String ByteString Source # | |
fromEncF :: Enc (s ': []) () ByteString -> f String # | |
(UnexpectedDecodeErr f, Monad f, DynEnc s, Algorithm s "enc-pkg/encoding") => FromEncString (f :: Type -> Type) s "enc-pkg/encoding" String ByteString Source # |
|
fromEncF :: Enc (s ': []) () ByteString -> f String # |