h,LG      !"#$%&'()*+,-./0123456789:;<=>?@ABCDEFGHIJKLMNOPQRSTUVWXYZ[\]^_`abcdefghijklmnopqrstuvwxyz{|}~ Lennart Kolmodin, Ross PatersonBSD3-style (see LICENSE)%Lennart Kolmodin  experimentalportable to Hugs and GHCSafe O(1). The empty Builder, satisfying   = O(1).+ A Builder taking a single byte, satisfying  ( b) =   bO(1). The concatenation of two Builders, an associative operation with identity  , satisfying  ( x y) =   ( x) ( y)O(1). A Builder taking a    , satisfying  ( bs) =   [bs]O(1). A Builder taking a lazy   , satisfying  ( bs) = bsO(n). A builder taking & and copy it to a Builder, satisfying@ ( bs) =   [ bs] #Write a Word16 in big endian format &Write a Word16 in little endian format #Write a Word32 in big endian format &Write a Word32 in little endian format #Write a Word64 in big endian format&Write a Word64 in little endian format"Write a Int16 in big endian format%Write a Int16 in little endian format"Write a Int32 in big endian format%Write a Int32 in little endian format"Write a Int64 in big endian format%Write a Int64 in little endian formatO(1). A Builder taking a single native machine word. The word is written in host order, host endian form, for the machine you're on. On a 64 bit machine the Word is an 8 byte value, on a 32 bit machine, 4 bytes. Values written this way are not portable to different endian or word sized machines, without conversion.Write a Word16 in native host order and host endianness. 2 bytes will be written, unaligned.Write a Word32 in native host order and host endianness. 4 bytes will be written, unaligned.Write a Word64 in native host order. On a 32 bit machine we write two host order Word32s, in big endian form. 8 bytes will be written, unaligned.O(1). A Builder taking a single native machine word. The word is written in host order, host endian form, for the machine you're on. On a 64 bit machine the Int is an 8 byte value, on a 32 bit machine, 4 bytes. Values written this way are not portable to different endian or word sized machines, without conversion.Write a Int16 in native host order and host endianness. 2 bytes will be written, unaligned.Write a Int32 in native host order and host endianness. 4 bytes will be written, unaligned.Write a Int64 in native host order. On a 32 bit machine we write two host order Int32s, in big endian form. 8 bytes will be written, unaligned.'Write a character using UTF-8 encoding.$Write a String using UTF-8 encoding.      Safe-InferredNone<None " A decoder produced by running a   monad.#8The decoder ran into an error. The decoder either used " or was not provided enough input.$The decoder has consumed the available input and needs more to continue. Provide ! if more input is available and # otherwise, and you will get a new ".%The decoder has successfully finished. Except for the output value you also get the unused input.&The decoder needs to know the current position in the input. Given the number of bytes remaning in the decoder, the outer decoder runner needs to calculate the position and resume the decoding.'Run a   monad. See " for what to do next, like providing input, handling decoding errors and to get the output value.Make sure we don't have to pass Nothing to a Partial twice. This way we don't need to pass around an EOF value in the Get monad, it can safely ask several times if it needs to.(1Get the total number of bytes read to this point.)binaryIsolate a decoder to operate with a fixed number of bytes, and fail if fewer bytes were consumed, or more bytes were attempted to be consumed. If the given decoder fails, ) will also fail. Offset from (" will be relative to the start of )!, not the absolute of the input.,Test whether all input has been consumed, i.e. there are no remaining undecoded bytes.-DEPRECATED. Same as 3.Run a decoder and keep track of all the input it consumes. Once it's finished, return the final decoder (always % or #), and unconsume all the the input the decoder required to run. Any additional chunks which was required to run the decoder will also be returned..binaryRun the given decoder, but without consuming its input. If the given decoder fails, then so will this function./binaryRun the given decoder, and only consume its input if it returns . If  is returned, the input will be unconsumed. If the given decoder fails, then so will this function.0binaryRun the given decoder, and only consume its input if it returns . If  is returned, the input will be unconsumed. If the given decoder fails, then so will this function.1binaryLabel a decoder. If the decoder fails, the label will be appended on a new line to the error message string.2DEPRECATED. Get the number of bytes of remaining input. Note that this is an expensive function to use as in order to calculate how much input remains, all input has to be read and kept in-memory. The decoder keeps the input as a strict bytestring, so you are likely better off by calculating the remaining input in another way.3An efficient get method for strict ByteStrings. Fails if fewer than n" bytes are left in the input. If n <= 0# then the empty string is returned.4Get the current chunk.5Replace the current chunk.6Return at least n bytes, maybe more. If not enough data is available the computation will escape with $.7Ensure that there are at least n< bytes available. If not, the computation will escape with $.8 readNWith n f where f1 must be deterministic and not have side effects.;binary=binary))The number of bytes that must be consumedThe decoder to isolate(7+43-,)1.0/5682'*"&%#$ ! !"%#$&'68()*+4572-,./013Lennart KolmodinBSD3-style (see LICENSE)%Lennart Kolmodin  experimentalportable to Hugs and GHC. Trustworthy,,AAn offset, counted in bytes.B A decoder procuced by running a   monad.C8The decoder ran into an error. The decoder either used  or was not provided enough input. Contains any unconsumed input and the number of bytes consumed.DThe decoder has consumed the available input and needs more to continue. Provide ! if more input is available and # otherwise, and you will get a new B.EThe decoder has successfully finished. Except for the output value you also get any unused input as well as the number of bytes consumed.FRun a   monad. See B for what to do next, like providing input, handling decoder errors and to get the output value. Hint: Use the helper functions J, K and L.GDEPRECATED. Provides compatibility with previous versions of this library. Run a   monad and return a tuple with three values. The first value is the result of the decoder. The second and third are the unused input, and the number of consumed bytes.HbinaryRun a   monad and return  on failure and  on success. In both cases any unconsumed input and the number of bytes consumed is returned. In the case of failure, a human-readable error message is included as well.I The simplest interface to run a  4 decoder. If the decoder runs into an error, calls %, or runs out of input, it will call .JFeed a B with more input. If the B is E or C it will add the input to   of unconsumed input.  F4 myParser `pushChunk` myInput1 `pushChunk` myInput2 KFeed a B with more input. If the B is E or C it will add the input to   of unconsumed input.  F( myParser `pushChunks` myLazyByteString LTell a B* that there is no more input. This passes  to a D2 decoder, otherwise returns the decoder unchanged.M Skip ahead n bytes. Fails if fewer than n bytes are available.NAn efficient get method for lazy ByteStrings. Fails if fewer than n bytes are left in the input.OGet a lazy ByteString that is terminated with a NUL byte. The returned string does not contain the NUL byte. Fails if it reaches the end of input without finding a NUL.PGet the remaining bytes as a lazy ByteString. Note that this can be an expensive function to use as it forces reading all input and keeping the string in-memory.Q!Read a Word8 from the monad stateR!Read an Int8 from the monad stateS"Read a Word16 in big endian formatT%Read a Word16 in little endian formatU"Read a Word32 in big endian formatV%Read a Word32 in little endian formatW"Read a Word64 in big endian formatX%Read a Word64 in little endian formatY#Read an Int16 in big endian format.Z#Read an Int32 in big endian format.[#Read an Int64 in big endian format.\&Read an Int16 in little endian format.]&Read an Int32 in little endian format.^&Read an Int64 in little endian format._O(1). Read a single native machine word. The word is read in host order, host endian form, for the machine you're on. On a 64 bit machine the Word is an 8 byte value, on a 32 bit machine, 4 bytes.`O(1).? Read a 2 byte Word16 in native host order and host endianness.aO(1).8 Read a Word32 in native host order and host endianness.bO(1).7 Read a Word64 in native host order and host endianess.cO(1). Read a single native machine word in native host order. It works in the same way as _.dO(1).> Read a 2 byte Int16 in native host order and host endianness.eO(1).8 Read an Int32 in native host order and host endianness.fO(1).7 Read an Int64 in native host order and host endianess.gRead a  in big endian IEEE-754 format.hRead a " in little endian IEEE-754 format.iRead a $ in IEEE-754 format and host endian.jRead a  in big endian IEEE-754 format.kRead a " in little endian IEEE-754 format.lRead a $ in IEEE-754 format and host endian.7jlkgihYd\Ze][f^RcNOPS`TUaVWbXQ_JKLIFHGM(3-,)1.0/2ABECD 7 IHABECDFJKLM,()./013NOPQSUWTVX_`abRYZ[\]^cdefghijklG2-Lennart KolmodinBSD3-style (see LICENSE)%Lennart Kolmodin stable(Portable to Hugs and GHC. Requires MPTCsSafe:;'munstableportable to Hugs and GHC. Requires the FFI and some flexible instances Trustworthy )*0>A!The  class provides  and :, methods to encode and decode a Haskell value to a lazy . It mirrors the  and  classes for textual representation of Haskell types, and is suitable for serialising Haskell values to disk, over the network.For decoding and generating simple external binary formats (e.g. C structures), Binary may be used, but in general is not suitable for complex protocols. Instead use the m and   primitives directly.:Instances of Binary should satisfy the following property: decode . encode == id That is, the  and  methods should be the inverse of each other. A range of instances are provided for basic Haskell types. Encode a value in the Put monad.Decode a value in the Get monadEncode a list of values in the Put monad. The default implementation may be overridden to be more efficient but must still have the same encoding format. n get n. elements in order, without blowing the stack.binarybinarybinarybinarybinarybinarybinarybinarybinarybinarybinarybinarybinarybinarybinarybinarybinarybinarybinarybinarybinarybinarybinary3Uses non-IEEE754 encoding. Does not round-trip NaN.3Uses non-IEEE754 encoding. Does not round-trip NaN.binarybinarybinaryBryan O'SullivanBSD3-style (see LICENSE)%Bryan O'Sullivan unstable!Only works with GHC 7.2 and newerSafe BLennart KolmodinBSD3-style (see LICENSE)%Lennart Kolmodin unstableportable to Hugs and GHC. Requires the FFI and some flexible instances. TrustworthyG<?Encode a value using binary serialisation to a lazy ByteString.Decode a value from a lazy ByteString, reconstructing the original structure.binary1Decode a value from a lazy ByteString. Returning  on failure and  on success. In both cases the unconsumed input and the number of consumed bytes is returned. In case of failure, a human-readable error message will be returned as well.#Lazily serialise a value to a file.?@ABCDEFGHIJKLMNOPQRSTUVWXYZ;<=>@[\]^_`abcdefghijklmnopqrstuvwxyz{|}~!"#$%&'()*+,-./0123456NM binary-0.8.9.3-c8fcData.Binary.BuilderData.Binary.Get.InternalData.Binary.GetData.Binary.Put Data.BinaryLempty singletonappendS ByteString fromChunksTShortByteString fromShortData.Binary.FloatCastData.Binary.InternalBData.Binary.Class$dmget$dmput $dmputListData.Binary.Genericbytestring-0.12.2.0-d3f3 Data.ByteString.Builder.InternalBuilderflushtoLazyByteStringfromByteStringfromLazyByteStringfromShortByteString putWord16be putWord16le putWord32be putWord32le putWord64be putWord64le putInt16be putInt16le putInt32be putInt32le putInt64be putInt64le putWordhost putWord16host putWord32host putWord64host putInthost putInt16host putInt32host putInt64host putCharUtf8 putStringUtf8ConsumeGetCrunContDecoderFailPartialDone BytesReadrunGetIncremental bytesReadisolatewithInputChunks failOnEOFisEmptygetBytes lookAhead lookAheadM lookAheadElabel remaining getByteStringgetputreadNensureN readNWith $fShowDecoder$fFunctorDecoder$fAlternativeGet $fFunctorGet$fMonadPlusGet$fApplicativeGet$fMonadFailGet $fMonadGet ByteOffset runGetState runGetOrFailrunGet pushChunk pushChunkspushEndOfInputskipgetLazyByteStringgetLazyByteStringNulgetRemainingLazyByteStringgetWord8getInt8 getWord16be getWord16le getWord32be getWord32le getWord64be getWord64le getInt16be getInt32be getInt64be getInt16le getInt32le getInt64le getWordhost getWord16host getWord32host getWord64host getInthost getInt16host getInt32host getInt64host getFloatbe getFloatle getFloathost getDoublebe getDoublele getDoublehostPutPutMunPut putBuilderexecPutrunPutrunPutMputWord8putInt8 putByteStringputLazyByteStringputShortByteString putFloatbe putFloatle putFloathost putDoublebe putDoublele putDoublehost$fSemigroupPutM $fMonoidPutM $fMonadPutM$fApplicativePutM $fFunctorPutMBinaryputList GBinaryGetgget GBinaryPutgputencodedecode decodeOrFail encodeFile decodeFiledecodeFileOrFail doubleToWord floatToWord wordToDouble wordToFloatData.ByteString.Internal.TypeaccursedUnutterablePerformIO ghc-internalGHC.Internal.Control.Monad.FailfailGHC.Internal.MaybeJustNothing noMeansNorunAndKeepTrackGHC.Internal.Data.EitherRightLeftGHC.Internal.Errerrorghc-prim GHC.TypesFloatDoubleData.ByteString.Short.InternalData.ByteString.Lazy.InternalGHC.Internal.ReadReadGHC.Internal.ShowShowgetMany$fBinaryTypeLitSort$fBinaryKindRep $fBinaryTyCon$fBinaryRuntimeRep$fBinaryVecElem$fBinaryVecCount$fBinaryNonEmpty $fBinaryArg$fBinaryWrappedMonoid $fBinaryLast $fBinaryFirst $fBinaryMax $fBinaryMin $fBinaryAlt $fBinaryLast0$fBinaryFirst0$fBinaryProduct $fBinarySum $fBinaryAny $fBinaryAll $fBinaryDual$fBinaryVersion$fBinaryFingerprint $fBinaryFloat$fBinaryDouble $fBinaryFixed $fBinaryVoid$fBinaryNaturalGHC.Internal.Word bitReverse16 bitReverse32 bitReverse64 bitReverse8 byteSwap16 byteSwap32 byteSwap64Word16Word32Word64Word8Word