Movatterモバイル変換


[0]ホーム

URL:


{-This is a generated file (generated by genprimopcode).It is not code to actually be used. Its only purpose is to beconsumed by haddock.-}------------------------------------------------------------------------------- |-- Module      :  GHC.Prim---- Maintainer  :  ghc-devs@haskell.org-- Stability   :  internal-- Portability :  non-portable (GHC extensions)---- GHC's primitive types and operations.-- Use GHC.Exts from the base package instead of importing this-- module directly.-------------------------------------------------------------------------------{-# LANGUAGE Unsafe #-}{-# LANGUAGE MagicHash #-}{-# LANGUAGE MultiParamTypeClasses #-}{-# LANGUAGE NoImplicitPrelude #-}{-# LANGUAGE UnboxedTuples #-}{-# LANGUAGE NegativeLiterals #-}{-# OPTIONS_GHC -fno-warn-redundant-constraints #-}{-# OPTIONS_HADDOCK print-explicit-runtime-reps #-}moduleGHC.Prim({- * The word size story.-}{-|Haskell98 specifies that signed integers (type 'Int')         must contain at least 30 bits. GHC always implements         'Int' using the primitive type 'Int#', whose size equals         the @MachDeps.h@ constant @WORD\_SIZE\_IN\_BITS@.         This is normally set based on the RTS @ghcautoconf.h@ parameter         @SIZEOF\_HSWORD@, i.e., 32 bits on 32-bit machines, 64         bits on 64-bit machines.         GHC also implements a primitive unsigned integer type         'Word#' which always has the same number of bits as 'Int#'.         In addition, GHC supports families of explicit-sized integers         and words at 8, 16, 32, and 64 bits, with the usual         arithmetic operations, comparisons, and a range of         conversions.         Finally, there are strongly deprecated primops for coercing         between 'Addr#', the primitive type of machine         addresses, and 'Int#'.  These are pretty bogus anyway,         but will work on existing 32-bit and 64-bit GHC targets; they         are completely bogus when tag bits are used in 'Int#',         so are not available in this case.-}{- * Char#-}{-|Operations on 31-bit characters.-}Char#,gtChar#,geChar#,eqChar#,neChar#,ltChar#,leChar#,ord#,{- * Int8#-}{-|Operations on 8-bit integers.-}Int8#,int8ToInt#,intToInt8#,negateInt8#,plusInt8#,subInt8#,timesInt8#,quotInt8#,remInt8#,quotRemInt8#,uncheckedShiftLInt8#,uncheckedShiftRAInt8#,uncheckedShiftRLInt8#,int8ToWord8#,eqInt8#,geInt8#,gtInt8#,leInt8#,ltInt8#,neInt8#,{- * Word8#-}{-|Operations on 8-bit unsigned words.-}Word8#,word8ToWord#,wordToWord8#,plusWord8#,subWord8#,timesWord8#,quotWord8#,remWord8#,quotRemWord8#,andWord8#,orWord8#,xorWord8#,notWord8#,uncheckedShiftLWord8#,uncheckedShiftRLWord8#,word8ToInt8#,eqWord8#,geWord8#,gtWord8#,leWord8#,ltWord8#,neWord8#,{- * Int16#-}{-|Operations on 16-bit integers.-}Int16#,int16ToInt#,intToInt16#,negateInt16#,plusInt16#,subInt16#,timesInt16#,quotInt16#,remInt16#,quotRemInt16#,uncheckedShiftLInt16#,uncheckedShiftRAInt16#,uncheckedShiftRLInt16#,int16ToWord16#,eqInt16#,geInt16#,gtInt16#,leInt16#,ltInt16#,neInt16#,{- * Word16#-}{-|Operations on 16-bit unsigned words.-}Word16#,word16ToWord#,wordToWord16#,plusWord16#,subWord16#,timesWord16#,quotWord16#,remWord16#,quotRemWord16#,andWord16#,orWord16#,xorWord16#,notWord16#,uncheckedShiftLWord16#,uncheckedShiftRLWord16#,word16ToInt16#,eqWord16#,geWord16#,gtWord16#,leWord16#,ltWord16#,neWord16#,{- * Int32#-}{-|Operations on 32-bit integers.-}Int32#,int32ToInt#,intToInt32#,negateInt32#,plusInt32#,subInt32#,timesInt32#,quotInt32#,remInt32#,quotRemInt32#,uncheckedShiftLInt32#,uncheckedShiftRAInt32#,uncheckedShiftRLInt32#,int32ToWord32#,eqInt32#,geInt32#,gtInt32#,leInt32#,ltInt32#,neInt32#,{- * Word32#-}{-|Operations on 32-bit unsigned words.-}Word32#,word32ToWord#,wordToWord32#,plusWord32#,subWord32#,timesWord32#,quotWord32#,remWord32#,quotRemWord32#,andWord32#,orWord32#,xorWord32#,notWord32#,uncheckedShiftLWord32#,uncheckedShiftRLWord32#,word32ToInt32#,eqWord32#,geWord32#,gtWord32#,leWord32#,ltWord32#,neWord32#,{- * Int64#-}{-|Operations on 64-bit signed words.-}Int64#,int64ToInt#,intToInt64#,negateInt64#,plusInt64#,subInt64#,timesInt64#,quotInt64#,remInt64#,uncheckedIShiftL64#,uncheckedIShiftRA64#,uncheckedIShiftRL64#,int64ToWord64#,eqInt64#,geInt64#,gtInt64#,leInt64#,ltInt64#,neInt64#,{- * Word64#-}{-|Operations on 64-bit unsigned words.-}Word64#,word64ToWord#,wordToWord64#,plusWord64#,subWord64#,timesWord64#,quotWord64#,remWord64#,and64#,or64#,xor64#,not64#,uncheckedShiftL64#,uncheckedShiftRL64#,word64ToInt64#,eqWord64#,geWord64#,gtWord64#,leWord64#,ltWord64#,neWord64#,{- * Int#-}{-|Operations on native-size integers (32+ bits).-}Int#,(+#),(-#),(*#),timesInt2#,mulIntMayOflo#,quotInt#,remInt#,quotRemInt#,andI#,orI#,xorI#,notI#,negateInt#,addIntC#,subIntC#,(>#),(>=#),(==#),(/=#),(<#),(<=#),chr#,int2Word#,int2Float#,int2Double#,word2Float#,word2Double#,uncheckedIShiftL#,uncheckedIShiftRA#,uncheckedIShiftRL#,{- * Word#-}{-|Operations on native-sized unsigned words (32+ bits).-}Word#,plusWord#,addWordC#,subWordC#,plusWord2#,minusWord#,timesWord#,timesWord2#,quotWord#,remWord#,quotRemWord#,quotRemWord2#,and#,or#,xor#,not#,uncheckedShiftL#,uncheckedShiftRL#,word2Int#,gtWord#,geWord#,eqWord#,neWord#,ltWord#,leWord#,popCnt8#,popCnt16#,popCnt32#,popCnt64#,popCnt#,pdep8#,pdep16#,pdep32#,pdep64#,pdep#,pext8#,pext16#,pext32#,pext64#,pext#,clz8#,clz16#,clz32#,clz64#,clz#,ctz8#,ctz16#,ctz32#,ctz64#,ctz#,byteSwap16#,byteSwap32#,byteSwap64#,byteSwap#,bitReverse8#,bitReverse16#,bitReverse32#,bitReverse64#,bitReverse#,{- * Narrowings-}{-|Explicit narrowing of native-sized ints or words.-}narrow8Int#,narrow16Int#,narrow32Int#,narrow8Word#,narrow16Word#,narrow32Word#,{- * Double#-}{-|Operations on double-precision (64 bit) floating-point numbers.-}Double#,(>##),(>=##),(==##),(/=##),(<##),(<=##),(+##),(-##),(*##),(/##),negateDouble#,fabsDouble#,double2Int#,double2Float#,expDouble#,expm1Double#,logDouble#,log1pDouble#,sqrtDouble#,sinDouble#,cosDouble#,tanDouble#,asinDouble#,acosDouble#,atanDouble#,sinhDouble#,coshDouble#,tanhDouble#,asinhDouble#,acoshDouble#,atanhDouble#,(**##),decodeDouble_2Int#,decodeDouble_Int64#,castDoubleToWord64#,castWord64ToDouble#,{- * Float#-}{-|Operations on single-precision (32-bit) floating-point numbers.-}Float#,gtFloat#,geFloat#,eqFloat#,neFloat#,ltFloat#,leFloat#,plusFloat#,minusFloat#,timesFloat#,divideFloat#,negateFloat#,fabsFloat#,float2Int#,expFloat#,expm1Float#,logFloat#,log1pFloat#,sqrtFloat#,sinFloat#,cosFloat#,tanFloat#,asinFloat#,acosFloat#,atanFloat#,sinhFloat#,coshFloat#,tanhFloat#,asinhFloat#,acoshFloat#,atanhFloat#,powerFloat#,float2Double#,decodeFloat_Int#,castFloatToWord32#,castWord32ToFloat#,{- * Fused multiply-add operations-}{-| #fma#    The fused multiply-add primops 'fmaddFloat#' and 'fmaddDouble#'    implement the operation    \[    \lambda\ x\ y\ z \rightarrow x * y + z    \]    with a single floating-point rounding operation at the end, as opposed to    rounding twice (which can accumulate rounding errors).    These primops can be compiled directly to a single machine instruction on    architectures that support them. Currently, these are:      1. x86 with CPUs that support the FMA3 extended instruction set (which         includes most processors since 2013).      2. PowerPC.      3. AArch64.    This requires users pass the '-mfma' flag to GHC. Otherwise, the primop    is implemented by falling back to the C standard library, which might    perform software emulation (this may yield results that are not IEEE    compliant on some platforms).    The additional operations 'fmsubFloat#'/'fmsubDouble#',    'fnmaddFloat#'/'fnmaddDouble#' and 'fnmsubFloat#'/'fnmsubDouble#' provide    variants on 'fmaddFloat#'/'fmaddDouble#' in which some signs are changed:    \[    \begin{aligned}    \mathrm{fmadd}\ x\ y\ z &= \phantom{+} x * y + z \\[8pt]    \mathrm{fmsub}\ x\ y\ z &= \phantom{+} x * y - z \\[8pt]    \mathrm{fnmadd}\ x\ y\ z &= - x * y + z \\[8pt]    \mathrm{fnmsub}\ x\ y\ z &= - x * y - z    \end{aligned}    \]    -}fmaddFloat#,fmsubFloat#,fnmaddFloat#,fnmsubFloat#,fmaddDouble#,fmsubDouble#,fnmaddDouble#,fnmsubDouble#,{- * Arrays-}{-|Operations on 'Array#'.-}Array#,MutableArray#,newArray#,readArray#,writeArray#,sizeofArray#,sizeofMutableArray#,indexArray#,unsafeFreezeArray#,unsafeThawArray#,copyArray#,copyMutableArray#,cloneArray#,cloneMutableArray#,freezeArray#,thawArray#,casArray#,{- * Small Arrays-}{-|Operations on 'SmallArray#'. A 'SmallArray#' works         just like an 'Array#', but with different space use and         performance characteristics (that are often useful with small         arrays). The 'SmallArray#' and 'SmallMutableArray#'         lack a `card table'. The purpose of a card table is to avoid         having to scan every element of the array on each GC by         keeping track of which elements have changed since the last GC         and only scanning those that have changed. So the consequence         of there being no card table is that the representation is         somewhat smaller and the writes are somewhat faster (because         the card table does not need to be updated). The disadvantage         of course is that for a 'SmallMutableArray#' the whole         array has to be scanned on each GC. Thus it is best suited for         use cases where the mutable array is not long lived, e.g.         where a mutable array is initialised quickly and then frozen         to become an immutable 'SmallArray#'.        -}SmallArray#,SmallMutableArray#,newSmallArray#,shrinkSmallMutableArray#,readSmallArray#,writeSmallArray#,sizeofSmallArray#,sizeofSmallMutableArray#,getSizeofSmallMutableArray#,indexSmallArray#,unsafeFreezeSmallArray#,unsafeThawSmallArray#,copySmallArray#,copySmallMutableArray#,cloneSmallArray#,cloneSmallMutableArray#,freezeSmallArray#,thawSmallArray#,casSmallArray#,{- * Byte Arrays-}{-|A 'ByteArray#' is a region of         raw memory in the garbage-collected heap, which is not         scanned for pointers.         There are three sets of operations for accessing byte array contents:         index for reading from immutable byte arrays, and read/write         for mutable byte arrays.  Each set contains operations for a         range of useful primitive data types.  Each operation takes         an offset measured in terms of the size of the primitive type         being read or written.         -}ByteArray#,MutableByteArray#,newByteArray#,newPinnedByteArray#,newAlignedPinnedByteArray#,isMutableByteArrayPinned#,isByteArrayPinned#,byteArrayContents#,mutableByteArrayContents#,shrinkMutableByteArray#,resizeMutableByteArray#,unsafeFreezeByteArray#,unsafeThawByteArray#,sizeofByteArray#,sizeofMutableByteArray#,getSizeofMutableByteArray#,indexCharArray#,indexWideCharArray#,indexIntArray#,indexWordArray#,indexAddrArray#,indexFloatArray#,indexDoubleArray#,indexStablePtrArray#,indexInt8Array#,indexWord8Array#,indexInt16Array#,indexWord16Array#,indexInt32Array#,indexWord32Array#,indexInt64Array#,indexWord64Array#,indexWord8ArrayAsChar#,indexWord8ArrayAsWideChar#,indexWord8ArrayAsInt#,indexWord8ArrayAsWord#,indexWord8ArrayAsAddr#,indexWord8ArrayAsFloat#,indexWord8ArrayAsDouble#,indexWord8ArrayAsStablePtr#,indexWord8ArrayAsInt16#,indexWord8ArrayAsWord16#,indexWord8ArrayAsInt32#,indexWord8ArrayAsWord32#,indexWord8ArrayAsInt64#,indexWord8ArrayAsWord64#,readCharArray#,readWideCharArray#,readIntArray#,readWordArray#,readAddrArray#,readFloatArray#,readDoubleArray#,readStablePtrArray#,readInt8Array#,readWord8Array#,readInt16Array#,readWord16Array#,readInt32Array#,readWord32Array#,readInt64Array#,readWord64Array#,readWord8ArrayAsChar#,readWord8ArrayAsWideChar#,readWord8ArrayAsInt#,readWord8ArrayAsWord#,readWord8ArrayAsAddr#,readWord8ArrayAsFloat#,readWord8ArrayAsDouble#,readWord8ArrayAsStablePtr#,readWord8ArrayAsInt16#,readWord8ArrayAsWord16#,readWord8ArrayAsInt32#,readWord8ArrayAsWord32#,readWord8ArrayAsInt64#,readWord8ArrayAsWord64#,writeCharArray#,writeWideCharArray#,writeIntArray#,writeWordArray#,writeAddrArray#,writeFloatArray#,writeDoubleArray#,writeStablePtrArray#,writeInt8Array#,writeWord8Array#,writeInt16Array#,writeWord16Array#,writeInt32Array#,writeWord32Array#,writeInt64Array#,writeWord64Array#,writeWord8ArrayAsChar#,writeWord8ArrayAsWideChar#,writeWord8ArrayAsInt#,writeWord8ArrayAsWord#,writeWord8ArrayAsAddr#,writeWord8ArrayAsFloat#,writeWord8ArrayAsDouble#,writeWord8ArrayAsStablePtr#,writeWord8ArrayAsInt16#,writeWord8ArrayAsWord16#,writeWord8ArrayAsInt32#,writeWord8ArrayAsWord32#,writeWord8ArrayAsInt64#,writeWord8ArrayAsWord64#,compareByteArrays#,copyByteArray#,copyMutableByteArray#,copyMutableByteArrayNonOverlapping#,copyByteArrayToAddr#,copyMutableByteArrayToAddr#,copyAddrToByteArray#,copyAddrToAddr#,copyAddrToAddrNonOverlapping#,setByteArray#,setAddrRange#,atomicReadIntArray#,atomicWriteIntArray#,casIntArray#,casInt8Array#,casInt16Array#,casInt32Array#,casInt64Array#,fetchAddIntArray#,fetchSubIntArray#,fetchAndIntArray#,fetchNandIntArray#,fetchOrIntArray#,fetchXorIntArray#,{- * Addr#-}{-|-}Addr#,nullAddr#,plusAddr#,minusAddr#,remAddr#,addr2Int#,int2Addr#,gtAddr#,geAddr#,eqAddr#,neAddr#,ltAddr#,leAddr#,indexCharOffAddr#,indexWideCharOffAddr#,indexIntOffAddr#,indexWordOffAddr#,indexAddrOffAddr#,indexFloatOffAddr#,indexDoubleOffAddr#,indexStablePtrOffAddr#,indexInt8OffAddr#,indexWord8OffAddr#,indexInt16OffAddr#,indexWord16OffAddr#,indexInt32OffAddr#,indexWord32OffAddr#,indexInt64OffAddr#,indexWord64OffAddr#,indexWord8OffAddrAsChar#,indexWord8OffAddrAsWideChar#,indexWord8OffAddrAsInt#,indexWord8OffAddrAsWord#,indexWord8OffAddrAsAddr#,indexWord8OffAddrAsFloat#,indexWord8OffAddrAsDouble#,indexWord8OffAddrAsStablePtr#,indexWord8OffAddrAsInt16#,indexWord8OffAddrAsWord16#,indexWord8OffAddrAsInt32#,indexWord8OffAddrAsWord32#,indexWord8OffAddrAsInt64#,indexWord8OffAddrAsWord64#,readCharOffAddr#,readWideCharOffAddr#,readIntOffAddr#,readWordOffAddr#,readAddrOffAddr#,readFloatOffAddr#,readDoubleOffAddr#,readStablePtrOffAddr#,readInt8OffAddr#,readWord8OffAddr#,readInt16OffAddr#,readWord16OffAddr#,readInt32OffAddr#,readWord32OffAddr#,readInt64OffAddr#,readWord64OffAddr#,readWord8OffAddrAsChar#,readWord8OffAddrAsWideChar#,readWord8OffAddrAsInt#,readWord8OffAddrAsWord#,readWord8OffAddrAsAddr#,readWord8OffAddrAsFloat#,readWord8OffAddrAsDouble#,readWord8OffAddrAsStablePtr#,readWord8OffAddrAsInt16#,readWord8OffAddrAsWord16#,readWord8OffAddrAsInt32#,readWord8OffAddrAsWord32#,readWord8OffAddrAsInt64#,readWord8OffAddrAsWord64#,writeCharOffAddr#,writeWideCharOffAddr#,writeIntOffAddr#,writeWordOffAddr#,writeAddrOffAddr#,writeFloatOffAddr#,writeDoubleOffAddr#,writeStablePtrOffAddr#,writeInt8OffAddr#,writeWord8OffAddr#,writeInt16OffAddr#,writeWord16OffAddr#,writeInt32OffAddr#,writeWord32OffAddr#,writeInt64OffAddr#,writeWord64OffAddr#,writeWord8OffAddrAsChar#,writeWord8OffAddrAsWideChar#,writeWord8OffAddrAsInt#,writeWord8OffAddrAsWord#,writeWord8OffAddrAsAddr#,writeWord8OffAddrAsFloat#,writeWord8OffAddrAsDouble#,writeWord8OffAddrAsStablePtr#,writeWord8OffAddrAsInt16#,writeWord8OffAddrAsWord16#,writeWord8OffAddrAsInt32#,writeWord8OffAddrAsWord32#,writeWord8OffAddrAsInt64#,writeWord8OffAddrAsWord64#,atomicExchangeAddrAddr#,atomicExchangeWordAddr#,atomicCasAddrAddr#,atomicCasWordAddr#,atomicCasWord8Addr#,atomicCasWord16Addr#,atomicCasWord32Addr#,atomicCasWord64Addr#,fetchAddWordAddr#,fetchSubWordAddr#,fetchAndWordAddr#,fetchNandWordAddr#,fetchOrWordAddr#,fetchXorWordAddr#,atomicReadWordAddr#,atomicWriteWordAddr#,{- * Mutable variables-}{-|Operations on MutVar\#s.-}MutVar#,newMutVar#,readMutVar#,writeMutVar#,atomicSwapMutVar#,atomicModifyMutVar2#,atomicModifyMutVar_#,casMutVar#,{- * Exceptions-}{-|-}catch#,raise#,raiseUnderflow#,raiseOverflow#,raiseDivZero#,raiseIO#,maskAsyncExceptions#,maskUninterruptible#,unmaskAsyncExceptions#,getMaskingState#,{- * Continuations-}{-| #continuations#    These operations provide access to first-class delimited continuations,    which allow a computation to access and manipulate portions of its    /current continuation/. Operationally, they are implemented by direct    manipulation of the RTS call stack, which may provide significant    performance gains relative to manual continuation-passing style (CPS) for    some programs.    Intuitively, the delimited control operators 'prompt#' and    'control0#' can be understood by analogy to 'catch#' and 'raiseIO#',    respectively:      * Like 'catch#', 'prompt#' does not do anything on its own, it        just /delimits/ a subcomputation (the source of the name "delimited        continuations").      * Like 'raiseIO#', 'control0#' aborts to the nearest enclosing        'prompt#' before resuming execution.    However, /unlike/ 'raiseIO#', 'control0#' does /not/ discard    the aborted computation: instead, it /captures/ it in a form that allows    it to be resumed later. In other words, 'control0#' does not    irreversibly abort the local computation before returning to the enclosing    'prompt#', it merely suspends it. All local context of the suspended    computation is packaged up and returned as an ordinary function that can be    invoked at a later point in time to /continue/ execution, which is why    the suspended computation is known as a /first-class continuation/.    In GHC, every continuation prompt is associated with exactly one    'PromptTag#'. Prompt tags are unique, opaque values created by    'newPromptTag#' that may only be compared for equality. Both 'prompt#'    and 'control0#' accept a 'PromptTag#' argument, and 'control0#'    captures the continuation up to the nearest enclosing use of 'prompt#'    /with the same tag/. This allows a program to control exactly which    prompt it will abort to by using different tags, similar to how a program    can control which 'catch' it will abort to by throwing different types    of exceptions. Additionally, 'PromptTag#' accepts a single type parameter,    which is used to relate the expected result type at the point of the    'prompt#' to the type of the continuation produced by 'control0#'.    == The gory details    The high-level explanation provided above should hopefully provide some    intuition for what these operations do, but it is not very precise; this    section provides a more thorough explanation.    The 'prompt#' operation morally has the following type:@'prompt#' :: 'PromptTag#' a -> IO a -> IO a@    If a computation @/m/@ never calls 'control0#', then    @'prompt#' /tag/ /m/@ is equivalent to just @/m/@, i.e. the 'prompt#' is    a no-op. This implies the following law:    \[    \mathtt{prompt\#}\ \mathit{tag}\ (\mathtt{pure}\ x) \equiv \mathtt{pure}\ x    \]    The 'control0#' operation morally has the following type:@'control0#' :: 'PromptTag#' a -> ((IO b -> IO a) -> IO a) -> IO b@    @'control0#' /tag/ /f/@ captures the current continuation up to the nearest    enclosing @'prompt#' /tag/@ and resumes execution from the point of the call    to 'prompt#', passing the captured continuation to @/f/@. To make that    somewhat more precise, we can say 'control0#' obeys the following law:    \[    \mathtt{prompt\#}\ \mathit{tag}\ (\mathtt{control0\#}\ tag\ f \mathbin{\mathtt{>>=}} k)      \equiv f\ (\lambda\ m \rightarrow m \mathbin{\mathtt{>>=}} k)    \]    However, this law does not fully describe the behavior of 'control0#',    as it does not account for situations where 'control0#' does not appear    immediately inside 'prompt#'. Capturing the semantics more precisely    requires some additional notational machinery; a common approach is to    use [reduction semantics](https://en.wikipedia.org/wiki/Operational_semantics#Reduction_semantics).    Assuming an appropriate definition of evaluation contexts \(E\), the    semantics of 'prompt#' and 'control0#' can be given as follows:    \[    \begin{aligned}    E[\mathtt{prompt\#}\ \mathit{tag}\ (\mathtt{pure}\ v)]      &\longrightarrow E[\mathtt{pure}\ v] \\[8pt]    E_1[\mathtt{prompt\#}\ \mathit{tag}\ E_2[\mathtt{control0\#}\ tag\ f]]      &\longrightarrow E_1[f\ (\lambda\ m \rightarrow E_2[m])] \\[-2pt]      \mathrm{where}\;\: \mathtt{prompt\#}\ \mathit{tag} &\not\in E_2    \end{aligned}    \]    A full treatment of the semantics and metatheory of delimited control is    well outside the scope of this documentation, but a good, thorough    overview (in Haskell) is provided in [A Monadic Framework for Delimited    Continuations](https://legacy.cs.indiana.edu/~dyb/pubs/monadicDC.pdf) by    Dybvig et al.    == Safety and invariants    Correct uses of 'control0#' must obey the following restrictions:    1. The behavior of 'control0#' is only well-defined within a /strict       'State#' thread/, such as those associated with @IO@ and strict @ST@       computations.    2. Furthermore, 'control0#' may only be called within the dynamic extent       of a 'prompt#' with a matching tag somewhere in the /current/ strict       'State#' thread. Effectively, this means that a matching prompt must       exist somewhere, and the captured continuation must /not/ contain any       uses of @unsafePerformIO@, @runST@, @unsafeInterleaveIO@, etc. For       example, the following program is ill-defined:        @        'prompt#' /tag/ $          evaluate (unsafePerformIO $ 'control0#' /tag/ /f/)        @        In this example, the use of 'prompt#' appears in a different 'State#'        thread from the use of 'control0#', so there is no valid prompt in        scope to capture up to.    3. Finally, 'control0#' may not be used within 'State#' threads associated       with an STM transaction (i.e. those introduced by 'atomically#').    If the runtime is able to detect that any of these invariants have been    violated in a way that would compromise internal invariants of the runtime,    'control0#' will fail by raising an exception. However, such violations    are only detected on a best-effort basis, as the bookkeeping necessary for    detecting /all/ illegal uses of 'control0#' would have significant overhead.    Therefore, although the operations are "safe" from the runtime's point of    view (e.g. they will not compromise memory safety or clobber internal runtime    state), it is still ultimately the programmer's responsibility to ensure    these invariants hold to guarantee predictable program behavior.    In a similar vein, since each captured continuation includes the full local    context of the suspended computation, it can safely be resumed arbitrarily    many times without violating any invariants of the runtime system. However,    use of these operations in an arbitrary 'IO' computation may be unsafe for    other reasons, as most 'IO' code is not written with reentrancy in mind. For    example, a computation suspended in the middle of reading a file will likely    finish reading it when it is resumed; further attempts to resume from the    same place would then fail because the file handle was already closed.    In other words, although the RTS ensures that a computation's control state    and local variables are properly restored for each distinct resumption of    a continuation, it makes no attempt to duplicate any local state the    computation may have been using (and could not possibly do so in general).    Furthermore, it provides no mechanism for an arbitrary computation to    protect itself against unwanted reentrancy (i.e. there is no analogue to    Scheme's @dynamic-wind@). For those reasons, manipulating the continuation    is only safe if the caller can be certain that doing so will not violate any    expectations or invariants of the enclosing computation. -}PromptTag#,newPromptTag#,prompt#,control0#,{- * STM-accessible Mutable Variables-}{-|-}TVar#,atomically#,retry#,catchRetry#,catchSTM#,newTVar#,readTVar#,readTVarIO#,writeTVar#,{- * Synchronized Mutable Variables-}{-|Operations on 'MVar#'s. -}MVar#,newMVar#,takeMVar#,tryTakeMVar#,putMVar#,tryPutMVar#,readMVar#,tryReadMVar#,isEmptyMVar#,{- * Synchronized I/O Ports-}{-|Operations on 'IOPort#'s. -}IOPort#,newIOPort#,readIOPort#,writeIOPort#,{- * Delay/wait operations-}{-|-}delay#,waitRead#,waitWrite#,{- * Concurrency primitives-}{-|-}State#,RealWorld,ThreadId#,fork#,forkOn#,killThread#,yield#,myThreadId#,labelThread#,isCurrentThreadBound#,noDuplicate#,threadLabel#,threadStatus#,listThreads#,{- * Weak pointers-}{-|-}Weak#,mkWeak#,mkWeakNoFinalizer#,addCFinalizerToWeak#,deRefWeak#,finalizeWeak#,touch#,{- * Stable pointers and names-}{-|-}StablePtr#,StableName#,makeStablePtr#,deRefStablePtr#,eqStablePtr#,makeStableName#,stableNameToInt#,{- * Compact normal form-}{-|Primitives for working with compact regions. The @ghc-compact@         library and the @compact@ library demonstrate how to use these         primitives. The documentation below draws a distinction between         a CNF and a compact block. A CNF contains one or more compact         blocks. The source file @rts\/sm\/CNF.c@         diagrams this relationship. When discussing a compact         block, an additional distinction is drawn between capacity and         utilized bytes. The capacity is the maximum number of bytes that         the compact block can hold. The utilized bytes is the number of         bytes that are actually used by the compact block.        -}Compact#,compactNew#,compactResize#,compactContains#,compactContainsAny#,compactGetFirstBlock#,compactGetNextBlock#,compactAllocateBlock#,compactFixupPointers#,compactAdd#,compactAddWithSharing#,compactSize#,{- * Unsafe pointer equality-}{-|-}reallyUnsafePtrEquality#,{- * Parallelism-}{-|-}par#,spark#,seq#,getSpark#,numSparks#,{- * Controlling object lifetime-}{-|Ensuring that objects don't die a premature death.-}keepAlive#,{- * Tag to enum stuff-}{-|Convert back and forth between values of enumerated types        and small integers.-}dataToTagSmall#,dataToTagLarge#,tagToEnum#,{- * Bytecode operations-}{-|Support for manipulating bytecode objects used by the interpreter and        linker.        Bytecode objects are heap objects which represent top-level bindings and        contain a list of instructions and data needed by these instructions.-}BCO,addrToAny#,anyToAddr#,mkApUpd0#,newBCO#,unpackClosure#,closureSize#,getApStackVal#,{- * Misc-}{-|These aren't nearly as wired in as Etc...-}getCCSOf#,getCurrentCCS#,clearCCS#,{- * Info Table Origin-}{-|-}whereFrom#,{- * Etc-}{-|Miscellaneous built-ins-}FUN,realWorld#,void#,Proxy#,proxy#,seq,traceEvent#,traceBinaryEvent#,traceMarker#,setThreadAllocationCounter#,StackSnapshot#,{- * Safe coercions-}{-|-}coerce,{- * SIMD Vectors-}{-|Operations on SIMD vectors.-}Int8X16#,Int16X8#,Int32X4#,Int64X2#,Int8X32#,Int16X16#,Int32X8#,Int64X4#,Int8X64#,Int16X32#,Int32X16#,Int64X8#,Word8X16#,Word16X8#,Word32X4#,Word64X2#,Word8X32#,Word16X16#,Word32X8#,Word64X4#,Word8X64#,Word16X32#,Word32X16#,Word64X8#,FloatX4#,DoubleX2#,FloatX8#,DoubleX4#,FloatX16#,DoubleX8#,broadcastInt8X16#,broadcastInt16X8#,broadcastInt32X4#,broadcastInt64X2#,broadcastInt8X32#,broadcastInt16X16#,broadcastInt32X8#,broadcastInt64X4#,broadcastInt8X64#,broadcastInt16X32#,broadcastInt32X16#,broadcastInt64X8#,broadcastWord8X16#,broadcastWord16X8#,broadcastWord32X4#,broadcastWord64X2#,broadcastWord8X32#,broadcastWord16X16#,broadcastWord32X8#,broadcastWord64X4#,broadcastWord8X64#,broadcastWord16X32#,broadcastWord32X16#,broadcastWord64X8#,broadcastFloatX4#,broadcastDoubleX2#,broadcastFloatX8#,broadcastDoubleX4#,broadcastFloatX16#,broadcastDoubleX8#,packInt8X16#,packInt16X8#,packInt32X4#,packInt64X2#,packInt8X32#,packInt16X16#,packInt32X8#,packInt64X4#,packInt8X64#,packInt16X32#,packInt32X16#,packInt64X8#,packWord8X16#,packWord16X8#,packWord32X4#,packWord64X2#,packWord8X32#,packWord16X16#,packWord32X8#,packWord64X4#,packWord8X64#,packWord16X32#,packWord32X16#,packWord64X8#,packFloatX4#,packDoubleX2#,packFloatX8#,packDoubleX4#,packFloatX16#,packDoubleX8#,unpackInt8X16#,unpackInt16X8#,unpackInt32X4#,unpackInt64X2#,unpackInt8X32#,unpackInt16X16#,unpackInt32X8#,unpackInt64X4#,unpackInt8X64#,unpackInt16X32#,unpackInt32X16#,unpackInt64X8#,unpackWord8X16#,unpackWord16X8#,unpackWord32X4#,unpackWord64X2#,unpackWord8X32#,unpackWord16X16#,unpackWord32X8#,unpackWord64X4#,unpackWord8X64#,unpackWord16X32#,unpackWord32X16#,unpackWord64X8#,unpackFloatX4#,unpackDoubleX2#,unpackFloatX8#,unpackDoubleX4#,unpackFloatX16#,unpackDoubleX8#,insertInt8X16#,insertInt16X8#,insertInt32X4#,insertInt64X2#,insertInt8X32#,insertInt16X16#,insertInt32X8#,insertInt64X4#,insertInt8X64#,insertInt16X32#,insertInt32X16#,insertInt64X8#,insertWord8X16#,insertWord16X8#,insertWord32X4#,insertWord64X2#,insertWord8X32#,insertWord16X16#,insertWord32X8#,insertWord64X4#,insertWord8X64#,insertWord16X32#,insertWord32X16#,insertWord64X8#,insertFloatX4#,insertDoubleX2#,insertFloatX8#,insertDoubleX4#,insertFloatX16#,insertDoubleX8#,plusInt8X16#,plusInt16X8#,plusInt32X4#,plusInt64X2#,plusInt8X32#,plusInt16X16#,plusInt32X8#,plusInt64X4#,plusInt8X64#,plusInt16X32#,plusInt32X16#,plusInt64X8#,plusWord8X16#,plusWord16X8#,plusWord32X4#,plusWord64X2#,plusWord8X32#,plusWord16X16#,plusWord32X8#,plusWord64X4#,plusWord8X64#,plusWord16X32#,plusWord32X16#,plusWord64X8#,plusFloatX4#,plusDoubleX2#,plusFloatX8#,plusDoubleX4#,plusFloatX16#,plusDoubleX8#,minusInt8X16#,minusInt16X8#,minusInt32X4#,minusInt64X2#,minusInt8X32#,minusInt16X16#,minusInt32X8#,minusInt64X4#,minusInt8X64#,minusInt16X32#,minusInt32X16#,minusInt64X8#,minusWord8X16#,minusWord16X8#,minusWord32X4#,minusWord64X2#,minusWord8X32#,minusWord16X16#,minusWord32X8#,minusWord64X4#,minusWord8X64#,minusWord16X32#,minusWord32X16#,minusWord64X8#,minusFloatX4#,minusDoubleX2#,minusFloatX8#,minusDoubleX4#,minusFloatX16#,minusDoubleX8#,timesInt8X16#,timesInt16X8#,timesInt32X4#,timesInt64X2#,timesInt8X32#,timesInt16X16#,timesInt32X8#,timesInt64X4#,timesInt8X64#,timesInt16X32#,timesInt32X16#,timesInt64X8#,timesWord8X16#,timesWord16X8#,timesWord32X4#,timesWord64X2#,timesWord8X32#,timesWord16X16#,timesWord32X8#,timesWord64X4#,timesWord8X64#,timesWord16X32#,timesWord32X16#,timesWord64X8#,timesFloatX4#,timesDoubleX2#,timesFloatX8#,timesDoubleX4#,timesFloatX16#,timesDoubleX8#,divideFloatX4#,divideDoubleX2#,divideFloatX8#,divideDoubleX4#,divideFloatX16#,divideDoubleX8#,quotInt8X16#,quotInt16X8#,quotInt32X4#,quotInt64X2#,quotInt8X32#,quotInt16X16#,quotInt32X8#,quotInt64X4#,quotInt8X64#,quotInt16X32#,quotInt32X16#,quotInt64X8#,quotWord8X16#,quotWord16X8#,quotWord32X4#,quotWord64X2#,quotWord8X32#,quotWord16X16#,quotWord32X8#,quotWord64X4#,quotWord8X64#,quotWord16X32#,quotWord32X16#,quotWord64X8#,remInt8X16#,remInt16X8#,remInt32X4#,remInt64X2#,remInt8X32#,remInt16X16#,remInt32X8#,remInt64X4#,remInt8X64#,remInt16X32#,remInt32X16#,remInt64X8#,remWord8X16#,remWord16X8#,remWord32X4#,remWord64X2#,remWord8X32#,remWord16X16#,remWord32X8#,remWord64X4#,remWord8X64#,remWord16X32#,remWord32X16#,remWord64X8#,negateInt8X16#,negateInt16X8#,negateInt32X4#,negateInt64X2#,negateInt8X32#,negateInt16X16#,negateInt32X8#,negateInt64X4#,negateInt8X64#,negateInt16X32#,negateInt32X16#,negateInt64X8#,negateFloatX4#,negateDoubleX2#,negateFloatX8#,negateDoubleX4#,negateFloatX16#,negateDoubleX8#,indexInt8X16Array#,indexInt16X8Array#,indexInt32X4Array#,indexInt64X2Array#,indexInt8X32Array#,indexInt16X16Array#,indexInt32X8Array#,indexInt64X4Array#,indexInt8X64Array#,indexInt16X32Array#,indexInt32X16Array#,indexInt64X8Array#,indexWord8X16Array#,indexWord16X8Array#,indexWord32X4Array#,indexWord64X2Array#,indexWord8X32Array#,indexWord16X16Array#,indexWord32X8Array#,indexWord64X4Array#,indexWord8X64Array#,indexWord16X32Array#,indexWord32X16Array#,indexWord64X8Array#,indexFloatX4Array#,indexDoubleX2Array#,indexFloatX8Array#,indexDoubleX4Array#,indexFloatX16Array#,indexDoubleX8Array#,readInt8X16Array#,readInt16X8Array#,readInt32X4Array#,readInt64X2Array#,readInt8X32Array#,readInt16X16Array#,readInt32X8Array#,readInt64X4Array#,readInt8X64Array#,readInt16X32Array#,readInt32X16Array#,readInt64X8Array#,readWord8X16Array#,readWord16X8Array#,readWord32X4Array#,readWord64X2Array#,readWord8X32Array#,readWord16X16Array#,readWord32X8Array#,readWord64X4Array#,readWord8X64Array#,readWord16X32Array#,readWord32X16Array#,readWord64X8Array#,readFloatX4Array#,readDoubleX2Array#,readFloatX8Array#,readDoubleX4Array#,readFloatX16Array#,readDoubleX8Array#,writeInt8X16Array#,writeInt16X8Array#,writeInt32X4Array#,writeInt64X2Array#,writeInt8X32Array#,writeInt16X16Array#,writeInt32X8Array#,writeInt64X4Array#,writeInt8X64Array#,writeInt16X32Array#,writeInt32X16Array#,writeInt64X8Array#,writeWord8X16Array#,writeWord16X8Array#,writeWord32X4Array#,writeWord64X2Array#,writeWord8X32Array#,writeWord16X16Array#,writeWord32X8Array#,writeWord64X4Array#,writeWord8X64Array#,writeWord16X32Array#,writeWord32X16Array#,writeWord64X8Array#,writeFloatX4Array#,writeDoubleX2Array#,writeFloatX8Array#,writeDoubleX4Array#,writeFloatX16Array#,writeDoubleX8Array#,indexInt8X16OffAddr#,indexInt16X8OffAddr#,indexInt32X4OffAddr#,indexInt64X2OffAddr#,indexInt8X32OffAddr#,indexInt16X16OffAddr#,indexInt32X8OffAddr#,indexInt64X4OffAddr#,indexInt8X64OffAddr#,indexInt16X32OffAddr#,indexInt32X16OffAddr#,indexInt64X8OffAddr#,indexWord8X16OffAddr#,indexWord16X8OffAddr#,indexWord32X4OffAddr#,indexWord64X2OffAddr#,indexWord8X32OffAddr#,indexWord16X16OffAddr#,indexWord32X8OffAddr#,indexWord64X4OffAddr#,indexWord8X64OffAddr#,indexWord16X32OffAddr#,indexWord32X16OffAddr#,indexWord64X8OffAddr#,indexFloatX4OffAddr#,indexDoubleX2OffAddr#,indexFloatX8OffAddr#,indexDoubleX4OffAddr#,indexFloatX16OffAddr#,indexDoubleX8OffAddr#,readInt8X16OffAddr#,readInt16X8OffAddr#,readInt32X4OffAddr#,readInt64X2OffAddr#,readInt8X32OffAddr#,readInt16X16OffAddr#,readInt32X8OffAddr#,readInt64X4OffAddr#,readInt8X64OffAddr#,readInt16X32OffAddr#,readInt32X16OffAddr#,readInt64X8OffAddr#,readWord8X16OffAddr#,readWord16X8OffAddr#,readWord32X4OffAddr#,readWord64X2OffAddr#,readWord8X32OffAddr#,readWord16X16OffAddr#,readWord32X8OffAddr#,readWord64X4OffAddr#,readWord8X64OffAddr#,readWord16X32OffAddr#,readWord32X16OffAddr#,readWord64X8OffAddr#,readFloatX4OffAddr#,readDoubleX2OffAddr#,readFloatX8OffAddr#,readDoubleX4OffAddr#,readFloatX16OffAddr#,readDoubleX8OffAddr#,writeInt8X16OffAddr#,writeInt16X8OffAddr#,writeInt32X4OffAddr#,writeInt64X2OffAddr#,writeInt8X32OffAddr#,writeInt16X16OffAddr#,writeInt32X8OffAddr#,writeInt64X4OffAddr#,writeInt8X64OffAddr#,writeInt16X32OffAddr#,writeInt32X16OffAddr#,writeInt64X8OffAddr#,writeWord8X16OffAddr#,writeWord16X8OffAddr#,writeWord32X4OffAddr#,writeWord64X2OffAddr#,writeWord8X32OffAddr#,writeWord16X16OffAddr#,writeWord32X8OffAddr#,writeWord64X4OffAddr#,writeWord8X64OffAddr#,writeWord16X32OffAddr#,writeWord32X16OffAddr#,writeWord64X8OffAddr#,writeFloatX4OffAddr#,writeDoubleX2OffAddr#,writeFloatX8OffAddr#,writeDoubleX4OffAddr#,writeFloatX16OffAddr#,writeDoubleX8OffAddr#,indexInt8ArrayAsInt8X16#,indexInt16ArrayAsInt16X8#,indexInt32ArrayAsInt32X4#,indexInt64ArrayAsInt64X2#,indexInt8ArrayAsInt8X32#,indexInt16ArrayAsInt16X16#,indexInt32ArrayAsInt32X8#,indexInt64ArrayAsInt64X4#,indexInt8ArrayAsInt8X64#,indexInt16ArrayAsInt16X32#,indexInt32ArrayAsInt32X16#,indexInt64ArrayAsInt64X8#,indexWord8ArrayAsWord8X16#,indexWord16ArrayAsWord16X8#,indexWord32ArrayAsWord32X4#,indexWord64ArrayAsWord64X2#,indexWord8ArrayAsWord8X32#,indexWord16ArrayAsWord16X16#,indexWord32ArrayAsWord32X8#,indexWord64ArrayAsWord64X4#,indexWord8ArrayAsWord8X64#,indexWord16ArrayAsWord16X32#,indexWord32ArrayAsWord32X16#,indexWord64ArrayAsWord64X8#,indexFloatArrayAsFloatX4#,indexDoubleArrayAsDoubleX2#,indexFloatArrayAsFloatX8#,indexDoubleArrayAsDoubleX4#,indexFloatArrayAsFloatX16#,indexDoubleArrayAsDoubleX8#,readInt8ArrayAsInt8X16#,readInt16ArrayAsInt16X8#,readInt32ArrayAsInt32X4#,readInt64ArrayAsInt64X2#,readInt8ArrayAsInt8X32#,readInt16ArrayAsInt16X16#,readInt32ArrayAsInt32X8#,readInt64ArrayAsInt64X4#,readInt8ArrayAsInt8X64#,readInt16ArrayAsInt16X32#,readInt32ArrayAsInt32X16#,readInt64ArrayAsInt64X8#,readWord8ArrayAsWord8X16#,readWord16ArrayAsWord16X8#,readWord32ArrayAsWord32X4#,readWord64ArrayAsWord64X2#,readWord8ArrayAsWord8X32#,readWord16ArrayAsWord16X16#,readWord32ArrayAsWord32X8#,readWord64ArrayAsWord64X4#,readWord8ArrayAsWord8X64#,readWord16ArrayAsWord16X32#,readWord32ArrayAsWord32X16#,readWord64ArrayAsWord64X8#,readFloatArrayAsFloatX4#,readDoubleArrayAsDoubleX2#,readFloatArrayAsFloatX8#,readDoubleArrayAsDoubleX4#,readFloatArrayAsFloatX16#,readDoubleArrayAsDoubleX8#,writeInt8ArrayAsInt8X16#,writeInt16ArrayAsInt16X8#,writeInt32ArrayAsInt32X4#,writeInt64ArrayAsInt64X2#,writeInt8ArrayAsInt8X32#,writeInt16ArrayAsInt16X16#,writeInt32ArrayAsInt32X8#,writeInt64ArrayAsInt64X4#,writeInt8ArrayAsInt8X64#,writeInt16ArrayAsInt16X32#,writeInt32ArrayAsInt32X16#,writeInt64ArrayAsInt64X8#,writeWord8ArrayAsWord8X16#,writeWord16ArrayAsWord16X8#,writeWord32ArrayAsWord32X4#,writeWord64ArrayAsWord64X2#,writeWord8ArrayAsWord8X32#,writeWord16ArrayAsWord16X16#,writeWord32ArrayAsWord32X8#,writeWord64ArrayAsWord64X4#,writeWord8ArrayAsWord8X64#,writeWord16ArrayAsWord16X32#,writeWord32ArrayAsWord32X16#,writeWord64ArrayAsWord64X8#,writeFloatArrayAsFloatX4#,writeDoubleArrayAsDoubleX2#,writeFloatArrayAsFloatX8#,writeDoubleArrayAsDoubleX4#,writeFloatArrayAsFloatX16#,writeDoubleArrayAsDoubleX8#,indexInt8OffAddrAsInt8X16#,indexInt16OffAddrAsInt16X8#,indexInt32OffAddrAsInt32X4#,indexInt64OffAddrAsInt64X2#,indexInt8OffAddrAsInt8X32#,indexInt16OffAddrAsInt16X16#,indexInt32OffAddrAsInt32X8#,indexInt64OffAddrAsInt64X4#,indexInt8OffAddrAsInt8X64#,indexInt16OffAddrAsInt16X32#,indexInt32OffAddrAsInt32X16#,indexInt64OffAddrAsInt64X8#,indexWord8OffAddrAsWord8X16#,indexWord16OffAddrAsWord16X8#,indexWord32OffAddrAsWord32X4#,indexWord64OffAddrAsWord64X2#,indexWord8OffAddrAsWord8X32#,indexWord16OffAddrAsWord16X16#,indexWord32OffAddrAsWord32X8#,indexWord64OffAddrAsWord64X4#,indexWord8OffAddrAsWord8X64#,indexWord16OffAddrAsWord16X32#,indexWord32OffAddrAsWord32X16#,indexWord64OffAddrAsWord64X8#,indexFloatOffAddrAsFloatX4#,indexDoubleOffAddrAsDoubleX2#,indexFloatOffAddrAsFloatX8#,indexDoubleOffAddrAsDoubleX4#,indexFloatOffAddrAsFloatX16#,indexDoubleOffAddrAsDoubleX8#,readInt8OffAddrAsInt8X16#,readInt16OffAddrAsInt16X8#,readInt32OffAddrAsInt32X4#,readInt64OffAddrAsInt64X2#,readInt8OffAddrAsInt8X32#,readInt16OffAddrAsInt16X16#,readInt32OffAddrAsInt32X8#,readInt64OffAddrAsInt64X4#,readInt8OffAddrAsInt8X64#,readInt16OffAddrAsInt16X32#,readInt32OffAddrAsInt32X16#,readInt64OffAddrAsInt64X8#,readWord8OffAddrAsWord8X16#,readWord16OffAddrAsWord16X8#,readWord32OffAddrAsWord32X4#,readWord64OffAddrAsWord64X2#,readWord8OffAddrAsWord8X32#,readWord16OffAddrAsWord16X16#,readWord32OffAddrAsWord32X8#,readWord64OffAddrAsWord64X4#,readWord8OffAddrAsWord8X64#,readWord16OffAddrAsWord16X32#,readWord32OffAddrAsWord32X16#,readWord64OffAddrAsWord64X8#,readFloatOffAddrAsFloatX4#,readDoubleOffAddrAsDoubleX2#,readFloatOffAddrAsFloatX8#,readDoubleOffAddrAsDoubleX4#,readFloatOffAddrAsFloatX16#,readDoubleOffAddrAsDoubleX8#,writeInt8OffAddrAsInt8X16#,writeInt16OffAddrAsInt16X8#,writeInt32OffAddrAsInt32X4#,writeInt64OffAddrAsInt64X2#,writeInt8OffAddrAsInt8X32#,writeInt16OffAddrAsInt16X16#,writeInt32OffAddrAsInt32X8#,writeInt64OffAddrAsInt64X4#,writeInt8OffAddrAsInt8X64#,writeInt16OffAddrAsInt16X32#,writeInt32OffAddrAsInt32X16#,writeInt64OffAddrAsInt64X8#,writeWord8OffAddrAsWord8X16#,writeWord16OffAddrAsWord16X8#,writeWord32OffAddrAsWord32X4#,writeWord64OffAddrAsWord64X2#,writeWord8OffAddrAsWord8X32#,writeWord16OffAddrAsWord16X16#,writeWord32OffAddrAsWord32X8#,writeWord64OffAddrAsWord64X4#,writeWord8OffAddrAsWord8X64#,writeWord16OffAddrAsWord16X32#,writeWord32OffAddrAsWord32X16#,writeWord64OffAddrAsWord64X8#,writeFloatOffAddrAsFloatX4#,writeDoubleOffAddrAsDoubleX2#,writeFloatOffAddrAsFloatX8#,writeDoubleOffAddrAsDoubleX4#,writeFloatOffAddrAsFloatX16#,writeDoubleOffAddrAsDoubleX8#,{- * Prefetch-}{-|Prefetch operations: Note how every prefetch operation has a name  with the pattern prefetch*N#, where N is either 0,1,2, or 3.  This suffix number, N, is the "locality level" of the prefetch, following the  convention in GCC and other compilers.  Higher locality numbers correspond to the memory being loaded in more  levels of the cpu cache, and being retained after initial use. The naming  convention follows the naming convention of the prefetch intrinsic found  in the GCC and Clang C compilers.  On the LLVM backend, prefetch*N# uses the LLVM prefetch intrinsic  with locality level N. The code generated by LLVM is target architecture  dependent, but should agree with the GHC NCG on x86 systems.  On the PPC native backend, prefetch*N is a No-Op.  On the x86 NCG, N=0 will generate prefetchNTA,  N=1 generates prefetcht2, N=2 generates prefetcht1, and  N=3 generates prefetcht0.  For streaming workloads, the prefetch*0 operations are recommended.  For workloads which do many reads or writes to a memory location in a short period of time,  prefetch*3 operations are recommended.  For further reading about prefetch and associated systems performance optimization,  the instruction set and optimization manuals by Intel and other CPU vendors are  excellent starting place.  The "Intel 64 and IA-32 Architectures Optimization Reference Manual" is  especially a helpful read, even if your software is meant for other CPU  architectures or vendor hardware. The manual can be found at  http://www.intel.com/content/www/us/en/architecture-and-technology/64-ia-32-architectures-optimization-manual.html .  The @prefetch*@ family of operations has the order of operations  determined by passing around the 'State#' token.  To get a "pure" version of these operations, use 'inlinePerformIO' which is quite safe in this context.  It is important to note that while the prefetch operations will never change the  answer to a pure computation, They CAN change the memory locations resident  in a CPU cache and that may change the performance and timing characteristics  of an application. The prefetch operations are marked as ReadWriteEffect  to reflect that these operations have side effects with respect to the runtime  performance characteristics of the resulting code. Additionally, if the prefetchValue  operations did not have this attribute, GHC does a float out transformation that  results in a let-can-float invariant violation, at least with the current design.  -}prefetchByteArray3#,prefetchMutableByteArray3#,prefetchAddr3#,prefetchValue3#,prefetchByteArray2#,prefetchMutableByteArray2#,prefetchAddr2#,prefetchValue2#,prefetchByteArray1#,prefetchMutableByteArray1#,prefetchAddr1#,prefetchValue1#,prefetchByteArray0#,prefetchMutableByteArray0#,prefetchAddr0#,prefetchValue0#,{- * RuntimeRep polymorphism in continuation-style primops-}{-|  Several primops provided by GHC accept continuation arguments with highly polymorphic  arguments. For instance, consider the type of `catch#`:    catch# :: forall (r_rep :: RuntimeRep) (r :: TYPE r_rep) w.              (State# RealWorld -> (# State# RealWorld, r #) )           -> (w -> State# RealWorld -> (# State# RealWorld, r #) )           -> State# RealWorld           -> (# State# RealWorld, r #)  This type suggests that we could instantiate `catch#` continuation argument  (namely, the first argument) with something like,    f :: State# RealWorld -> (# State# RealWorld, (# Int, String, Int8# #) #)  However, sadly the type does not capture an important limitation of the  primop. Specifically, due to the operational behavior of `catch#` the result  type must be representable with a single machine word. In a future GHC  release we may improve the precision of this type to capture this limitation.  See #21868.  -})where{-effect = NoEffectcan_fail_warning = WarnIfEffectIsCanFailout_of_line = Falsecommutable = Falsecode_size = {  primOpCodeSizeDefault }work_free = {  primOpCodeSize _thisOp == 0 }cheap = {  primOpOkForSpeculation _thisOp }strictness = {  \ arity -> mkClosedDmdSig (replicate arity topDmd) topDiv }fixity = Nothingllvm_only = Falsedeprecated_msg = { }-}importGHC.Types(Coercible)default()dataChar#gtChar#::Char#->Char#->Int#gtChar# :: Char# -> Char# -> Int#gtChar#=Char# -> Char# -> Int#gtChar#geChar#::Char#->Char#->Int#geChar# :: Char# -> Char# -> Int#geChar#=Char# -> Char# -> Int#geChar#eqChar#::Char#->Char#->Int#eqChar# :: Char# -> Char# -> Int#eqChar#=Char# -> Char# -> Int#eqChar#neChar#::Char#->Char#->Int#neChar# :: Char# -> Char# -> Int#neChar#=Char# -> Char# -> Int#neChar#ltChar#::Char#->Char#->Int#ltChar# :: Char# -> Char# -> Int#ltChar#=Char# -> Char# -> Int#ltChar#leChar#::Char#->Char#->Int#leChar# :: Char# -> Char# -> Int#leChar#=Char# -> Char# -> Int#leChar#ord#::Char#->Int#ord# :: Char# -> Int#ord#=Char# -> Int#ord#dataInt8#int8ToInt#::Int8#->Int#int8ToInt# :: Int8# -> Int#int8ToInt#=Int8# -> Int#int8ToInt#intToInt8#::Int#->Int8#intToInt8# :: Int# -> Int8#intToInt8#=Int# -> Int8#intToInt8#negateInt8#::Int8#->Int8#negateInt8# :: Int8# -> Int8#negateInt8#=Int8# -> Int8#negateInt8#plusInt8#::Int8#->Int8#->Int8#plusInt8# :: Int8# -> Int8# -> Int8#plusInt8#=Int8# -> Int8# -> Int8#plusInt8#subInt8#::Int8#->Int8#->Int8#subInt8# :: Int8# -> Int8# -> Int8#subInt8#=Int8# -> Int8# -> Int8#subInt8#timesInt8#::Int8#->Int8#->Int8#timesInt8# :: Int8# -> Int8# -> Int8#timesInt8#=Int8# -> Int8# -> Int8#timesInt8#quotInt8#::Int8#->Int8#->Int8#quotInt8# :: Int8# -> Int8# -> Int8#quotInt8#=Int8# -> Int8# -> Int8#quotInt8#remInt8#::Int8#->Int8#->Int8#remInt8# :: Int8# -> Int8# -> Int8#remInt8#=Int8# -> Int8# -> Int8#remInt8#quotRemInt8#::Int8#->Int8#->(#Int8#,Int8##)quotRemInt8# :: Int8# -> Int8# -> (# Int8#, Int8# #)quotRemInt8#=Int8# -> Int8# -> (# Int8#, Int8# #)quotRemInt8#uncheckedShiftLInt8#::Int8#->Int#->Int8#uncheckedShiftLInt8# :: Int8# -> Int# -> Int8#uncheckedShiftLInt8#=Int8# -> Int# -> Int8#uncheckedShiftLInt8#uncheckedShiftRAInt8#::Int8#->Int#->Int8#uncheckedShiftRAInt8# :: Int8# -> Int# -> Int8#uncheckedShiftRAInt8#=Int8# -> Int# -> Int8#uncheckedShiftRAInt8#uncheckedShiftRLInt8#::Int8#->Int#->Int8#uncheckedShiftRLInt8# :: Int8# -> Int# -> Int8#uncheckedShiftRLInt8#=Int8# -> Int# -> Int8#uncheckedShiftRLInt8#int8ToWord8#::Int8#->Word8#int8ToWord8# :: Int8# -> Word8#int8ToWord8#=Int8# -> Word8#int8ToWord8#eqInt8#::Int8#->Int8#->Int#eqInt8# :: Int8# -> Int8# -> Int#eqInt8#=Int8# -> Int8# -> Int#eqInt8#geInt8#::Int8#->Int8#->Int#geInt8# :: Int8# -> Int8# -> Int#geInt8#=Int8# -> Int8# -> Int#geInt8#gtInt8#::Int8#->Int8#->Int#gtInt8# :: Int8# -> Int8# -> Int#gtInt8#=Int8# -> Int8# -> Int#gtInt8#leInt8#::Int8#->Int8#->Int#leInt8# :: Int8# -> Int8# -> Int#leInt8#=Int8# -> Int8# -> Int#leInt8#ltInt8#::Int8#->Int8#->Int#ltInt8# :: Int8# -> Int8# -> Int#ltInt8#=Int8# -> Int8# -> Int#ltInt8#neInt8#::Int8#->Int8#->Int#neInt8# :: Int8# -> Int8# -> Int#neInt8#=Int8# -> Int8# -> Int#neInt8#dataWord8#word8ToWord#::Word8#->Word#word8ToWord# :: Word8# -> Word#word8ToWord#=Word8# -> Word#word8ToWord#wordToWord8#::Word#->Word8#wordToWord8# :: Word# -> Word8#wordToWord8#=Word# -> Word8#wordToWord8#plusWord8#::Word8#->Word8#->Word8#plusWord8# :: Word8# -> Word8# -> Word8#plusWord8#=Word8# -> Word8# -> Word8#plusWord8#subWord8#::Word8#->Word8#->Word8#subWord8# :: Word8# -> Word8# -> Word8#subWord8#=Word8# -> Word8# -> Word8#subWord8#timesWord8#::Word8#->Word8#->Word8#timesWord8# :: Word8# -> Word8# -> Word8#timesWord8#=Word8# -> Word8# -> Word8#timesWord8#quotWord8#::Word8#->Word8#->Word8#quotWord8# :: Word8# -> Word8# -> Word8#quotWord8#=Word8# -> Word8# -> Word8#quotWord8#remWord8#::Word8#->Word8#->Word8#remWord8# :: Word8# -> Word8# -> Word8#remWord8#=Word8# -> Word8# -> Word8#remWord8#quotRemWord8#::Word8#->Word8#->(#Word8#,Word8##)quotRemWord8# :: Word8# -> Word8# -> (# Word8#, Word8# #)quotRemWord8#=Word8# -> Word8# -> (# Word8#, Word8# #)quotRemWord8#andWord8#::Word8#->Word8#->Word8#andWord8# :: Word8# -> Word8# -> Word8#andWord8#=Word8# -> Word8# -> Word8#andWord8#orWord8#::Word8#->Word8#->Word8#orWord8# :: Word8# -> Word8# -> Word8#orWord8#=Word8# -> Word8# -> Word8#orWord8#xorWord8#::Word8#->Word8#->Word8#xorWord8# :: Word8# -> Word8# -> Word8#xorWord8#=Word8# -> Word8# -> Word8#xorWord8#notWord8#::Word8#->Word8#notWord8# :: Word8# -> Word8#notWord8#=Word8# -> Word8#notWord8#uncheckedShiftLWord8#::Word8#->Int#->Word8#uncheckedShiftLWord8# :: Word8# -> Int# -> Word8#uncheckedShiftLWord8#=Word8# -> Int# -> Word8#uncheckedShiftLWord8#uncheckedShiftRLWord8#::Word8#->Int#->Word8#uncheckedShiftRLWord8# :: Word8# -> Int# -> Word8#uncheckedShiftRLWord8#=Word8# -> Int# -> Word8#uncheckedShiftRLWord8#word8ToInt8#::Word8#->Int8#word8ToInt8# :: Word8# -> Int8#word8ToInt8#=Word8# -> Int8#word8ToInt8#eqWord8#::Word8#->Word8#->Int#eqWord8# :: Word8# -> Word8# -> Int#eqWord8#=Word8# -> Word8# -> Int#eqWord8#geWord8#::Word8#->Word8#->Int#geWord8# :: Word8# -> Word8# -> Int#geWord8#=Word8# -> Word8# -> Int#geWord8#gtWord8#::Word8#->Word8#->Int#gtWord8# :: Word8# -> Word8# -> Int#gtWord8#=Word8# -> Word8# -> Int#gtWord8#leWord8#::Word8#->Word8#->Int#leWord8# :: Word8# -> Word8# -> Int#leWord8#=Word8# -> Word8# -> Int#leWord8#ltWord8#::Word8#->Word8#->Int#ltWord8# :: Word8# -> Word8# -> Int#ltWord8#=Word8# -> Word8# -> Int#ltWord8#neWord8#::Word8#->Word8#->Int#neWord8# :: Word8# -> Word8# -> Int#neWord8#=Word8# -> Word8# -> Int#neWord8#dataInt16#int16ToInt#::Int16#->Int#int16ToInt# :: Int16# -> Int#int16ToInt#=Int16# -> Int#int16ToInt#intToInt16#::Int#->Int16#intToInt16# :: Int# -> Int16#intToInt16#=Int# -> Int16#intToInt16#negateInt16#::Int16#->Int16#negateInt16# :: Int16# -> Int16#negateInt16#=Int16# -> Int16#negateInt16#plusInt16#::Int16#->Int16#->Int16#plusInt16# :: Int16# -> Int16# -> Int16#plusInt16#=Int16# -> Int16# -> Int16#plusInt16#subInt16#::Int16#->Int16#->Int16#subInt16# :: Int16# -> Int16# -> Int16#subInt16#=Int16# -> Int16# -> Int16#subInt16#timesInt16#::Int16#->Int16#->Int16#timesInt16# :: Int16# -> Int16# -> Int16#timesInt16#=Int16# -> Int16# -> Int16#timesInt16#quotInt16#::Int16#->Int16#->Int16#quotInt16# :: Int16# -> Int16# -> Int16#quotInt16#=Int16# -> Int16# -> Int16#quotInt16#remInt16#::Int16#->Int16#->Int16#remInt16# :: Int16# -> Int16# -> Int16#remInt16#=Int16# -> Int16# -> Int16#remInt16#quotRemInt16#::Int16#->Int16#->(#Int16#,Int16##)quotRemInt16# :: Int16# -> Int16# -> (# Int16#, Int16# #)quotRemInt16#=Int16# -> Int16# -> (# Int16#, Int16# #)quotRemInt16#uncheckedShiftLInt16#::Int16#->Int#->Int16#uncheckedShiftLInt16# :: Int16# -> Int# -> Int16#uncheckedShiftLInt16#=Int16# -> Int# -> Int16#uncheckedShiftLInt16#uncheckedShiftRAInt16#::Int16#->Int#->Int16#uncheckedShiftRAInt16# :: Int16# -> Int# -> Int16#uncheckedShiftRAInt16#=Int16# -> Int# -> Int16#uncheckedShiftRAInt16#uncheckedShiftRLInt16#::Int16#->Int#->Int16#uncheckedShiftRLInt16# :: Int16# -> Int# -> Int16#uncheckedShiftRLInt16#=Int16# -> Int# -> Int16#uncheckedShiftRLInt16#int16ToWord16#::Int16#->Word16#int16ToWord16# :: Int16# -> Word16#int16ToWord16#=Int16# -> Word16#int16ToWord16#eqInt16#::Int16#->Int16#->Int#eqInt16# :: Int16# -> Int16# -> Int#eqInt16#=Int16# -> Int16# -> Int#eqInt16#geInt16#::Int16#->Int16#->Int#geInt16# :: Int16# -> Int16# -> Int#geInt16#=Int16# -> Int16# -> Int#geInt16#gtInt16#::Int16#->Int16#->Int#gtInt16# :: Int16# -> Int16# -> Int#gtInt16#=Int16# -> Int16# -> Int#gtInt16#leInt16#::Int16#->Int16#->Int#leInt16# :: Int16# -> Int16# -> Int#leInt16#=Int16# -> Int16# -> Int#leInt16#ltInt16#::Int16#->Int16#->Int#ltInt16# :: Int16# -> Int16# -> Int#ltInt16#=Int16# -> Int16# -> Int#ltInt16#neInt16#::Int16#->Int16#->Int#neInt16# :: Int16# -> Int16# -> Int#neInt16#=Int16# -> Int16# -> Int#neInt16#dataWord16#word16ToWord#::Word16#->Word#word16ToWord# :: Word16# -> Word#word16ToWord#=Word16# -> Word#word16ToWord#wordToWord16#::Word#->Word16#wordToWord16# :: Word# -> Word16#wordToWord16#=Word# -> Word16#wordToWord16#plusWord16#::Word16#->Word16#->Word16#plusWord16# :: Word16# -> Word16# -> Word16#plusWord16#=Word16# -> Word16# -> Word16#plusWord16#subWord16#::Word16#->Word16#->Word16#subWord16# :: Word16# -> Word16# -> Word16#subWord16#=Word16# -> Word16# -> Word16#subWord16#timesWord16#::Word16#->Word16#->Word16#timesWord16# :: Word16# -> Word16# -> Word16#timesWord16#=Word16# -> Word16# -> Word16#timesWord16#quotWord16#::Word16#->Word16#->Word16#quotWord16# :: Word16# -> Word16# -> Word16#quotWord16#=Word16# -> Word16# -> Word16#quotWord16#remWord16#::Word16#->Word16#->Word16#remWord16# :: Word16# -> Word16# -> Word16#remWord16#=Word16# -> Word16# -> Word16#remWord16#quotRemWord16#::Word16#->Word16#->(#Word16#,Word16##)quotRemWord16# :: Word16# -> Word16# -> (# Word16#, Word16# #)quotRemWord16#=Word16# -> Word16# -> (# Word16#, Word16# #)quotRemWord16#andWord16#::Word16#->Word16#->Word16#andWord16# :: Word16# -> Word16# -> Word16#andWord16#=Word16# -> Word16# -> Word16#andWord16#orWord16#::Word16#->Word16#->Word16#orWord16# :: Word16# -> Word16# -> Word16#orWord16#=Word16# -> Word16# -> Word16#orWord16#xorWord16#::Word16#->Word16#->Word16#xorWord16# :: Word16# -> Word16# -> Word16#xorWord16#=Word16# -> Word16# -> Word16#xorWord16#notWord16#::Word16#->Word16#notWord16# :: Word16# -> Word16#notWord16#=Word16# -> Word16#notWord16#uncheckedShiftLWord16#::Word16#->Int#->Word16#uncheckedShiftLWord16# :: Word16# -> Int# -> Word16#uncheckedShiftLWord16#=Word16# -> Int# -> Word16#uncheckedShiftLWord16#uncheckedShiftRLWord16#::Word16#->Int#->Word16#uncheckedShiftRLWord16# :: Word16# -> Int# -> Word16#uncheckedShiftRLWord16#=Word16# -> Int# -> Word16#uncheckedShiftRLWord16#word16ToInt16#::Word16#->Int16#word16ToInt16# :: Word16# -> Int16#word16ToInt16#=Word16# -> Int16#word16ToInt16#eqWord16#::Word16#->Word16#->Int#eqWord16# :: Word16# -> Word16# -> Int#eqWord16#=Word16# -> Word16# -> Int#eqWord16#geWord16#::Word16#->Word16#->Int#geWord16# :: Word16# -> Word16# -> Int#geWord16#=Word16# -> Word16# -> Int#geWord16#gtWord16#::Word16#->Word16#->Int#gtWord16# :: Word16# -> Word16# -> Int#gtWord16#=Word16# -> Word16# -> Int#gtWord16#leWord16#::Word16#->Word16#->Int#leWord16# :: Word16# -> Word16# -> Int#leWord16#=Word16# -> Word16# -> Int#leWord16#ltWord16#::Word16#->Word16#->Int#ltWord16# :: Word16# -> Word16# -> Int#ltWord16#=Word16# -> Word16# -> Int#ltWord16#neWord16#::Word16#->Word16#->Int#neWord16# :: Word16# -> Word16# -> Int#neWord16#=Word16# -> Word16# -> Int#neWord16#dataInt32#int32ToInt#::Int32#->Int#int32ToInt# :: Int32# -> Int#int32ToInt#=Int32# -> Int#int32ToInt#intToInt32#::Int#->Int32#intToInt32# :: Int# -> Int32#intToInt32#=Int# -> Int32#intToInt32#negateInt32#::Int32#->Int32#negateInt32# :: Int32# -> Int32#negateInt32#=Int32# -> Int32#negateInt32#plusInt32#::Int32#->Int32#->Int32#plusInt32# :: Int32# -> Int32# -> Int32#plusInt32#=Int32# -> Int32# -> Int32#plusInt32#subInt32#::Int32#->Int32#->Int32#subInt32# :: Int32# -> Int32# -> Int32#subInt32#=Int32# -> Int32# -> Int32#subInt32#timesInt32#::Int32#->Int32#->Int32#timesInt32# :: Int32# -> Int32# -> Int32#timesInt32#=Int32# -> Int32# -> Int32#timesInt32#quotInt32#::Int32#->Int32#->Int32#quotInt32# :: Int32# -> Int32# -> Int32#quotInt32#=Int32# -> Int32# -> Int32#quotInt32#remInt32#::Int32#->Int32#->Int32#remInt32# :: Int32# -> Int32# -> Int32#remInt32#=Int32# -> Int32# -> Int32#remInt32#quotRemInt32#::Int32#->Int32#->(#Int32#,Int32##)quotRemInt32# :: Int32# -> Int32# -> (# Int32#, Int32# #)quotRemInt32#=Int32# -> Int32# -> (# Int32#, Int32# #)quotRemInt32#uncheckedShiftLInt32#::Int32#->Int#->Int32#uncheckedShiftLInt32# :: Int32# -> Int# -> Int32#uncheckedShiftLInt32#=Int32# -> Int# -> Int32#uncheckedShiftLInt32#uncheckedShiftRAInt32#::Int32#->Int#->Int32#uncheckedShiftRAInt32# :: Int32# -> Int# -> Int32#uncheckedShiftRAInt32#=Int32# -> Int# -> Int32#uncheckedShiftRAInt32#uncheckedShiftRLInt32#::Int32#->Int#->Int32#uncheckedShiftRLInt32# :: Int32# -> Int# -> Int32#uncheckedShiftRLInt32#=Int32# -> Int# -> Int32#uncheckedShiftRLInt32#int32ToWord32#::Int32#->Word32#int32ToWord32# :: Int32# -> Word32#int32ToWord32#=Int32# -> Word32#int32ToWord32#eqInt32#::Int32#->Int32#->Int#eqInt32# :: Int32# -> Int32# -> Int#eqInt32#=Int32# -> Int32# -> Int#eqInt32#geInt32#::Int32#->Int32#->Int#geInt32# :: Int32# -> Int32# -> Int#geInt32#=Int32# -> Int32# -> Int#geInt32#gtInt32#::Int32#->Int32#->Int#gtInt32# :: Int32# -> Int32# -> Int#gtInt32#=Int32# -> Int32# -> Int#gtInt32#leInt32#::Int32#->Int32#->Int#leInt32# :: Int32# -> Int32# -> Int#leInt32#=Int32# -> Int32# -> Int#leInt32#ltInt32#::Int32#->Int32#->Int#ltInt32# :: Int32# -> Int32# -> Int#ltInt32#=Int32# -> Int32# -> Int#ltInt32#neInt32#::Int32#->Int32#->Int#neInt32# :: Int32# -> Int32# -> Int#neInt32#=Int32# -> Int32# -> Int#neInt32#dataWord32#word32ToWord#::Word32#->Word#word32ToWord# :: Word32# -> Word#word32ToWord#=Word32# -> Word#word32ToWord#wordToWord32#::Word#->Word32#wordToWord32# :: Word# -> Word32#wordToWord32#=Word# -> Word32#wordToWord32#plusWord32#::Word32#->Word32#->Word32#plusWord32# :: Word32# -> Word32# -> Word32#plusWord32#=Word32# -> Word32# -> Word32#plusWord32#subWord32#::Word32#->Word32#->Word32#subWord32# :: Word32# -> Word32# -> Word32#subWord32#=Word32# -> Word32# -> Word32#subWord32#timesWord32#::Word32#->Word32#->Word32#timesWord32# :: Word32# -> Word32# -> Word32#timesWord32#=Word32# -> Word32# -> Word32#timesWord32#quotWord32#::Word32#->Word32#->Word32#quotWord32# :: Word32# -> Word32# -> Word32#quotWord32#=Word32# -> Word32# -> Word32#quotWord32#remWord32#::Word32#->Word32#->Word32#remWord32# :: Word32# -> Word32# -> Word32#remWord32#=Word32# -> Word32# -> Word32#remWord32#quotRemWord32#::Word32#->Word32#->(#Word32#,Word32##)quotRemWord32# :: Word32# -> Word32# -> (# Word32#, Word32# #)quotRemWord32#=Word32# -> Word32# -> (# Word32#, Word32# #)quotRemWord32#andWord32#::Word32#->Word32#->Word32#andWord32# :: Word32# -> Word32# -> Word32#andWord32#=Word32# -> Word32# -> Word32#andWord32#orWord32#::Word32#->Word32#->Word32#orWord32# :: Word32# -> Word32# -> Word32#orWord32#=Word32# -> Word32# -> Word32#orWord32#xorWord32#::Word32#->Word32#->Word32#xorWord32# :: Word32# -> Word32# -> Word32#xorWord32#=Word32# -> Word32# -> Word32#xorWord32#notWord32#::Word32#->Word32#notWord32# :: Word32# -> Word32#notWord32#=Word32# -> Word32#notWord32#uncheckedShiftLWord32#::Word32#->Int#->Word32#uncheckedShiftLWord32# :: Word32# -> Int# -> Word32#uncheckedShiftLWord32#=Word32# -> Int# -> Word32#uncheckedShiftLWord32#uncheckedShiftRLWord32#::Word32#->Int#->Word32#uncheckedShiftRLWord32# :: Word32# -> Int# -> Word32#uncheckedShiftRLWord32#=Word32# -> Int# -> Word32#uncheckedShiftRLWord32#word32ToInt32#::Word32#->Int32#word32ToInt32# :: Word32# -> Int32#word32ToInt32#=Word32# -> Int32#word32ToInt32#eqWord32#::Word32#->Word32#->Int#eqWord32# :: Word32# -> Word32# -> Int#eqWord32#=Word32# -> Word32# -> Int#eqWord32#geWord32#::Word32#->Word32#->Int#geWord32# :: Word32# -> Word32# -> Int#geWord32#=Word32# -> Word32# -> Int#geWord32#gtWord32#::Word32#->Word32#->Int#gtWord32# :: Word32# -> Word32# -> Int#gtWord32#=Word32# -> Word32# -> Int#gtWord32#leWord32#::Word32#->Word32#->Int#leWord32# :: Word32# -> Word32# -> Int#leWord32#=Word32# -> Word32# -> Int#leWord32#ltWord32#::Word32#->Word32#->Int#ltWord32# :: Word32# -> Word32# -> Int#ltWord32#=Word32# -> Word32# -> Int#ltWord32#neWord32#::Word32#->Word32#->Int#neWord32# :: Word32# -> Word32# -> Int#neWord32#=Word32# -> Word32# -> Int#neWord32#dataInt64#int64ToInt#::Int64#->Int#int64ToInt# :: Int64# -> Int#int64ToInt#=Int64# -> Int#int64ToInt#intToInt64#::Int#->Int64#intToInt64# :: Int# -> Int64#intToInt64#=Int# -> Int64#intToInt64#negateInt64#::Int64#->Int64#negateInt64# :: Int64# -> Int64#negateInt64#=Int64# -> Int64#negateInt64#plusInt64#::Int64#->Int64#->Int64#plusInt64# :: Int64# -> Int64# -> Int64#plusInt64#=Int64# -> Int64# -> Int64#plusInt64#subInt64#::Int64#->Int64#->Int64#subInt64# :: Int64# -> Int64# -> Int64#subInt64#=Int64# -> Int64# -> Int64#subInt64#timesInt64#::Int64#->Int64#->Int64#timesInt64# :: Int64# -> Int64# -> Int64#timesInt64#=Int64# -> Int64# -> Int64#timesInt64#quotInt64#::Int64#->Int64#->Int64#quotInt64# :: Int64# -> Int64# -> Int64#quotInt64#=Int64# -> Int64# -> Int64#quotInt64#remInt64#::Int64#->Int64#->Int64#remInt64# :: Int64# -> Int64# -> Int64#remInt64#=Int64# -> Int64# -> Int64#remInt64#uncheckedIShiftL64#::Int64#->Int#->Int64#uncheckedIShiftL64# :: Int64# -> Int# -> Int64#uncheckedIShiftL64#=Int64# -> Int# -> Int64#uncheckedIShiftL64#uncheckedIShiftRA64#::Int64#->Int#->Int64#uncheckedIShiftRA64# :: Int64# -> Int# -> Int64#uncheckedIShiftRA64#=Int64# -> Int# -> Int64#uncheckedIShiftRA64#uncheckedIShiftRL64#::Int64#->Int#->Int64#uncheckedIShiftRL64# :: Int64# -> Int# -> Int64#uncheckedIShiftRL64#=Int64# -> Int# -> Int64#uncheckedIShiftRL64#int64ToWord64#::Int64#->Word64#int64ToWord64# :: Int64# -> Word64#int64ToWord64#=Int64# -> Word64#int64ToWord64#eqInt64#::Int64#->Int64#->Int#eqInt64# :: Int64# -> Int64# -> Int#eqInt64#=Int64# -> Int64# -> Int#eqInt64#geInt64#::Int64#->Int64#->Int#geInt64# :: Int64# -> Int64# -> Int#geInt64#=Int64# -> Int64# -> Int#geInt64#gtInt64#::Int64#->Int64#->Int#gtInt64# :: Int64# -> Int64# -> Int#gtInt64#=Int64# -> Int64# -> Int#gtInt64#leInt64#::Int64#->Int64#->Int#leInt64# :: Int64# -> Int64# -> Int#leInt64#=Int64# -> Int64# -> Int#leInt64#ltInt64#::Int64#->Int64#->Int#ltInt64# :: Int64# -> Int64# -> Int#ltInt64#=Int64# -> Int64# -> Int#ltInt64#neInt64#::Int64#->Int64#->Int#neInt64# :: Int64# -> Int64# -> Int#neInt64#=Int64# -> Int64# -> Int#neInt64#dataWord64#word64ToWord#::Word64#->Word#word64ToWord# :: Word64# -> Word#word64ToWord#=Word64# -> Word#word64ToWord#wordToWord64#::Word#->Word64#wordToWord64# :: Word# -> Word64#wordToWord64#=Word# -> Word64#wordToWord64#plusWord64#::Word64#->Word64#->Word64#plusWord64# :: Word64# -> Word64# -> Word64#plusWord64#=Word64# -> Word64# -> Word64#plusWord64#subWord64#::Word64#->Word64#->Word64#subWord64# :: Word64# -> Word64# -> Word64#subWord64#=Word64# -> Word64# -> Word64#subWord64#timesWord64#::Word64#->Word64#->Word64#timesWord64# :: Word64# -> Word64# -> Word64#timesWord64#=Word64# -> Word64# -> Word64#timesWord64#quotWord64#::Word64#->Word64#->Word64#quotWord64# :: Word64# -> Word64# -> Word64#quotWord64#=Word64# -> Word64# -> Word64#quotWord64#remWord64#::Word64#->Word64#->Word64#remWord64# :: Word64# -> Word64# -> Word64#remWord64#=Word64# -> Word64# -> Word64#remWord64#and64#::Word64#->Word64#->Word64#and64# :: Word64# -> Word64# -> Word64#and64#=Word64# -> Word64# -> Word64#and64#or64#::Word64#->Word64#->Word64#or64# :: Word64# -> Word64# -> Word64#or64#=Word64# -> Word64# -> Word64#or64#xor64#::Word64#->Word64#->Word64#xor64# :: Word64# -> Word64# -> Word64#xor64#=Word64# -> Word64# -> Word64#xor64#not64#::Word64#->Word64#not64# :: Word64# -> Word64#not64#=Word64# -> Word64#not64#uncheckedShiftL64#::Word64#->Int#->Word64#uncheckedShiftL64# :: Word64# -> Int# -> Word64#uncheckedShiftL64#=Word64# -> Int# -> Word64#uncheckedShiftL64#uncheckedShiftRL64#::Word64#->Int#->Word64#uncheckedShiftRL64# :: Word64# -> Int# -> Word64#uncheckedShiftRL64#=Word64# -> Int# -> Word64#uncheckedShiftRL64#word64ToInt64#::Word64#->Int64#word64ToInt64# :: Word64# -> Int64#word64ToInt64#=Word64# -> Int64#word64ToInt64#eqWord64#::Word64#->Word64#->Int#eqWord64# :: Word64# -> Word64# -> Int#eqWord64#=Word64# -> Word64# -> Int#eqWord64#geWord64#::Word64#->Word64#->Int#geWord64# :: Word64# -> Word64# -> Int#geWord64#=Word64# -> Word64# -> Int#geWord64#gtWord64#::Word64#->Word64#->Int#gtWord64# :: Word64# -> Word64# -> Int#gtWord64#=Word64# -> Word64# -> Int#gtWord64#leWord64#::Word64#->Word64#->Int#leWord64# :: Word64# -> Word64# -> Int#leWord64#=Word64# -> Word64# -> Int#leWord64#ltWord64#::Word64#->Word64#->Int#ltWord64# :: Word64# -> Word64# -> Int#ltWord64#=Word64# -> Word64# -> Int#ltWord64#neWord64#::Word64#->Word64#->Int#neWord64# :: Word64# -> Word64# -> Int#neWord64#=Word64# -> Word64# -> Int#neWord64#dataInt#infixl6+#(+#)::Int#->Int#->Int#+# :: Int# -> Int# -> Int#(+#)=Int# -> Int# -> Int#(+#)infixl6-#(-#)::Int#->Int#->Int#-# :: Int# -> Int# -> Int#(-#)=Int# -> Int# -> Int#(-#){-|Low word of signed integer multiply.-}infixl7*#(*#)::Int#->Int#->Int#*# :: Int# -> Int# -> Int#(*#)=Int# -> Int# -> Int#(*#){-|Return a triple (isHighNeeded,high,low) where high and low are respectively   the high and low bits of the double-word result. isHighNeeded is a cheap way   to test if the high word is a sign-extension of the low word (isHighNeeded =   0#) or not (isHighNeeded = 1#).-}timesInt2#::Int#->Int#->(#Int#,Int#,Int##)timesInt2# :: Int# -> Int# -> (# Int#, Int#, Int# #)timesInt2#=Int# -> Int# -> (# Int#, Int#, Int# #)timesInt2#{-|Return non-zero if there is any possibility that the upper word of a    signed integer multiply might contain useful information.  Return    zero only if you are completely sure that no overflow can occur.    On a 32-bit platform, the recommended implementation is to do a    32 x 32 -> 64 signed multiply, and subtract result[63:32] from    (result[31] >>signed 31).  If this is zero, meaning that the    upper word is merely a sign extension of the lower one, no    overflow can occur.    On a 64-bit platform it is not always possible to    acquire the top 64 bits of the result.  Therefore, a recommended    implementation is to take the absolute value of both operands, and    return 0 iff bits[63:31] of them are zero, since that means that their    magnitudes fit within 31 bits, so the magnitude of the product must fit    into 62 bits.    If in doubt, return non-zero, but do make an effort to create the    correct answer for small args, since otherwise the performance of    @(*) :: Integer -> Integer -> Integer@ will be poor.   -}mulIntMayOflo#::Int#->Int#->Int#mulIntMayOflo# :: Int# -> Int# -> Int#mulIntMayOflo#=Int# -> Int# -> Int#mulIntMayOflo#{-|Rounds towards zero. The behavior is undefined if the second argument is    zero.   -}quotInt#::Int#->Int#->Int#quotInt# :: Int# -> Int# -> Int#quotInt#=Int# -> Int# -> Int#quotInt#{-|Satisfies @('quotInt#' x y) '*#' y '+#' ('remInt#' x y) == x@. The    behavior is undefined if the second argument is zero.   -}remInt#::Int#->Int#->Int#remInt# :: Int# -> Int# -> Int#remInt#=Int# -> Int# -> Int#remInt#{-|Rounds towards zero.-}quotRemInt#::Int#->Int#->(#Int#,Int##)quotRemInt# :: Int# -> Int# -> (# Int#, Int# #)quotRemInt#=Int# -> Int# -> (# Int#, Int# #)quotRemInt#{-|Bitwise "and".-}andI#::Int#->Int#->Int#andI# :: Int# -> Int# -> Int#andI#=Int# -> Int# -> Int#andI#{-|Bitwise "or".-}orI#::Int#->Int#->Int#orI# :: Int# -> Int# -> Int#orI#=Int# -> Int# -> Int#orI#{-|Bitwise "xor".-}xorI#::Int#->Int#->Int#xorI# :: Int# -> Int# -> Int#xorI#=Int# -> Int# -> Int#xorI#{-|Bitwise "not", also known as the binary complement.-}notI#::Int#->Int#notI# :: Int# -> Int#notI#=Int# -> Int#notI#{-|Unary negation.    Since the negative 'Int#' range extends one further than the    positive range, 'negateInt#' of the most negative number is an    identity operation. This way, 'negateInt#' is always its own inverse.-}negateInt#::Int#->Int#negateInt# :: Int# -> Int#negateInt#=Int# -> Int#negateInt#{-|Add signed integers reporting overflow.          First member of result is the sum truncated to an 'Int#';          second member is zero if the true sum fits in an 'Int#',          nonzero if overflow occurred (the sum is either too large          or too small to fit in an 'Int#').-}addIntC#::Int#->Int#->(#Int#,Int##)addIntC# :: Int# -> Int# -> (# Int#, Int# #)addIntC#=Int# -> Int# -> (# Int#, Int# #)addIntC#{-|Subtract signed integers reporting overflow.          First member of result is the difference truncated to an 'Int#';          second member is zero if the true difference fits in an 'Int#',          nonzero if overflow occurred (the difference is either too large          or too small to fit in an 'Int#').-}subIntC#::Int#->Int#->(#Int#,Int##)subIntC# :: Int# -> Int# -> (# Int#, Int# #)subIntC#=Int# -> Int# -> (# Int#, Int# #)subIntC#infix4>#(>#)::Int#->Int#->Int#># :: Int# -> Int# -> Int#(>#)=Int# -> Int# -> Int#(>#)infix4>=#(>=#)::Int#->Int#->Int#>=# :: Int# -> Int# -> Int#(>=#)=Int# -> Int# -> Int#(>=#)infix4==#(==#)::Int#->Int#->Int#==# :: Int# -> Int# -> Int#(==#)=Int# -> Int# -> Int#(==#)infix4/=#(/=#)::Int#->Int#->Int#/=# :: Int# -> Int# -> Int#(/=#)=Int# -> Int# -> Int#(/=#)infix4<#(<#)::Int#->Int#->Int#<# :: Int# -> Int# -> Int#(<#)=Int# -> Int# -> Int#(<#)infix4<=#(<=#)::Int#->Int#->Int#<=# :: Int# -> Int# -> Int#(<=#)=Int# -> Int# -> Int#(<=#)chr#::Int#->Char#chr# :: Int# -> Char#chr#=Int# -> Char#chr#int2Word#::Int#->Word#int2Word# :: Int# -> Word#int2Word#=Int# -> Word#int2Word#{-|Convert an 'Int#' to the corresponding 'Float#' with the same    integral value (up to truncation due to floating-point precision). e.g.    @'int2Float#' 1# == 1.0#@-}int2Float#::Int#->Float#int2Float# :: Int# -> Float#int2Float#=Int# -> Float#int2Float#{-|Convert an 'Int#' to the corresponding 'Double#' with the same    integral value (up to truncation due to floating-point precision). e.g.    @'int2Double#' 1# == 1.0##@-}int2Double#::Int#->Double#int2Double# :: Int# -> Double#int2Double#=Int# -> Double#int2Double#{-|Convert an 'Word#' to the corresponding 'Float#' with the same    integral value (up to truncation due to floating-point precision). e.g.    @'word2Float#' 1## == 1.0#@-}word2Float#::Word#->Float#word2Float# :: Word# -> Float#word2Float#=Word# -> Float#word2Float#{-|Convert an 'Word#' to the corresponding 'Double#' with the same    integral value (up to truncation due to floating-point precision). e.g.    @'word2Double#' 1## == 1.0##@-}word2Double#::Word#->Double#word2Double# :: Word# -> Double#word2Double#=Word# -> Double#word2Double#{-|Shift left.  Result undefined if shift amount is not          in the range 0 to word size - 1 inclusive.-}uncheckedIShiftL#::Int#->Int#->Int#uncheckedIShiftL# :: Int# -> Int# -> Int#uncheckedIShiftL#=Int# -> Int# -> Int#uncheckedIShiftL#{-|Shift right arithmetic.  Result undefined if shift amount is not          in the range 0 to word size - 1 inclusive.-}uncheckedIShiftRA#::Int#->Int#->Int#uncheckedIShiftRA# :: Int# -> Int# -> Int#uncheckedIShiftRA#=Int# -> Int# -> Int#uncheckedIShiftRA#{-|Shift right logical.  Result undefined if shift amount is not          in the range 0 to word size - 1 inclusive.-}uncheckedIShiftRL#::Int#->Int#->Int#uncheckedIShiftRL# :: Int# -> Int# -> Int#uncheckedIShiftRL#=Int# -> Int# -> Int#uncheckedIShiftRL#dataWord#plusWord#::Word#->Word#->Word#plusWord# :: Word# -> Word# -> Word#plusWord#=Word# -> Word# -> Word#plusWord#{-|Add unsigned integers reporting overflow.          The first element of the pair is the result.  The second element is          the carry flag, which is nonzero on overflow. See also 'plusWord2#'.-}addWordC#::Word#->Word#->(#Word#,Int##)addWordC# :: Word# -> Word# -> (# Word#, Int# #)addWordC#=Word# -> Word# -> (# Word#, Int# #)addWordC#{-|Subtract unsigned integers reporting overflow.          The first element of the pair is the result.  The second element is          the carry flag, which is nonzero on overflow.-}subWordC#::Word#->Word#->(#Word#,Int##)subWordC# :: Word# -> Word# -> (# Word#, Int# #)subWordC#=Word# -> Word# -> (# Word#, Int# #)subWordC#{-|Add unsigned integers, with the high part (carry) in the first          component of the returned pair and the low part in the second          component of the pair. See also 'addWordC#'.-}plusWord2#::Word#->Word#->(#Word#,Word##)plusWord2# :: Word# -> Word# -> (# Word#, Word# #)plusWord2#=Word# -> Word# -> (# Word#, Word# #)plusWord2#minusWord#::Word#->Word#->Word#minusWord# :: Word# -> Word# -> Word#minusWord#=Word# -> Word# -> Word#minusWord#timesWord#::Word#->Word#->Word#timesWord# :: Word# -> Word# -> Word#timesWord#=Word# -> Word# -> Word#timesWord#timesWord2#::Word#->Word#->(#Word#,Word##)timesWord2# :: Word# -> Word# -> (# Word#, Word# #)timesWord2#=Word# -> Word# -> (# Word#, Word# #)timesWord2#quotWord#::Word#->Word#->Word#quotWord# :: Word# -> Word# -> Word#quotWord#=Word# -> Word# -> Word#quotWord#remWord#::Word#->Word#->Word#remWord# :: Word# -> Word# -> Word#remWord#=Word# -> Word# -> Word#remWord#quotRemWord#::Word#->Word#->(#Word#,Word##)quotRemWord# :: Word# -> Word# -> (# Word#, Word# #)quotRemWord#=Word# -> Word# -> (# Word#, Word# #)quotRemWord#{-| Takes high word of dividend, then low word of dividend, then divisor.           Requires that high word < divisor.-}quotRemWord2#::Word#->Word#->Word#->(#Word#,Word##)quotRemWord2# :: Word# -> Word# -> Word# -> (# Word#, Word# #)quotRemWord2#=Word# -> Word# -> Word# -> (# Word#, Word# #)quotRemWord2#and#::Word#->Word#->Word#and# :: Word# -> Word# -> Word#and#=Word# -> Word# -> Word#and#or#::Word#->Word#->Word#or# :: Word# -> Word# -> Word#or#=Word# -> Word# -> Word#or#xor#::Word#->Word#->Word#xor# :: Word# -> Word# -> Word#xor#=Word# -> Word# -> Word#xor#not#::Word#->Word#not# :: Word# -> Word#not#=Word# -> Word#not#{-|Shift left logical.   Result undefined if shift amount is not          in the range 0 to word size - 1 inclusive.-}uncheckedShiftL#::Word#->Int#->Word#uncheckedShiftL# :: Word# -> Int# -> Word#uncheckedShiftL#=Word# -> Int# -> Word#uncheckedShiftL#{-|Shift right logical.   Result undefined if shift  amount is not          in the range 0 to word size - 1 inclusive.-}uncheckedShiftRL#::Word#->Int#->Word#uncheckedShiftRL# :: Word# -> Int# -> Word#uncheckedShiftRL#=Word# -> Int# -> Word#uncheckedShiftRL#word2Int#::Word#->Int#word2Int# :: Word# -> Int#word2Int#=Word# -> Int#word2Int#gtWord#::Word#->Word#->Int#gtWord# :: Word# -> Word# -> Int#gtWord#=Word# -> Word# -> Int#gtWord#geWord#::Word#->Word#->Int#geWord# :: Word# -> Word# -> Int#geWord#=Word# -> Word# -> Int#geWord#eqWord#::Word#->Word#->Int#eqWord# :: Word# -> Word# -> Int#eqWord#=Word# -> Word# -> Int#eqWord#neWord#::Word#->Word#->Int#neWord# :: Word# -> Word# -> Int#neWord#=Word# -> Word# -> Int#neWord#ltWord#::Word#->Word#->Int#ltWord# :: Word# -> Word# -> Int#ltWord#=Word# -> Word# -> Int#ltWord#leWord#::Word#->Word#->Int#leWord# :: Word# -> Word# -> Int#leWord#=Word# -> Word# -> Int#leWord#{-|Count the number of set bits in the lower 8 bits of a word.-}popCnt8#::Word#->Word#popCnt8# :: Word# -> Word#popCnt8#=Word# -> Word#popCnt8#{-|Count the number of set bits in the lower 16 bits of a word.-}popCnt16#::Word#->Word#popCnt16# :: Word# -> Word#popCnt16#=Word# -> Word#popCnt16#{-|Count the number of set bits in the lower 32 bits of a word.-}popCnt32#::Word#->Word#popCnt32# :: Word# -> Word#popCnt32#=Word# -> Word#popCnt32#{-|Count the number of set bits in a 64-bit word.-}popCnt64#::Word64#->Word#popCnt64# :: Word64# -> Word#popCnt64#=Word64# -> Word#popCnt64#{-|Count the number of set bits in a word.-}popCnt#::Word#->Word#popCnt# :: Word# -> Word#popCnt#=Word# -> Word#popCnt#{-|Deposit bits to lower 8 bits of a word at locations specified by a mask.    @since 0.5.2.0-}pdep8#::Word#->Word#->Word#pdep8# :: Word# -> Word# -> Word#pdep8#=Word# -> Word# -> Word#pdep8#{-|Deposit bits to lower 16 bits of a word at locations specified by a mask.    @since 0.5.2.0-}pdep16#::Word#->Word#->Word#pdep16# :: Word# -> Word# -> Word#pdep16#=Word# -> Word# -> Word#pdep16#{-|Deposit bits to lower 32 bits of a word at locations specified by a mask.    @since 0.5.2.0-}pdep32#::Word#->Word#->Word#pdep32# :: Word# -> Word# -> Word#pdep32#=Word# -> Word# -> Word#pdep32#{-|Deposit bits to a word at locations specified by a mask.    @since 0.5.2.0-}pdep64#::Word64#->Word64#->Word64#pdep64# :: Word64# -> Word64# -> Word64#pdep64#=Word64# -> Word64# -> Word64#pdep64#{-|Deposit bits to a word at locations specified by a mask, aka    [parallel bit deposit](https://en.wikipedia.org/wiki/Bit_Manipulation_Instruction_Sets#Parallel_bit_deposit_and_extract).    Software emulation:    > pdep :: Word -> Word -> Word    > pdep src mask = go 0 src mask    >   where    >     go :: Word -> Word -> Word -> Word    >     go result _ 0 = result    >     go result src mask = go newResult newSrc newMask    >       where    >         maskCtz   = countTrailingZeros mask    >         newResult = if testBit src 0 then setBit result maskCtz else result    >         newSrc    = src `shiftR` 1    >         newMask   = clearBit mask maskCtz    @since 0.5.2.0-}pdep#::Word#->Word#->Word#pdep# :: Word# -> Word# -> Word#pdep#=Word# -> Word# -> Word#pdep#{-|Extract bits from lower 8 bits of a word at locations specified by a mask.    @since 0.5.2.0-}pext8#::Word#->Word#->Word#pext8# :: Word# -> Word# -> Word#pext8#=Word# -> Word# -> Word#pext8#{-|Extract bits from lower 16 bits of a word at locations specified by a mask.    @since 0.5.2.0-}pext16#::Word#->Word#->Word#pext16# :: Word# -> Word# -> Word#pext16#=Word# -> Word# -> Word#pext16#{-|Extract bits from lower 32 bits of a word at locations specified by a mask.    @since 0.5.2.0-}pext32#::Word#->Word#->Word#pext32# :: Word# -> Word# -> Word#pext32#=Word# -> Word# -> Word#pext32#{-|Extract bits from a word at locations specified by a mask.    @since 0.5.2.0-}pext64#::Word64#->Word64#->Word64#pext64# :: Word64# -> Word64# -> Word64#pext64#=Word64# -> Word64# -> Word64#pext64#{-|Extract bits from a word at locations specified by a mask, aka    [parallel bit extract](https://en.wikipedia.org/wiki/Bit_Manipulation_Instruction_Sets#Parallel_bit_deposit_and_extract).    Software emulation:    > pext :: Word -> Word -> Word    > pext src mask = loop 0 0 0    >   where    >     loop i count result    >       | i >= finiteBitSize (0 :: Word)    >       = result    >       | testBit mask i    >       = loop (i + 1) (count + 1) (if testBit src i then setBit result count else result)    >       | otherwise    >       = loop (i + 1) count result    @since 0.5.2.0-}pext#::Word#->Word#->Word#pext# :: Word# -> Word# -> Word#pext#=Word# -> Word# -> Word#pext#{-|Count leading zeros in the lower 8 bits of a word.-}clz8#::Word#->Word#clz8# :: Word# -> Word#clz8#=Word# -> Word#clz8#{-|Count leading zeros in the lower 16 bits of a word.-}clz16#::Word#->Word#clz16# :: Word# -> Word#clz16#=Word# -> Word#clz16#{-|Count leading zeros in the lower 32 bits of a word.-}clz32#::Word#->Word#clz32# :: Word# -> Word#clz32#=Word# -> Word#clz32#{-|Count leading zeros in a 64-bit word.-}clz64#::Word64#->Word#clz64# :: Word64# -> Word#clz64#=Word64# -> Word#clz64#{-|Count leading zeros in a word.-}clz#::Word#->Word#clz# :: Word# -> Word#clz#=Word# -> Word#clz#{-|Count trailing zeros in the lower 8 bits of a word.-}ctz8#::Word#->Word#ctz8# :: Word# -> Word#ctz8#=Word# -> Word#ctz8#{-|Count trailing zeros in the lower 16 bits of a word.-}ctz16#::Word#->Word#ctz16# :: Word# -> Word#ctz16#=Word# -> Word#ctz16#{-|Count trailing zeros in the lower 32 bits of a word.-}ctz32#::Word#->Word#ctz32# :: Word# -> Word#ctz32#=Word# -> Word#ctz32#{-|Count trailing zeros in a 64-bit word.-}ctz64#::Word64#->Word#ctz64# :: Word64# -> Word#ctz64#=Word64# -> Word#ctz64#{-|Count trailing zeros in a word.-}ctz#::Word#->Word#ctz# :: Word# -> Word#ctz#=Word# -> Word#ctz#{-|Swap bytes in the lower 16 bits of a word. The higher bytes are undefined. -}byteSwap16#::Word#->Word#byteSwap16# :: Word# -> Word#byteSwap16#=Word# -> Word#byteSwap16#{-|Swap bytes in the lower 32 bits of a word. The higher bytes are undefined. -}byteSwap32#::Word#->Word#byteSwap32# :: Word# -> Word#byteSwap32#=Word# -> Word#byteSwap32#{-|Swap bytes in a 64 bits of a word.-}byteSwap64#::Word64#->Word64#byteSwap64# :: Word64# -> Word64#byteSwap64#=Word64# -> Word64#byteSwap64#{-|Swap bytes in a word.-}byteSwap#::Word#->Word#byteSwap# :: Word# -> Word#byteSwap#=Word# -> Word#byteSwap#{-|Reverse the order of the bits in a 8-bit word.-}bitReverse8#::Word#->Word#bitReverse8# :: Word# -> Word#bitReverse8#=Word# -> Word#bitReverse8#{-|Reverse the order of the bits in a 16-bit word.-}bitReverse16#::Word#->Word#bitReverse16# :: Word# -> Word#bitReverse16#=Word# -> Word#bitReverse16#{-|Reverse the order of the bits in a 32-bit word.-}bitReverse32#::Word#->Word#bitReverse32# :: Word# -> Word#bitReverse32#=Word# -> Word#bitReverse32#{-|Reverse the order of the bits in a 64-bit word.-}bitReverse64#::Word64#->Word64#bitReverse64# :: Word64# -> Word64#bitReverse64#=Word64# -> Word64#bitReverse64#{-|Reverse the order of the bits in a word.-}bitReverse#::Word#->Word#bitReverse# :: Word# -> Word#bitReverse#=Word# -> Word#bitReverse#narrow8Int#::Int#->Int#narrow8Int# :: Int# -> Int#narrow8Int#=Int# -> Int#narrow8Int#narrow16Int#::Int#->Int#narrow16Int# :: Int# -> Int#narrow16Int#=Int# -> Int#narrow16Int#narrow32Int#::Int#->Int#narrow32Int# :: Int# -> Int#narrow32Int#=Int# -> Int#narrow32Int#narrow8Word#::Word#->Word#narrow8Word# :: Word# -> Word#narrow8Word#=Word# -> Word#narrow8Word#narrow16Word#::Word#->Word#narrow16Word# :: Word# -> Word#narrow16Word#=Word# -> Word#narrow16Word#narrow32Word#::Word#->Word#narrow32Word# :: Word# -> Word#narrow32Word#=Word# -> Word#narrow32Word#dataDouble#infix4>##(>##)::Double#->Double#->Int#>## :: Double# -> Double# -> Int#(>##)=Double# -> Double# -> Int#(>##)infix4>=##(>=##)::Double#->Double#->Int#>=## :: Double# -> Double# -> Int#(>=##)=Double# -> Double# -> Int#(>=##)infix4==##(==##)::Double#->Double#->Int#==## :: Double# -> Double# -> Int#(==##)=Double# -> Double# -> Int#(==##)infix4/=##(/=##)::Double#->Double#->Int#/=## :: Double# -> Double# -> Int#(/=##)=Double# -> Double# -> Int#(/=##)infix4<##(<##)::Double#->Double#->Int#<## :: Double# -> Double# -> Int#(<##)=Double# -> Double# -> Int#(<##)infix4<=##(<=##)::Double#->Double#->Int#<=## :: Double# -> Double# -> Int#(<=##)=Double# -> Double# -> Int#(<=##)infixl6+##(+##)::Double#->Double#->Double#+## :: Double# -> Double# -> Double#(+##)=Double# -> Double# -> Double#(+##)infixl6-##(-##)::Double#->Double#->Double#-## :: Double# -> Double# -> Double#(-##)=Double# -> Double# -> Double#(-##)infixl7*##(*##)::Double#->Double#->Double#*## :: Double# -> Double# -> Double#(*##)=Double# -> Double# -> Double#(*##)infixl7/##(/##)::Double#->Double#->Double#/## :: Double# -> Double# -> Double#(/##)=Double# -> Double# -> Double#(/##)negateDouble#::Double#->Double#negateDouble# :: Double# -> Double#negateDouble#=Double# -> Double#negateDouble#fabsDouble#::Double#->Double#fabsDouble# :: Double# -> Double#fabsDouble#=Double# -> Double#fabsDouble#{-|Truncates a 'Double#' value to the nearest 'Int#'.    Results are undefined if the truncation if truncation yields    a value outside the range of 'Int#'.-}double2Int#::Double#->Int#double2Int# :: Double# -> Int#double2Int#=Double# -> Int#double2Int#double2Float#::Double#->Float#double2Float# :: Double# -> Float#double2Float#=Double# -> Float#double2Float#expDouble#::Double#->Double#expDouble# :: Double# -> Double#expDouble#=Double# -> Double#expDouble#expm1Double#::Double#->Double#expm1Double# :: Double# -> Double#expm1Double#=Double# -> Double#expm1Double#logDouble#::Double#->Double#logDouble# :: Double# -> Double#logDouble#=Double# -> Double#logDouble#log1pDouble#::Double#->Double#log1pDouble# :: Double# -> Double#log1pDouble#=Double# -> Double#log1pDouble#sqrtDouble#::Double#->Double#sqrtDouble# :: Double# -> Double#sqrtDouble#=Double# -> Double#sqrtDouble#sinDouble#::Double#->Double#sinDouble# :: Double# -> Double#sinDouble#=Double# -> Double#sinDouble#cosDouble#::Double#->Double#cosDouble# :: Double# -> Double#cosDouble#=Double# -> Double#cosDouble#tanDouble#::Double#->Double#tanDouble# :: Double# -> Double#tanDouble#=Double# -> Double#tanDouble#asinDouble#::Double#->Double#asinDouble# :: Double# -> Double#asinDouble#=Double# -> Double#asinDouble#acosDouble#::Double#->Double#acosDouble# :: Double# -> Double#acosDouble#=Double# -> Double#acosDouble#atanDouble#::Double#->Double#atanDouble# :: Double# -> Double#atanDouble#=Double# -> Double#atanDouble#sinhDouble#::Double#->Double#sinhDouble# :: Double# -> Double#sinhDouble#=Double# -> Double#sinhDouble#coshDouble#::Double#->Double#coshDouble# :: Double# -> Double#coshDouble#=Double# -> Double#coshDouble#tanhDouble#::Double#->Double#tanhDouble# :: Double# -> Double#tanhDouble#=Double# -> Double#tanhDouble#asinhDouble#::Double#->Double#asinhDouble# :: Double# -> Double#asinhDouble#=Double# -> Double#asinhDouble#acoshDouble#::Double#->Double#acoshDouble# :: Double# -> Double#acoshDouble#=Double# -> Double#acoshDouble#atanhDouble#::Double#->Double#atanhDouble# :: Double# -> Double#atanhDouble#=Double# -> Double#atanhDouble#{-|Exponentiation.-}(**##)::Double#->Double#->Double#**## :: Double# -> Double# -> Double#(**##)=Double# -> Double# -> Double#(**##){-|Convert to integer.    First component of the result is -1 or 1, indicating the sign of the    mantissa. The next two are the high and low 32 bits of the mantissa    respectively, and the last is the exponent.-}decodeDouble_2Int#::Double#->(#Int#,Word#,Word#,Int##)decodeDouble_2Int# :: Double# -> (# Int#, Word#, Word#, Int# #)decodeDouble_2Int#=Double# -> (# Int#, Word#, Word#, Int# #)decodeDouble_2Int#{-|Decode 'Double#' into mantissa and base-2 exponent.-}decodeDouble_Int64#::Double#->(#Int64#,Int##)decodeDouble_Int64# :: Double# -> (# Int64#, Int# #)decodeDouble_Int64#=Double# -> (# Int64#, Int# #)decodeDouble_Int64#{-|Bitcast a 'Double#' into a 'Word64#'-}castDoubleToWord64#::Double#->Word64#castDoubleToWord64# :: Double# -> Word64#castDoubleToWord64#=Double# -> Word64#castDoubleToWord64#{-|Bitcast a 'Word64#' into a 'Double#'-}castWord64ToDouble#::Word64#->Double#castWord64ToDouble# :: Word64# -> Double#castWord64ToDouble#=Word64# -> Double#castWord64ToDouble#dataFloat#gtFloat#::Float#->Float#->Int#gtFloat# :: Float# -> Float# -> Int#gtFloat#=Float# -> Float# -> Int#gtFloat#geFloat#::Float#->Float#->Int#geFloat# :: Float# -> Float# -> Int#geFloat#=Float# -> Float# -> Int#geFloat#eqFloat#::Float#->Float#->Int#eqFloat# :: Float# -> Float# -> Int#eqFloat#=Float# -> Float# -> Int#eqFloat#neFloat#::Float#->Float#->Int#neFloat# :: Float# -> Float# -> Int#neFloat#=Float# -> Float# -> Int#neFloat#ltFloat#::Float#->Float#->Int#ltFloat# :: Float# -> Float# -> Int#ltFloat#=Float# -> Float# -> Int#ltFloat#leFloat#::Float#->Float#->Int#leFloat# :: Float# -> Float# -> Int#leFloat#=Float# -> Float# -> Int#leFloat#plusFloat#::Float#->Float#->Float#plusFloat# :: Float# -> Float# -> Float#plusFloat#=Float# -> Float# -> Float#plusFloat#minusFloat#::Float#->Float#->Float#minusFloat# :: Float# -> Float# -> Float#minusFloat#=Float# -> Float# -> Float#minusFloat#timesFloat#::Float#->Float#->Float#timesFloat# :: Float# -> Float# -> Float#timesFloat#=Float# -> Float# -> Float#timesFloat#divideFloat#::Float#->Float#->Float#divideFloat# :: Float# -> Float# -> Float#divideFloat#=Float# -> Float# -> Float#divideFloat#negateFloat#::Float#->Float#negateFloat# :: Float# -> Float#negateFloat#=Float# -> Float#negateFloat#fabsFloat#::Float#->Float#fabsFloat# :: Float# -> Float#fabsFloat#=Float# -> Float#fabsFloat#{-|Truncates a 'Float#' value to the nearest 'Int#'.    Results are undefined if the truncation if truncation yields    a value outside the range of 'Int#'.-}float2Int#::Float#->Int#float2Int# :: Float# -> Int#float2Int#=Float# -> Int#float2Int#expFloat#::Float#->Float#expFloat# :: Float# -> Float#expFloat#=Float# -> Float#expFloat#expm1Float#::Float#->Float#expm1Float# :: Float# -> Float#expm1Float#=Float# -> Float#expm1Float#logFloat#::Float#->Float#logFloat# :: Float# -> Float#logFloat#=Float# -> Float#logFloat#log1pFloat#::Float#->Float#log1pFloat# :: Float# -> Float#log1pFloat#=Float# -> Float#log1pFloat#sqrtFloat#::Float#->Float#sqrtFloat# :: Float# -> Float#sqrtFloat#=Float# -> Float#sqrtFloat#sinFloat#::Float#->Float#sinFloat# :: Float# -> Float#sinFloat#=Float# -> Float#sinFloat#cosFloat#::Float#->Float#cosFloat# :: Float# -> Float#cosFloat#=Float# -> Float#cosFloat#tanFloat#::Float#->Float#tanFloat# :: Float# -> Float#tanFloat#=Float# -> Float#tanFloat#asinFloat#::Float#->Float#asinFloat# :: Float# -> Float#asinFloat#=Float# -> Float#asinFloat#acosFloat#::Float#->Float#acosFloat# :: Float# -> Float#acosFloat#=Float# -> Float#acosFloat#atanFloat#::Float#->Float#atanFloat# :: Float# -> Float#atanFloat#=Float# -> Float#atanFloat#sinhFloat#::Float#->Float#sinhFloat# :: Float# -> Float#sinhFloat#=Float# -> Float#sinhFloat#coshFloat#::Float#->Float#coshFloat# :: Float# -> Float#coshFloat#=Float# -> Float#coshFloat#tanhFloat#::Float#->Float#tanhFloat# :: Float# -> Float#tanhFloat#=Float# -> Float#tanhFloat#asinhFloat#::Float#->Float#asinhFloat# :: Float# -> Float#asinhFloat#=Float# -> Float#asinhFloat#acoshFloat#::Float#->Float#acoshFloat# :: Float# -> Float#acoshFloat#=Float# -> Float#acoshFloat#atanhFloat#::Float#->Float#atanhFloat# :: Float# -> Float#atanhFloat#=Float# -> Float#atanhFloat#powerFloat#::Float#->Float#->Float#powerFloat# :: Float# -> Float# -> Float#powerFloat#=Float# -> Float# -> Float#powerFloat#float2Double#::Float#->Double#float2Double# :: Float# -> Double#float2Double#=Float# -> Double#float2Double#{-|Convert to integers.    First 'Int#' in result is the mantissa; second is the exponent.-}decodeFloat_Int#::Float#->(#Int#,Int##)decodeFloat_Int# :: Float# -> (# Int#, Int# #)decodeFloat_Int#=Float# -> (# Int#, Int# #)decodeFloat_Int#{-|Bitcast a 'Float#' into a 'Word32#'-}castFloatToWord32#::Float#->Word32#castFloatToWord32# :: Float# -> Word32#castFloatToWord32#=Float# -> Word32#castFloatToWord32#{-|Bitcast a 'Word32#' into a 'Float#'-}castWord32ToFloat#::Word32#->Float#castWord32ToFloat# :: Word32# -> Float#castWord32ToFloat#=Word32# -> Float#castWord32ToFloat#{-|Fused multiply-add operation @x*y+z@. See "GHC.Prim#fma".-}fmaddFloat#::Float#->Float#->Float#->Float#fmaddFloat# :: Float# -> Float# -> Float# -> Float#fmaddFloat#=Float# -> Float# -> Float# -> Float#fmaddFloat#{-|Fused multiply-subtract operation @x*y-z@. See "GHC.Prim#fma".-}fmsubFloat#::Float#->Float#->Float#->Float#fmsubFloat# :: Float# -> Float# -> Float# -> Float#fmsubFloat#=Float# -> Float# -> Float# -> Float#fmsubFloat#{-|Fused negate-multiply-add operation @-x*y+z@. See "GHC.Prim#fma".-}fnmaddFloat#::Float#->Float#->Float#->Float#fnmaddFloat# :: Float# -> Float# -> Float# -> Float#fnmaddFloat#=Float# -> Float# -> Float# -> Float#fnmaddFloat#{-|Fused negate-multiply-subtract operation @-x*y-z@. See "GHC.Prim#fma".-}fnmsubFloat#::Float#->Float#->Float#->Float#fnmsubFloat# :: Float# -> Float# -> Float# -> Float#fnmsubFloat#=Float# -> Float# -> Float# -> Float#fnmsubFloat#{-|Fused multiply-add operation @x*y+z@. See "GHC.Prim#fma".-}fmaddDouble#::Double#->Double#->Double#->Double#fmaddDouble# :: Double# -> Double# -> Double# -> Double#fmaddDouble#=Double# -> Double# -> Double# -> Double#fmaddDouble#{-|Fused multiply-subtract operation @x*y-z@. See "GHC.Prim#fma".-}fmsubDouble#::Double#->Double#->Double#->Double#fmsubDouble# :: Double# -> Double# -> Double# -> Double#fmsubDouble#=Double# -> Double# -> Double# -> Double#fmsubDouble#{-|Fused negate-multiply-add operation @-x*y+z@. See "GHC.Prim#fma".-}fnmaddDouble#::Double#->Double#->Double#->Double#fnmaddDouble# :: Double# -> Double# -> Double# -> Double#fnmaddDouble#=Double# -> Double# -> Double# -> Double#fnmaddDouble#{-|Fused negate-multiply-subtract operation @-x*y-z@. See "GHC.Prim#fma".-}fnmsubDouble#::Double#->Double#->Double#->Double#fnmsubDouble# :: Double# -> Double# -> Double# -> Double#fnmsubDouble#=Double# -> Double# -> Double# -> Double#fnmsubDouble#dataArray#adataMutableArray#sa{-|Create a new mutable array with the specified number of elements,    in the specified state thread,    with each element containing the specified initial value.-}newArray#::Int#->a_levpoly->State#s->(#State#s,MutableArray#sa_levpoly#)newArray# :: forall a_levpoly s.Int#-> a_levpoly-> State# s-> (# State# s, MutableArray# s a_levpoly #)newArray#=Int#-> a_levpoly-> State# s-> (# State# s, MutableArray# s a_levpoly #)forall a_levpoly s.Int#-> a_levpoly-> State# s-> (# State# s, MutableArray# s a_levpoly #)newArray#{-|Read from specified index of mutable array. Result is not yet evaluated.__/Warning:/__ this can fail with an unchecked exception.-}readArray#::MutableArray#sa_levpoly->Int#->State#s->(#State#s,a_levpoly#)readArray# :: forall s a_levpoly.MutableArray# s a_levpoly-> Int# -> State# s -> (# State# s, a_levpoly #)readArray#=MutableArray# s a_levpoly-> Int# -> State# s -> (# State# s, a_levpoly #)forall s a_levpoly.MutableArray# s a_levpoly-> Int# -> State# s -> (# State# s, a_levpoly #)readArray#{-|Write to specified index of mutable array.__/Warning:/__ this can fail with an unchecked exception.-}writeArray#::MutableArray#sa_levpoly->Int#->a_levpoly->State#s->State#swriteArray# :: forall s a_levpoly.MutableArray# s a_levpoly-> Int# -> a_levpoly -> State# s -> State# swriteArray#=MutableArray# s a_levpoly-> Int# -> a_levpoly -> State# s -> State# sforall s a_levpoly.MutableArray# s a_levpoly-> Int# -> a_levpoly -> State# s -> State# swriteArray#{-|Return the number of elements in the array.-}sizeofArray#::Array#a_levpoly->Int#sizeofArray# :: forall a_levpoly. Array# a_levpoly -> Int#sizeofArray#=Array# a_levpoly -> Int#forall a_levpoly. Array# a_levpoly -> Int#sizeofArray#{-|Return the number of elements in the array.-}sizeofMutableArray#::MutableArray#sa_levpoly->Int#sizeofMutableArray# :: forall s a_levpoly. MutableArray# s a_levpoly -> Int#sizeofMutableArray#=MutableArray# s a_levpoly -> Int#forall s a_levpoly. MutableArray# s a_levpoly -> Int#sizeofMutableArray#{-|Read from the specified index of an immutable array. The result is packaged    into an unboxed unary tuple; the result itself is not yet    evaluated. Pattern matching on the tuple forces the indexing of the    array to happen but does not evaluate the element itself. Evaluating    the thunk prevents additional thunks from building up on the    heap. Avoiding these thunks, in turn, reduces references to the    argument array, allowing it to be garbage collected more promptly.-}indexArray#::Array#a_levpoly->Int#->(#a_levpoly#)indexArray# :: forall a_levpoly. Array# a_levpoly -> Int# -> (# a_levpoly #)indexArray#=Array# a_levpoly -> Int# -> (# a_levpoly #)forall a_levpoly. Array# a_levpoly -> Int# -> (# a_levpoly #)indexArray#{-|Make a mutable array immutable, without copying.-}unsafeFreezeArray#::MutableArray#sa_levpoly->State#s->(#State#s,Array#a_levpoly#)unsafeFreezeArray# :: forall s a_levpoly.MutableArray# s a_levpoly-> State# s -> (# State# s, Array# a_levpoly #)unsafeFreezeArray#=MutableArray# s a_levpoly-> State# s -> (# State# s, Array# a_levpoly #)forall s a_levpoly.MutableArray# s a_levpoly-> State# s -> (# State# s, Array# a_levpoly #)unsafeFreezeArray#{-|Make an immutable array mutable, without copying.-}unsafeThawArray#::Array#a_levpoly->State#s->(#State#s,MutableArray#sa_levpoly#)unsafeThawArray# :: forall a_levpoly s.Array# a_levpoly-> State# s -> (# State# s, MutableArray# s a_levpoly #)unsafeThawArray#=Array# a_levpoly-> State# s -> (# State# s, MutableArray# s a_levpoly #)forall a_levpoly s.Array# a_levpoly-> State# s -> (# State# s, MutableArray# s a_levpoly #)unsafeThawArray#{-|Given a source array, an offset into the source array, a   destination array, an offset into the destination array, and a   number of elements to copy, copy the elements from the source array   to the destination array. Both arrays must fully contain the   specified ranges, but this is not checked. The two arrays must not   be the same array in different states, but this is not checked   either.__/Warning:/__ this can fail with an unchecked exception.-}copyArray#::Array#a_levpoly->Int#->MutableArray#sa_levpoly->Int#->Int#->State#s->State#scopyArray# :: forall a_levpoly s.Array# a_levpoly-> Int#-> MutableArray# s a_levpoly-> Int#-> Int#-> State# s-> State# scopyArray#=Array# a_levpoly-> Int#-> MutableArray# s a_levpoly-> Int#-> Int#-> State# s-> State# sforall a_levpoly s.Array# a_levpoly-> Int#-> MutableArray# s a_levpoly-> Int#-> Int#-> State# s-> State# scopyArray#{-|Given a source array, an offset into the source array, a   destination array, an offset into the destination array, and a   number of elements to copy, copy the elements from the source array   to the destination array. Both arrays must fully contain the   specified ranges, but this is not checked. In the case where   the source and destination are the same array the source and   destination regions may overlap.__/Warning:/__ this can fail with an unchecked exception.-}copyMutableArray#::MutableArray#sa_levpoly->Int#->MutableArray#sa_levpoly->Int#->Int#->State#s->State#scopyMutableArray# :: forall s a_levpoly.MutableArray# s a_levpoly-> Int#-> MutableArray# s a_levpoly-> Int#-> Int#-> State# s-> State# scopyMutableArray#=MutableArray# s a_levpoly-> Int#-> MutableArray# s a_levpoly-> Int#-> Int#-> State# s-> State# sforall s a_levpoly.MutableArray# s a_levpoly-> Int#-> MutableArray# s a_levpoly-> Int#-> Int#-> State# s-> State# scopyMutableArray#{-|Given a source array, an offset into the source array, and a number   of elements to copy, create a new array with the elements from the   source array. The provided array must fully contain the specified   range, but this is not checked.__/Warning:/__ this can fail with an unchecked exception.-}cloneArray#::Array#a_levpoly->Int#->Int#->Array#a_levpolycloneArray# :: forall a_levpoly.Array# a_levpoly -> Int# -> Int# -> Array# a_levpolycloneArray#=Array# a_levpoly -> Int# -> Int# -> Array# a_levpolyforall a_levpoly.Array# a_levpoly -> Int# -> Int# -> Array# a_levpolycloneArray#{-|Given a source array, an offset into the source array, and a number   of elements to copy, create a new array with the elements from the   source array. The provided array must fully contain the specified   range, but this is not checked.__/Warning:/__ this can fail with an unchecked exception.-}cloneMutableArray#::MutableArray#sa_levpoly->Int#->Int#->State#s->(#State#s,MutableArray#sa_levpoly#)cloneMutableArray# :: forall s a_levpoly.MutableArray# s a_levpoly-> Int#-> Int#-> State# s-> (# State# s, MutableArray# s a_levpoly #)cloneMutableArray#=MutableArray# s a_levpoly-> Int#-> Int#-> State# s-> (# State# s, MutableArray# s a_levpoly #)forall s a_levpoly.MutableArray# s a_levpoly-> Int#-> Int#-> State# s-> (# State# s, MutableArray# s a_levpoly #)cloneMutableArray#{-|Given a source array, an offset into the source array, and a number   of elements to copy, create a new array with the elements from the   source array. The provided array must fully contain the specified   range, but this is not checked.__/Warning:/__ this can fail with an unchecked exception.-}freezeArray#::MutableArray#sa_levpoly->Int#->Int#->State#s->(#State#s,Array#a_levpoly#)freezeArray# :: forall s a_levpoly.MutableArray# s a_levpoly-> Int# -> Int# -> State# s -> (# State# s, Array# a_levpoly #)freezeArray#=MutableArray# s a_levpoly-> Int# -> Int# -> State# s -> (# State# s, Array# a_levpoly #)forall s a_levpoly.MutableArray# s a_levpoly-> Int# -> Int# -> State# s -> (# State# s, Array# a_levpoly #)freezeArray#{-|Given a source array, an offset into the source array, and a number   of elements to copy, create a new array with the elements from the   source array. The provided array must fully contain the specified   range, but this is not checked.__/Warning:/__ this can fail with an unchecked exception.-}thawArray#::Array#a_levpoly->Int#->Int#->State#s->(#State#s,MutableArray#sa_levpoly#)thawArray# :: forall a_levpoly s.Array# a_levpoly-> Int#-> Int#-> State# s-> (# State# s, MutableArray# s a_levpoly #)thawArray#=Array# a_levpoly-> Int#-> Int#-> State# s-> (# State# s, MutableArray# s a_levpoly #)forall a_levpoly s.Array# a_levpoly-> Int#-> Int#-> State# s-> (# State# s, MutableArray# s a_levpoly #)thawArray#{-|Given an array, an offset, the expected old value, and    the new value, perform an atomic compare and swap (i.e. write the new    value if the current value and the old value are the same pointer).    Returns 0 if the swap succeeds and 1 if it fails. Additionally, returns    the element at the offset after the operation completes. This means that    on a success the new value is returned, and on a failure the actual old    value (not the expected one) is returned. Implies a full memory barrier.    The use of a pointer equality on a boxed value makes this function harder    to use correctly than 'casIntArray#'. All of the difficulties    of using 'reallyUnsafePtrEquality#' correctly apply to    'casArray#' as well.   __/Warning:/__ this can fail with an unchecked exception.-}casArray#::MutableArray#sa_levpoly->Int#->a_levpoly->a_levpoly->State#s->(#State#s,Int#,a_levpoly#)casArray# :: forall s a_levpoly.MutableArray# s a_levpoly-> Int#-> a_levpoly-> a_levpoly-> State# s-> (# State# s, Int#, a_levpoly #)casArray#=MutableArray# s a_levpoly-> Int#-> a_levpoly-> a_levpoly-> State# s-> (# State# s, Int#, a_levpoly #)forall s a_levpoly.MutableArray# s a_levpoly-> Int#-> a_levpoly-> a_levpoly-> State# s-> (# State# s, Int#, a_levpoly #)casArray#dataSmallArray#adataSmallMutableArray#sa{-|Create a new mutable array with the specified number of elements,    in the specified state thread,    with each element containing the specified initial value.-}newSmallArray#::Int#->a_levpoly->State#s->(#State#s,SmallMutableArray#sa_levpoly#)newSmallArray# :: forall a_levpoly s.Int#-> a_levpoly-> State# s-> (# State# s, SmallMutableArray# s a_levpoly #)newSmallArray#=Int#-> a_levpoly-> State# s-> (# State# s, SmallMutableArray# s a_levpoly #)forall a_levpoly s.Int#-> a_levpoly-> State# s-> (# State# s, SmallMutableArray# s a_levpoly #)newSmallArray#{-|Shrink mutable array to new specified size, in    the specified state thread. The new size argument must be less than or    equal to the current size as reported by 'getSizeofSmallMutableArray#'.    Assuming the non-profiling RTS, for the copying garbage collector    (default) this primitive compiles to an O(1) operation in C--, modifying    the array in-place. For the non-moving garbage collector, however, the    time is proportional to the number of elements shrinked out. Backends    bypassing C-- representation (such as JavaScript) might behave    differently.    @since 0.6.1__/Warning:/__ this can fail with an unchecked exception.-}shrinkSmallMutableArray#::SmallMutableArray#sa_levpoly->Int#->State#s->State#sshrinkSmallMutableArray# :: forall s a_levpoly.SmallMutableArray# s a_levpoly -> Int# -> State# s -> State# sshrinkSmallMutableArray#=SmallMutableArray# s a_levpoly -> Int# -> State# s -> State# sforall s a_levpoly.SmallMutableArray# s a_levpoly -> Int# -> State# s -> State# sshrinkSmallMutableArray#{-|Read from specified index of mutable array. Result is not yet evaluated.__/Warning:/__ this can fail with an unchecked exception.-}readSmallArray#::SmallMutableArray#sa_levpoly->Int#->State#s->(#State#s,a_levpoly#)readSmallArray# :: forall s a_levpoly.SmallMutableArray# s a_levpoly-> Int# -> State# s -> (# State# s, a_levpoly #)readSmallArray#=SmallMutableArray# s a_levpoly-> Int# -> State# s -> (# State# s, a_levpoly #)forall s a_levpoly.SmallMutableArray# s a_levpoly-> Int# -> State# s -> (# State# s, a_levpoly #)readSmallArray#{-|Write to specified index of mutable array.__/Warning:/__ this can fail with an unchecked exception.-}writeSmallArray#::SmallMutableArray#sa_levpoly->Int#->a_levpoly->State#s->State#swriteSmallArray# :: forall s a_levpoly.SmallMutableArray# s a_levpoly-> Int# -> a_levpoly -> State# s -> State# swriteSmallArray#=SmallMutableArray# s a_levpoly-> Int# -> a_levpoly -> State# s -> State# sforall s a_levpoly.SmallMutableArray# s a_levpoly-> Int# -> a_levpoly -> State# s -> State# swriteSmallArray#{-|Return the number of elements in the array.-}sizeofSmallArray#::SmallArray#a_levpoly->Int#sizeofSmallArray# :: forall a_levpoly. SmallArray# a_levpoly -> Int#sizeofSmallArray#=SmallArray# a_levpoly -> Int#forall a_levpoly. SmallArray# a_levpoly -> Int#sizeofSmallArray#{-|Return the number of elements in the array. __Deprecated__, it is   unsafe in the presence of 'shrinkSmallMutableArray#' and @resizeSmallMutableArray#@   operations on the same small mutable array.-}{-# DEPRECATEDsizeofSmallMutableArray#" Use 'getSizeofSmallMutableArray#' instead "#-}sizeofSmallMutableArray#::SmallMutableArray#sa_levpoly->Int#sizeofSmallMutableArray# :: forall s a_levpoly. SmallMutableArray# s a_levpoly -> Int#sizeofSmallMutableArray#=SmallMutableArray# s a_levpoly -> Int#forall s a_levpoly. SmallMutableArray# s a_levpoly -> Int#sizeofSmallMutableArray#{-|Return the number of elements in the array, correctly accounting for   the effect of 'shrinkSmallMutableArray#' and @resizeSmallMutableArray#@.   @since 0.6.1-}getSizeofSmallMutableArray#::SmallMutableArray#sa_levpoly->State#s->(#State#s,Int##)getSizeofSmallMutableArray# :: forall s a_levpoly.SmallMutableArray# s a_levpoly -> State# s -> (# State# s, Int# #)getSizeofSmallMutableArray#=SmallMutableArray# s a_levpoly -> State# s -> (# State# s, Int# #)forall s a_levpoly.SmallMutableArray# s a_levpoly -> State# s -> (# State# s, Int# #)getSizeofSmallMutableArray#{-|Read from specified index of immutable array. Result is packaged into    an unboxed singleton; the result itself is not yet evaluated.-}indexSmallArray#::SmallArray#a_levpoly->Int#->(#a_levpoly#)indexSmallArray# :: forall a_levpoly. SmallArray# a_levpoly -> Int# -> (# a_levpoly #)indexSmallArray#=SmallArray# a_levpoly -> Int# -> (# a_levpoly #)forall a_levpoly. SmallArray# a_levpoly -> Int# -> (# a_levpoly #)indexSmallArray#{-|Make a mutable array immutable, without copying.-}unsafeFreezeSmallArray#::SmallMutableArray#sa_levpoly->State#s->(#State#s,SmallArray#a_levpoly#)unsafeFreezeSmallArray# :: forall s a_levpoly.SmallMutableArray# s a_levpoly-> State# s -> (# State# s, SmallArray# a_levpoly #)unsafeFreezeSmallArray#=SmallMutableArray# s a_levpoly-> State# s -> (# State# s, SmallArray# a_levpoly #)forall s a_levpoly.SmallMutableArray# s a_levpoly-> State# s -> (# State# s, SmallArray# a_levpoly #)unsafeFreezeSmallArray#{-|Make an immutable array mutable, without copying.-}unsafeThawSmallArray#::SmallArray#a_levpoly->State#s->(#State#s,SmallMutableArray#sa_levpoly#)unsafeThawSmallArray# :: forall a_levpoly s.SmallArray# a_levpoly-> State# s -> (# State# s, SmallMutableArray# s a_levpoly #)unsafeThawSmallArray#=SmallArray# a_levpoly-> State# s -> (# State# s, SmallMutableArray# s a_levpoly #)forall a_levpoly s.SmallArray# a_levpoly-> State# s -> (# State# s, SmallMutableArray# s a_levpoly #)unsafeThawSmallArray#{-|Given a source array, an offset into the source array, a   destination array, an offset into the destination array, and a   number of elements to copy, copy the elements from the source array   to the destination array. Both arrays must fully contain the   specified ranges, but this is not checked. The two arrays must not   be the same array in different states, but this is not checked   either.__/Warning:/__ this can fail with an unchecked exception.-}copySmallArray#::SmallArray#a_levpoly->Int#->SmallMutableArray#sa_levpoly->Int#->Int#->State#s->State#scopySmallArray# :: forall a_levpoly s.SmallArray# a_levpoly-> Int#-> SmallMutableArray# s a_levpoly-> Int#-> Int#-> State# s-> State# scopySmallArray#=SmallArray# a_levpoly-> Int#-> SmallMutableArray# s a_levpoly-> Int#-> Int#-> State# s-> State# sforall a_levpoly s.SmallArray# a_levpoly-> Int#-> SmallMutableArray# s a_levpoly-> Int#-> Int#-> State# s-> State# scopySmallArray#{-|Given a source array, an offset into the source array, a   destination array, an offset into the destination array, and a   number of elements to copy, copy the elements from the source array   to the destination array. The source and destination arrays can   refer to the same array. Both arrays must fully contain the   specified ranges, but this is not checked.   The regions are allowed to overlap, although this is only possible when the same   array is provided as both the source and the destination. __/Warning:/__ this can fail with an unchecked exception.-}copySmallMutableArray#::SmallMutableArray#sa_levpoly->Int#->SmallMutableArray#sa_levpoly->Int#->Int#->State#s->State#scopySmallMutableArray# :: forall s a_levpoly.SmallMutableArray# s a_levpoly-> Int#-> SmallMutableArray# s a_levpoly-> Int#-> Int#-> State# s-> State# scopySmallMutableArray#=SmallMutableArray# s a_levpoly-> Int#-> SmallMutableArray# s a_levpoly-> Int#-> Int#-> State# s-> State# sforall s a_levpoly.SmallMutableArray# s a_levpoly-> Int#-> SmallMutableArray# s a_levpoly-> Int#-> Int#-> State# s-> State# scopySmallMutableArray#{-|Given a source array, an offset into the source array, and a number   of elements to copy, create a new array with the elements from the   source array. The provided array must fully contain the specified   range, but this is not checked.__/Warning:/__ this can fail with an unchecked exception.-}cloneSmallArray#::SmallArray#a_levpoly->Int#->Int#->SmallArray#a_levpolycloneSmallArray# :: forall a_levpoly.SmallArray# a_levpoly -> Int# -> Int# -> SmallArray# a_levpolycloneSmallArray#=SmallArray# a_levpoly -> Int# -> Int# -> SmallArray# a_levpolyforall a_levpoly.SmallArray# a_levpoly -> Int# -> Int# -> SmallArray# a_levpolycloneSmallArray#{-|Given a source array, an offset into the source array, and a number   of elements to copy, create a new array with the elements from the   source array. The provided array must fully contain the specified   range, but this is not checked.__/Warning:/__ this can fail with an unchecked exception.-}cloneSmallMutableArray#::SmallMutableArray#sa_levpoly->Int#->Int#->State#s->(#State#s,SmallMutableArray#sa_levpoly#)cloneSmallMutableArray# :: forall s a_levpoly.SmallMutableArray# s a_levpoly-> Int#-> Int#-> State# s-> (# State# s, SmallMutableArray# s a_levpoly #)cloneSmallMutableArray#=SmallMutableArray# s a_levpoly-> Int#-> Int#-> State# s-> (# State# s, SmallMutableArray# s a_levpoly #)forall s a_levpoly.SmallMutableArray# s a_levpoly-> Int#-> Int#-> State# s-> (# State# s, SmallMutableArray# s a_levpoly #)cloneSmallMutableArray#{-|Given a source array, an offset into the source array, and a number   of elements to copy, create a new array with the elements from the   source array. The provided array must fully contain the specified   range, but this is not checked.__/Warning:/__ this can fail with an unchecked exception.-}freezeSmallArray#::SmallMutableArray#sa_levpoly->Int#->Int#->State#s->(#State#s,SmallArray#a_levpoly#)freezeSmallArray# :: forall s a_levpoly.SmallMutableArray# s a_levpoly-> Int#-> Int#-> State# s-> (# State# s, SmallArray# a_levpoly #)freezeSmallArray#=SmallMutableArray# s a_levpoly-> Int#-> Int#-> State# s-> (# State# s, SmallArray# a_levpoly #)forall s a_levpoly.SmallMutableArray# s a_levpoly-> Int#-> Int#-> State# s-> (# State# s, SmallArray# a_levpoly #)freezeSmallArray#{-|Given a source array, an offset into the source array, and a number   of elements to copy, create a new array with the elements from the   source array. The provided array must fully contain the specified   range, but this is not checked.__/Warning:/__ this can fail with an unchecked exception.-}thawSmallArray#::SmallArray#a_levpoly->Int#->Int#->State#s->(#State#s,SmallMutableArray#sa_levpoly#)thawSmallArray# :: forall a_levpoly s.SmallArray# a_levpoly-> Int#-> Int#-> State# s-> (# State# s, SmallMutableArray# s a_levpoly #)thawSmallArray#=SmallArray# a_levpoly-> Int#-> Int#-> State# s-> (# State# s, SmallMutableArray# s a_levpoly #)forall a_levpoly s.SmallArray# a_levpoly-> Int#-> Int#-> State# s-> (# State# s, SmallMutableArray# s a_levpoly #)thawSmallArray#{-|Unsafe, machine-level atomic compare and swap on an element within an array.    See the documentation of 'casArray#'.__/Warning:/__ this can fail with an unchecked exception.-}casSmallArray#::SmallMutableArray#sa_levpoly->Int#->a_levpoly->a_levpoly->State#s->(#State#s,Int#,a_levpoly#)casSmallArray# :: forall s a_levpoly.SmallMutableArray# s a_levpoly-> Int#-> a_levpoly-> a_levpoly-> State# s-> (# State# s, Int#, a_levpoly #)casSmallArray#=SmallMutableArray# s a_levpoly-> Int#-> a_levpoly-> a_levpoly-> State# s-> (# State# s, Int#, a_levpoly #)forall s a_levpoly.SmallMutableArray# s a_levpoly-> Int#-> a_levpoly-> a_levpoly-> State# s-> (# State# s, Int#, a_levpoly #)casSmallArray#{-|  A boxed, unlifted datatype representing a region of raw memory in the garbage-collected heap,  which is not scanned for pointers during garbage collection.  It is created by freezing a 'MutableByteArray#' with 'unsafeFreezeByteArray#'.  Freezing is essentially a no-op, as 'MutableByteArray#' and 'ByteArray#' share the same heap structure under the hood.  The immutable and mutable variants are commonly used for scenarios requiring high-performance data structures,  like @Text@, @Primitive Vector@, @Unboxed Array@, and @ShortByteString@.  Another application of fundamental importance is 'Integer', which is backed by 'ByteArray#'.  The representation on the heap of a Byte Array is:  > +------------+-----------------+-----------------------+  > |            |                 |                       |  > |   HEADER   | SIZE (in bytes) |       PAYLOAD         |  > |            |                 |                       |  > +------------+-----------------+-----------------------+  To obtain a pointer to actual payload (e.g., for FFI purposes) use 'byteArrayContents#' or 'mutableByteArrayContents#'.  Alternatively, enabling the @UnliftedFFITypes@ extension  allows to mention 'ByteArray#' and 'MutableByteArray#' in FFI type signatures directly.-}dataByteArray#{-| A mutable 'ByteAray#'. It can be created in three ways:  * 'newByteArray#': Create an unpinned array.  * 'newPinnedByteArray#': This will create a pinned array,  * 'newAlignedPinnedByteArray#': This will create a pinned array, with a custom alignment.  Unpinned arrays can be moved around during garbage collection, so you must not store or pass pointers to these values  if there is a chance for the garbage collector to kick in. That said, even unpinned arrays can be passed to unsafe FFI calls,  because no garbage collection happens during these unsafe calls  (see [Guaranteed Call Safety](https://ghc.gitlab.haskell.org/ghc/doc/users_guide/exts/ffi.html#guaranteed-call-safety)  in the GHC Manual). For safe FFI calls, byte arrays must be not only pinned, but also kept alive by means of the keepAlive# function  for the duration of a call (that's because garbage collection cannot move a pinned array, but is free to scrap it altogether).-}dataMutableByteArray#s{-|Create a new mutable byte array of specified size (in bytes), in    the specified state thread. The size of the memory underlying the    array will be rounded up to the platform's word size.-}newByteArray#::Int#->State#s->(#State#s,MutableByteArray#s#)newByteArray# :: forall s. Int# -> State# s -> (# State# s, MutableByteArray# s #)newByteArray#=Int# -> State# s -> (# State# s, MutableByteArray# s #)forall s. Int# -> State# s -> (# State# s, MutableByteArray# s #)newByteArray#{-|Like 'newByteArray#' but GC guarantees not to move it.-}newPinnedByteArray#::Int#->State#s->(#State#s,MutableByteArray#s#)newPinnedByteArray# :: forall s. Int# -> State# s -> (# State# s, MutableByteArray# s #)newPinnedByteArray#=Int# -> State# s -> (# State# s, MutableByteArray# s #)forall s. Int# -> State# s -> (# State# s, MutableByteArray# s #)newPinnedByteArray#{-|Like 'newPinnedByteArray#' but allow specifying an arbitrary    alignment, which must be a power of two.__/Warning:/__ this can fail with an unchecked exception.-}newAlignedPinnedByteArray#::Int#->Int#->State#s->(#State#s,MutableByteArray#s#)newAlignedPinnedByteArray# :: forall s.Int# -> Int# -> State# s -> (# State# s, MutableByteArray# s #)newAlignedPinnedByteArray#=Int# -> Int# -> State# s -> (# State# s, MutableByteArray# s #)forall s.Int# -> Int# -> State# s -> (# State# s, MutableByteArray# s #)newAlignedPinnedByteArray#{-|Determine whether a 'MutableByteArray#' is guaranteed not to move   during GC.-}isMutableByteArrayPinned#::MutableByteArray#s->Int#isMutableByteArrayPinned# :: forall s. MutableByteArray# s -> Int#isMutableByteArrayPinned#=MutableByteArray# s -> Int#forall s. MutableByteArray# s -> Int#isMutableByteArrayPinned#{-|Determine whether a 'ByteArray#' is guaranteed not to move during GC.-}isByteArrayPinned#::ByteArray#->Int#isByteArrayPinned# :: ByteArray# -> Int#isByteArrayPinned#=ByteArray# -> Int#isByteArrayPinned#{-|Intended for use with pinned arrays; otherwise very unsafe!-}byteArrayContents#::ByteArray#->Addr#byteArrayContents# :: ByteArray# -> Addr#byteArrayContents#=ByteArray# -> Addr#byteArrayContents#{-|Intended for use with pinned arrays; otherwise very unsafe!-}mutableByteArrayContents#::MutableByteArray#s->Addr#mutableByteArrayContents# :: forall s. MutableByteArray# s -> Addr#mutableByteArrayContents#=MutableByteArray# s -> Addr#forall s. MutableByteArray# s -> Addr#mutableByteArrayContents#{-|Shrink mutable byte array to new specified size (in bytes), in    the specified state thread. The new size argument must be less than or    equal to the current size as reported by 'getSizeofMutableByteArray#'.    Assuming the non-profiling RTS, this primitive compiles to an O(1)    operation in C--, modifying the array in-place. Backends bypassing C--    representation (such as JavaScript) might behave differently.    @since 0.4.0.0__/Warning:/__ this can fail with an unchecked exception.-}shrinkMutableByteArray#::MutableByteArray#s->Int#->State#s->State#sshrinkMutableByteArray# :: forall s. MutableByteArray# s -> Int# -> State# s -> State# sshrinkMutableByteArray#=MutableByteArray# s -> Int# -> State# s -> State# sforall s. MutableByteArray# s -> Int# -> State# s -> State# sshrinkMutableByteArray#{-|Resize mutable byte array to new specified size (in bytes), shrinking or growing it.    The returned 'MutableByteArray#' is either the original    'MutableByteArray#' resized in-place or, if not possible, a newly    allocated (unpinned) 'MutableByteArray#' (with the original content    copied over).    To avoid undefined behaviour, the original 'MutableByteArray#' shall    not be accessed anymore after a 'resizeMutableByteArray#' has been    performed.  Moreover, no reference to the old one should be kept in order    to allow garbage collection of the original 'MutableByteArray#' in    case a new 'MutableByteArray#' had to be allocated.    @since 0.4.0.0-}resizeMutableByteArray#::MutableByteArray#s->Int#->State#s->(#State#s,MutableByteArray#s#)resizeMutableByteArray# :: forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, MutableByteArray# s #)resizeMutableByteArray#=MutableByteArray# s-> Int# -> State# s -> (# State# s, MutableByteArray# s #)forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, MutableByteArray# s #)resizeMutableByteArray#{-|Make a mutable byte array immutable, without copying.-}unsafeFreezeByteArray#::MutableByteArray#s->State#s->(#State#s,ByteArray##)unsafeFreezeByteArray# :: forall s.MutableByteArray# s -> State# s -> (# State# s, ByteArray# #)unsafeFreezeByteArray#=MutableByteArray# s -> State# s -> (# State# s, ByteArray# #)forall s.MutableByteArray# s -> State# s -> (# State# s, ByteArray# #)unsafeFreezeByteArray#{-|Make an immutable byte array mutable, without copying.    @since 0.12.0.0-}unsafeThawByteArray#::ByteArray#->State#s->(#State#s,MutableByteArray#s#)unsafeThawByteArray# :: forall s.ByteArray# -> State# s -> (# State# s, MutableByteArray# s #)unsafeThawByteArray#=ByteArray# -> State# s -> (# State# s, MutableByteArray# s #)forall s.ByteArray# -> State# s -> (# State# s, MutableByteArray# s #)unsafeThawByteArray#{-|Return the size of the array in bytes.-}sizeofByteArray#::ByteArray#->Int#sizeofByteArray# :: ByteArray# -> Int#sizeofByteArray#=ByteArray# -> Int#sizeofByteArray#{-|Return the size of the array in bytes. __Deprecated__, it is   unsafe in the presence of 'shrinkMutableByteArray#' and 'resizeMutableByteArray#'   operations on the same mutable byte   array.-}{-# DEPRECATEDsizeofMutableByteArray#" Use 'getSizeofMutableByteArray#' instead "#-}sizeofMutableByteArray#::MutableByteArray#s->Int#sizeofMutableByteArray# :: forall s. MutableByteArray# s -> Int#sizeofMutableByteArray#=MutableByteArray# s -> Int#forall s. MutableByteArray# s -> Int#sizeofMutableByteArray#{-|Return the number of elements in the array, correctly accounting for   the effect of 'shrinkMutableByteArray#' and 'resizeMutableByteArray#'.   @since 0.5.0.0-}getSizeofMutableByteArray#::MutableByteArray#s->State#s->(#State#s,Int##)getSizeofMutableByteArray# :: forall s. MutableByteArray# s -> State# s -> (# State# s, Int# #)getSizeofMutableByteArray#=MutableByteArray# s -> State# s -> (# State# s, Int# #)forall s. MutableByteArray# s -> State# s -> (# State# s, Int# #)getSizeofMutableByteArray#{-|Read an 8-bit character; offset in bytes.-}indexCharArray#::ByteArray#->Int#->Char#indexCharArray# :: ByteArray# -> Int# -> Char#indexCharArray#=ByteArray# -> Int# -> Char#indexCharArray#{-|Read a 32-bit character; offset in 4-byte words.-}indexWideCharArray#::ByteArray#->Int#->Char#indexWideCharArray# :: ByteArray# -> Int# -> Char#indexWideCharArray#=ByteArray# -> Int# -> Char#indexWideCharArray#{-|Read a word-sized integer; offset in machine words.-}indexIntArray#::ByteArray#->Int#->Int#indexIntArray# :: ByteArray# -> Int# -> Int#indexIntArray#=ByteArray# -> Int# -> Int#indexIntArray#{-|Read a word-sized unsigned integer; offset in machine words.-}indexWordArray#::ByteArray#->Int#->Word#indexWordArray# :: ByteArray# -> Int# -> Word#indexWordArray#=ByteArray# -> Int# -> Word#indexWordArray#{-|Read a machine address; offset in machine words.-}indexAddrArray#::ByteArray#->Int#->Addr#indexAddrArray# :: ByteArray# -> Int# -> Addr#indexAddrArray#=ByteArray# -> Int# -> Addr#indexAddrArray#{-|Read a single-precision floating-point value; offset in 4-byte words.-}indexFloatArray#::ByteArray#->Int#->Float#indexFloatArray# :: ByteArray# -> Int# -> Float#indexFloatArray#=ByteArray# -> Int# -> Float#indexFloatArray#{-|Read a double-precision floating-point value; offset in 8-byte words.-}indexDoubleArray#::ByteArray#->Int#->Double#indexDoubleArray# :: ByteArray# -> Int# -> Double#indexDoubleArray#=ByteArray# -> Int# -> Double#indexDoubleArray#{-|Read a 'StablePtr#' value; offset in machine words.-}indexStablePtrArray#::ByteArray#->Int#->StablePtr#aindexStablePtrArray# :: forall a. ByteArray# -> Int# -> StablePtr# aindexStablePtrArray#=ByteArray# -> Int# -> StablePtr# aforall a. ByteArray# -> Int# -> StablePtr# aindexStablePtrArray#{-|Read an 8-bit signed integer; offset in bytes.-}indexInt8Array#::ByteArray#->Int#->Int8#indexInt8Array# :: ByteArray# -> Int# -> Int8#indexInt8Array#=ByteArray# -> Int# -> Int8#indexInt8Array#{-|Read an 8-bit unsigned integer; offset in bytes.-}indexWord8Array#::ByteArray#->Int#->Word8#indexWord8Array# :: ByteArray# -> Int# -> Word8#indexWord8Array#=ByteArray# -> Int# -> Word8#indexWord8Array#{-|Read a 16-bit signed integer; offset in 2-byte words.-}indexInt16Array#::ByteArray#->Int#->Int16#indexInt16Array# :: ByteArray# -> Int# -> Int16#indexInt16Array#=ByteArray# -> Int# -> Int16#indexInt16Array#{-|Read a 16-bit unsigned integer; offset in 2-byte words.-}indexWord16Array#::ByteArray#->Int#->Word16#indexWord16Array# :: ByteArray# -> Int# -> Word16#indexWord16Array#=ByteArray# -> Int# -> Word16#indexWord16Array#{-|Read a 32-bit signed integer; offset in 4-byte words.-}indexInt32Array#::ByteArray#->Int#->Int32#indexInt32Array# :: ByteArray# -> Int# -> Int32#indexInt32Array#=ByteArray# -> Int# -> Int32#indexInt32Array#{-|Read a 32-bit unsigned integer; offset in 4-byte words.-}indexWord32Array#::ByteArray#->Int#->Word32#indexWord32Array# :: ByteArray# -> Int# -> Word32#indexWord32Array#=ByteArray# -> Int# -> Word32#indexWord32Array#{-|Read a 64-bit signed integer; offset in 8-byte words.-}indexInt64Array#::ByteArray#->Int#->Int64#indexInt64Array# :: ByteArray# -> Int# -> Int64#indexInt64Array#=ByteArray# -> Int# -> Int64#indexInt64Array#{-|Read a 64-bit unsigned integer; offset in 8-byte words.-}indexWord64Array#::ByteArray#->Int#->Word64#indexWord64Array# :: ByteArray# -> Int# -> Word64#indexWord64Array#=ByteArray# -> Int# -> Word64#indexWord64Array#{-|Read an 8-bit character; offset in bytes.-}indexWord8ArrayAsChar#::ByteArray#->Int#->Char#indexWord8ArrayAsChar# :: ByteArray# -> Int# -> Char#indexWord8ArrayAsChar#=ByteArray# -> Int# -> Char#indexWord8ArrayAsChar#{-|Read a 32-bit character; offset in bytes.-}indexWord8ArrayAsWideChar#::ByteArray#->Int#->Char#indexWord8ArrayAsWideChar# :: ByteArray# -> Int# -> Char#indexWord8ArrayAsWideChar#=ByteArray# -> Int# -> Char#indexWord8ArrayAsWideChar#{-|Read a word-sized integer; offset in bytes.-}indexWord8ArrayAsInt#::ByteArray#->Int#->Int#indexWord8ArrayAsInt# :: ByteArray# -> Int# -> Int#indexWord8ArrayAsInt#=ByteArray# -> Int# -> Int#indexWord8ArrayAsInt#{-|Read a word-sized unsigned integer; offset in bytes.-}indexWord8ArrayAsWord#::ByteArray#->Int#->Word#indexWord8ArrayAsWord# :: ByteArray# -> Int# -> Word#indexWord8ArrayAsWord#=ByteArray# -> Int# -> Word#indexWord8ArrayAsWord#{-|Read a machine address; offset in bytes.-}indexWord8ArrayAsAddr#::ByteArray#->Int#->Addr#indexWord8ArrayAsAddr# :: ByteArray# -> Int# -> Addr#indexWord8ArrayAsAddr#=ByteArray# -> Int# -> Addr#indexWord8ArrayAsAddr#{-|Read a single-precision floating-point value; offset in bytes.-}indexWord8ArrayAsFloat#::ByteArray#->Int#->Float#indexWord8ArrayAsFloat# :: ByteArray# -> Int# -> Float#indexWord8ArrayAsFloat#=ByteArray# -> Int# -> Float#indexWord8ArrayAsFloat#{-|Read a double-precision floating-point value; offset in bytes.-}indexWord8ArrayAsDouble#::ByteArray#->Int#->Double#indexWord8ArrayAsDouble# :: ByteArray# -> Int# -> Double#indexWord8ArrayAsDouble#=ByteArray# -> Int# -> Double#indexWord8ArrayAsDouble#{-|Read a 'StablePtr#' value; offset in bytes.-}indexWord8ArrayAsStablePtr#::ByteArray#->Int#->StablePtr#aindexWord8ArrayAsStablePtr# :: forall a. ByteArray# -> Int# -> StablePtr# aindexWord8ArrayAsStablePtr#=ByteArray# -> Int# -> StablePtr# aforall a. ByteArray# -> Int# -> StablePtr# aindexWord8ArrayAsStablePtr#{-|Read a 16-bit signed integer; offset in bytes.-}indexWord8ArrayAsInt16#::ByteArray#->Int#->Int16#indexWord8ArrayAsInt16# :: ByteArray# -> Int# -> Int16#indexWord8ArrayAsInt16#=ByteArray# -> Int# -> Int16#indexWord8ArrayAsInt16#{-|Read a 16-bit unsigned integer; offset in bytes.-}indexWord8ArrayAsWord16#::ByteArray#->Int#->Word16#indexWord8ArrayAsWord16# :: ByteArray# -> Int# -> Word16#indexWord8ArrayAsWord16#=ByteArray# -> Int# -> Word16#indexWord8ArrayAsWord16#{-|Read a 32-bit signed integer; offset in bytes.-}indexWord8ArrayAsInt32#::ByteArray#->Int#->Int32#indexWord8ArrayAsInt32# :: ByteArray# -> Int# -> Int32#indexWord8ArrayAsInt32#=ByteArray# -> Int# -> Int32#indexWord8ArrayAsInt32#{-|Read a 32-bit unsigned integer; offset in bytes.-}indexWord8ArrayAsWord32#::ByteArray#->Int#->Word32#indexWord8ArrayAsWord32# :: ByteArray# -> Int# -> Word32#indexWord8ArrayAsWord32#=ByteArray# -> Int# -> Word32#indexWord8ArrayAsWord32#{-|Read a 64-bit signed integer; offset in bytes.-}indexWord8ArrayAsInt64#::ByteArray#->Int#->Int64#indexWord8ArrayAsInt64# :: ByteArray# -> Int# -> Int64#indexWord8ArrayAsInt64#=ByteArray# -> Int# -> Int64#indexWord8ArrayAsInt64#{-|Read a 64-bit unsigned integer; offset in bytes.-}indexWord8ArrayAsWord64#::ByteArray#->Int#->Word64#indexWord8ArrayAsWord64# :: ByteArray# -> Int# -> Word64#indexWord8ArrayAsWord64#=ByteArray# -> Int# -> Word64#indexWord8ArrayAsWord64#{-|Read an 8-bit character; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}readCharArray#::MutableByteArray#s->Int#->State#s->(#State#s,Char##)readCharArray# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Char# #)readCharArray#=MutableByteArray# s -> Int# -> State# s -> (# State# s, Char# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Char# #)readCharArray#{-|Read a 32-bit character; offset in 4-byte words.__/Warning:/__ this can fail with an unchecked exception.-}readWideCharArray#::MutableByteArray#s->Int#->State#s->(#State#s,Char##)readWideCharArray# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Char# #)readWideCharArray#=MutableByteArray# s -> Int# -> State# s -> (# State# s, Char# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Char# #)readWideCharArray#{-|Read a word-sized integer; offset in machine words.__/Warning:/__ this can fail with an unchecked exception.-}readIntArray#::MutableByteArray#s->Int#->State#s->(#State#s,Int##)readIntArray# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int# #)readIntArray#=MutableByteArray# s -> Int# -> State# s -> (# State# s, Int# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int# #)readIntArray#{-|Read a word-sized unsigned integer; offset in machine words.__/Warning:/__ this can fail with an unchecked exception.-}readWordArray#::MutableByteArray#s->Int#->State#s->(#State#s,Word##)readWordArray# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Word# #)readWordArray#=MutableByteArray# s -> Int# -> State# s -> (# State# s, Word# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Word# #)readWordArray#{-|Read a machine address; offset in machine words.__/Warning:/__ this can fail with an unchecked exception.-}readAddrArray#::MutableByteArray#s->Int#->State#s->(#State#s,Addr##)readAddrArray# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Addr# #)readAddrArray#=MutableByteArray# s -> Int# -> State# s -> (# State# s, Addr# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Addr# #)readAddrArray#{-|Read a single-precision floating-point value; offset in 4-byte words.__/Warning:/__ this can fail with an unchecked exception.-}readFloatArray#::MutableByteArray#s->Int#->State#s->(#State#s,Float##)readFloatArray# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Float# #)readFloatArray#=MutableByteArray# s -> Int# -> State# s -> (# State# s, Float# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Float# #)readFloatArray#{-|Read a double-precision floating-point value; offset in 8-byte words.__/Warning:/__ this can fail with an unchecked exception.-}readDoubleArray#::MutableByteArray#s->Int#->State#s->(#State#s,Double##)readDoubleArray# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Double# #)readDoubleArray#=MutableByteArray# s -> Int# -> State# s -> (# State# s, Double# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Double# #)readDoubleArray#{-|Read a 'StablePtr#' value; offset in machine words.__/Warning:/__ this can fail with an unchecked exception.-}readStablePtrArray#::MutableByteArray#s->Int#->State#s->(#State#s,StablePtr#a#)readStablePtrArray# :: forall s a.MutableByteArray# s-> Int# -> State# s -> (# State# s, StablePtr# a #)readStablePtrArray#=MutableByteArray# s-> Int# -> State# s -> (# State# s, StablePtr# a #)forall s a.MutableByteArray# s-> Int# -> State# s -> (# State# s, StablePtr# a #)readStablePtrArray#{-|Read an 8-bit signed integer; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}readInt8Array#::MutableByteArray#s->Int#->State#s->(#State#s,Int8##)readInt8Array# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int8# #)readInt8Array#=MutableByteArray# s -> Int# -> State# s -> (# State# s, Int8# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int8# #)readInt8Array#{-|Read an 8-bit unsigned integer; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}readWord8Array#::MutableByteArray#s->Int#->State#s->(#State#s,Word8##)readWord8Array# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Word8# #)readWord8Array#=MutableByteArray# s -> Int# -> State# s -> (# State# s, Word8# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Word8# #)readWord8Array#{-|Read a 16-bit signed integer; offset in 2-byte words.__/Warning:/__ this can fail with an unchecked exception.-}readInt16Array#::MutableByteArray#s->Int#->State#s->(#State#s,Int16##)readInt16Array# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int16# #)readInt16Array#=MutableByteArray# s -> Int# -> State# s -> (# State# s, Int16# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int16# #)readInt16Array#{-|Read a 16-bit unsigned integer; offset in 2-byte words.__/Warning:/__ this can fail with an unchecked exception.-}readWord16Array#::MutableByteArray#s->Int#->State#s->(#State#s,Word16##)readWord16Array# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Word16# #)readWord16Array#=MutableByteArray# s -> Int# -> State# s -> (# State# s, Word16# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Word16# #)readWord16Array#{-|Read a 32-bit signed integer; offset in 4-byte words.__/Warning:/__ this can fail with an unchecked exception.-}readInt32Array#::MutableByteArray#s->Int#->State#s->(#State#s,Int32##)readInt32Array# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int32# #)readInt32Array#=MutableByteArray# s -> Int# -> State# s -> (# State# s, Int32# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int32# #)readInt32Array#{-|Read a 32-bit unsigned integer; offset in 4-byte words.__/Warning:/__ this can fail with an unchecked exception.-}readWord32Array#::MutableByteArray#s->Int#->State#s->(#State#s,Word32##)readWord32Array# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Word32# #)readWord32Array#=MutableByteArray# s -> Int# -> State# s -> (# State# s, Word32# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Word32# #)readWord32Array#{-|Read a 64-bit signed integer; offset in 8-byte words.__/Warning:/__ this can fail with an unchecked exception.-}readInt64Array#::MutableByteArray#s->Int#->State#s->(#State#s,Int64##)readInt64Array# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int64# #)readInt64Array#=MutableByteArray# s -> Int# -> State# s -> (# State# s, Int64# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int64# #)readInt64Array#{-|Read a 64-bit unsigned integer; offset in 8-byte words.__/Warning:/__ this can fail with an unchecked exception.-}readWord64Array#::MutableByteArray#s->Int#->State#s->(#State#s,Word64##)readWord64Array# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Word64# #)readWord64Array#=MutableByteArray# s -> Int# -> State# s -> (# State# s, Word64# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Word64# #)readWord64Array#{-|Read an 8-bit character; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}readWord8ArrayAsChar#::MutableByteArray#s->Int#->State#s->(#State#s,Char##)readWord8ArrayAsChar# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Char# #)readWord8ArrayAsChar#=MutableByteArray# s -> Int# -> State# s -> (# State# s, Char# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Char# #)readWord8ArrayAsChar#{-|Read a 32-bit character; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}readWord8ArrayAsWideChar#::MutableByteArray#s->Int#->State#s->(#State#s,Char##)readWord8ArrayAsWideChar# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Char# #)readWord8ArrayAsWideChar#=MutableByteArray# s -> Int# -> State# s -> (# State# s, Char# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Char# #)readWord8ArrayAsWideChar#{-|Read a word-sized integer; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}readWord8ArrayAsInt#::MutableByteArray#s->Int#->State#s->(#State#s,Int##)readWord8ArrayAsInt# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int# #)readWord8ArrayAsInt#=MutableByteArray# s -> Int# -> State# s -> (# State# s, Int# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int# #)readWord8ArrayAsInt#{-|Read a word-sized unsigned integer; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}readWord8ArrayAsWord#::MutableByteArray#s->Int#->State#s->(#State#s,Word##)readWord8ArrayAsWord# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Word# #)readWord8ArrayAsWord#=MutableByteArray# s -> Int# -> State# s -> (# State# s, Word# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Word# #)readWord8ArrayAsWord#{-|Read a machine address; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}readWord8ArrayAsAddr#::MutableByteArray#s->Int#->State#s->(#State#s,Addr##)readWord8ArrayAsAddr# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Addr# #)readWord8ArrayAsAddr#=MutableByteArray# s -> Int# -> State# s -> (# State# s, Addr# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Addr# #)readWord8ArrayAsAddr#{-|Read a single-precision floating-point value; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}readWord8ArrayAsFloat#::MutableByteArray#s->Int#->State#s->(#State#s,Float##)readWord8ArrayAsFloat# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Float# #)readWord8ArrayAsFloat#=MutableByteArray# s -> Int# -> State# s -> (# State# s, Float# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Float# #)readWord8ArrayAsFloat#{-|Read a double-precision floating-point value; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}readWord8ArrayAsDouble#::MutableByteArray#s->Int#->State#s->(#State#s,Double##)readWord8ArrayAsDouble# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Double# #)readWord8ArrayAsDouble#=MutableByteArray# s -> Int# -> State# s -> (# State# s, Double# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Double# #)readWord8ArrayAsDouble#{-|Read a 'StablePtr#' value; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}readWord8ArrayAsStablePtr#::MutableByteArray#s->Int#->State#s->(#State#s,StablePtr#a#)readWord8ArrayAsStablePtr# :: forall s a.MutableByteArray# s-> Int# -> State# s -> (# State# s, StablePtr# a #)readWord8ArrayAsStablePtr#=MutableByteArray# s-> Int# -> State# s -> (# State# s, StablePtr# a #)forall s a.MutableByteArray# s-> Int# -> State# s -> (# State# s, StablePtr# a #)readWord8ArrayAsStablePtr#{-|Read a 16-bit signed integer; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}readWord8ArrayAsInt16#::MutableByteArray#s->Int#->State#s->(#State#s,Int16##)readWord8ArrayAsInt16# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int16# #)readWord8ArrayAsInt16#=MutableByteArray# s -> Int# -> State# s -> (# State# s, Int16# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int16# #)readWord8ArrayAsInt16#{-|Read a 16-bit unsigned integer; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}readWord8ArrayAsWord16#::MutableByteArray#s->Int#->State#s->(#State#s,Word16##)readWord8ArrayAsWord16# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Word16# #)readWord8ArrayAsWord16#=MutableByteArray# s -> Int# -> State# s -> (# State# s, Word16# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Word16# #)readWord8ArrayAsWord16#{-|Read a 32-bit signed integer; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}readWord8ArrayAsInt32#::MutableByteArray#s->Int#->State#s->(#State#s,Int32##)readWord8ArrayAsInt32# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int32# #)readWord8ArrayAsInt32#=MutableByteArray# s -> Int# -> State# s -> (# State# s, Int32# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int32# #)readWord8ArrayAsInt32#{-|Read a 32-bit unsigned integer; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}readWord8ArrayAsWord32#::MutableByteArray#s->Int#->State#s->(#State#s,Word32##)readWord8ArrayAsWord32# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Word32# #)readWord8ArrayAsWord32#=MutableByteArray# s -> Int# -> State# s -> (# State# s, Word32# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Word32# #)readWord8ArrayAsWord32#{-|Read a 64-bit signed integer; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}readWord8ArrayAsInt64#::MutableByteArray#s->Int#->State#s->(#State#s,Int64##)readWord8ArrayAsInt64# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int64# #)readWord8ArrayAsInt64#=MutableByteArray# s -> Int# -> State# s -> (# State# s, Int64# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int64# #)readWord8ArrayAsInt64#{-|Read a 64-bit unsigned integer; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}readWord8ArrayAsWord64#::MutableByteArray#s->Int#->State#s->(#State#s,Word64##)readWord8ArrayAsWord64# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Word64# #)readWord8ArrayAsWord64#=MutableByteArray# s -> Int# -> State# s -> (# State# s, Word64# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Word64# #)readWord8ArrayAsWord64#{-|Write an 8-bit character; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}writeCharArray#::MutableByteArray#s->Int#->Char#->State#s->State#swriteCharArray# :: forall s.MutableByteArray# s -> Int# -> Char# -> State# s -> State# swriteCharArray#=MutableByteArray# s -> Int# -> Char# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Char# -> State# s -> State# swriteCharArray#{-|Write a 32-bit character; offset in 4-byte words.__/Warning:/__ this can fail with an unchecked exception.-}writeWideCharArray#::MutableByteArray#s->Int#->Char#->State#s->State#swriteWideCharArray# :: forall s.MutableByteArray# s -> Int# -> Char# -> State# s -> State# swriteWideCharArray#=MutableByteArray# s -> Int# -> Char# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Char# -> State# s -> State# swriteWideCharArray#{-|Write a word-sized integer; offset in machine words.__/Warning:/__ this can fail with an unchecked exception.-}writeIntArray#::MutableByteArray#s->Int#->Int#->State#s->State#swriteIntArray# :: forall s.MutableByteArray# s -> Int# -> Int# -> State# s -> State# swriteIntArray#=MutableByteArray# s -> Int# -> Int# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Int# -> State# s -> State# swriteIntArray#{-|Write a word-sized unsigned integer; offset in machine words.__/Warning:/__ this can fail with an unchecked exception.-}writeWordArray#::MutableByteArray#s->Int#->Word#->State#s->State#swriteWordArray# :: forall s.MutableByteArray# s -> Int# -> Word# -> State# s -> State# swriteWordArray#=MutableByteArray# s -> Int# -> Word# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Word# -> State# s -> State# swriteWordArray#{-|Write a machine address; offset in machine words.__/Warning:/__ this can fail with an unchecked exception.-}writeAddrArray#::MutableByteArray#s->Int#->Addr#->State#s->State#swriteAddrArray# :: forall s.MutableByteArray# s -> Int# -> Addr# -> State# s -> State# swriteAddrArray#=MutableByteArray# s -> Int# -> Addr# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Addr# -> State# s -> State# swriteAddrArray#{-|Write a single-precision floating-point value; offset in 4-byte words.__/Warning:/__ this can fail with an unchecked exception.-}writeFloatArray#::MutableByteArray#s->Int#->Float#->State#s->State#swriteFloatArray# :: forall s.MutableByteArray# s -> Int# -> Float# -> State# s -> State# swriteFloatArray#=MutableByteArray# s -> Int# -> Float# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Float# -> State# s -> State# swriteFloatArray#{-|Write a double-precision floating-point value; offset in 8-byte words.__/Warning:/__ this can fail with an unchecked exception.-}writeDoubleArray#::MutableByteArray#s->Int#->Double#->State#s->State#swriteDoubleArray# :: forall s.MutableByteArray# s -> Int# -> Double# -> State# s -> State# swriteDoubleArray#=MutableByteArray# s -> Int# -> Double# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Double# -> State# s -> State# swriteDoubleArray#{-|Write a 'StablePtr#' value; offset in machine words.__/Warning:/__ this can fail with an unchecked exception.-}writeStablePtrArray#::MutableByteArray#s->Int#->StablePtr#a->State#s->State#swriteStablePtrArray# :: forall s a.MutableByteArray# s -> Int# -> StablePtr# a -> State# s -> State# swriteStablePtrArray#=MutableByteArray# s -> Int# -> StablePtr# a -> State# s -> State# sforall s a.MutableByteArray# s -> Int# -> StablePtr# a -> State# s -> State# swriteStablePtrArray#{-|Write an 8-bit signed integer; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}writeInt8Array#::MutableByteArray#s->Int#->Int8#->State#s->State#swriteInt8Array# :: forall s.MutableByteArray# s -> Int# -> Int8# -> State# s -> State# swriteInt8Array#=MutableByteArray# s -> Int# -> Int8# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Int8# -> State# s -> State# swriteInt8Array#{-|Write an 8-bit unsigned integer; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}writeWord8Array#::MutableByteArray#s->Int#->Word8#->State#s->State#swriteWord8Array# :: forall s.MutableByteArray# s -> Int# -> Word8# -> State# s -> State# swriteWord8Array#=MutableByteArray# s -> Int# -> Word8# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Word8# -> State# s -> State# swriteWord8Array#{-|Write a 16-bit signed integer; offset in 2-byte words.__/Warning:/__ this can fail with an unchecked exception.-}writeInt16Array#::MutableByteArray#s->Int#->Int16#->State#s->State#swriteInt16Array# :: forall s.MutableByteArray# s -> Int# -> Int16# -> State# s -> State# swriteInt16Array#=MutableByteArray# s -> Int# -> Int16# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Int16# -> State# s -> State# swriteInt16Array#{-|Write a 16-bit unsigned integer; offset in 2-byte words.__/Warning:/__ this can fail with an unchecked exception.-}writeWord16Array#::MutableByteArray#s->Int#->Word16#->State#s->State#swriteWord16Array# :: forall s.MutableByteArray# s -> Int# -> Word16# -> State# s -> State# swriteWord16Array#=MutableByteArray# s -> Int# -> Word16# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Word16# -> State# s -> State# swriteWord16Array#{-|Write a 32-bit signed integer; offset in 4-byte words.__/Warning:/__ this can fail with an unchecked exception.-}writeInt32Array#::MutableByteArray#s->Int#->Int32#->State#s->State#swriteInt32Array# :: forall s.MutableByteArray# s -> Int# -> Int32# -> State# s -> State# swriteInt32Array#=MutableByteArray# s -> Int# -> Int32# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Int32# -> State# s -> State# swriteInt32Array#{-|Write a 32-bit unsigned integer; offset in 4-byte words.__/Warning:/__ this can fail with an unchecked exception.-}writeWord32Array#::MutableByteArray#s->Int#->Word32#->State#s->State#swriteWord32Array# :: forall s.MutableByteArray# s -> Int# -> Word32# -> State# s -> State# swriteWord32Array#=MutableByteArray# s -> Int# -> Word32# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Word32# -> State# s -> State# swriteWord32Array#{-|Write a 64-bit signed integer; offset in 8-byte words.__/Warning:/__ this can fail with an unchecked exception.-}writeInt64Array#::MutableByteArray#s->Int#->Int64#->State#s->State#swriteInt64Array# :: forall s.MutableByteArray# s -> Int# -> Int64# -> State# s -> State# swriteInt64Array#=MutableByteArray# s -> Int# -> Int64# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Int64# -> State# s -> State# swriteInt64Array#{-|Write a 64-bit unsigned integer; offset in 8-byte words.__/Warning:/__ this can fail with an unchecked exception.-}writeWord64Array#::MutableByteArray#s->Int#->Word64#->State#s->State#swriteWord64Array# :: forall s.MutableByteArray# s -> Int# -> Word64# -> State# s -> State# swriteWord64Array#=MutableByteArray# s -> Int# -> Word64# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Word64# -> State# s -> State# swriteWord64Array#{-|Write an 8-bit character; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}writeWord8ArrayAsChar#::MutableByteArray#s->Int#->Char#->State#s->State#swriteWord8ArrayAsChar# :: forall s.MutableByteArray# s -> Int# -> Char# -> State# s -> State# swriteWord8ArrayAsChar#=MutableByteArray# s -> Int# -> Char# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Char# -> State# s -> State# swriteWord8ArrayAsChar#{-|Write a 32-bit character; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}writeWord8ArrayAsWideChar#::MutableByteArray#s->Int#->Char#->State#s->State#swriteWord8ArrayAsWideChar# :: forall s.MutableByteArray# s -> Int# -> Char# -> State# s -> State# swriteWord8ArrayAsWideChar#=MutableByteArray# s -> Int# -> Char# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Char# -> State# s -> State# swriteWord8ArrayAsWideChar#{-|Write a word-sized integer; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}writeWord8ArrayAsInt#::MutableByteArray#s->Int#->Int#->State#s->State#swriteWord8ArrayAsInt# :: forall s.MutableByteArray# s -> Int# -> Int# -> State# s -> State# swriteWord8ArrayAsInt#=MutableByteArray# s -> Int# -> Int# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Int# -> State# s -> State# swriteWord8ArrayAsInt#{-|Write a word-sized unsigned integer; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}writeWord8ArrayAsWord#::MutableByteArray#s->Int#->Word#->State#s->State#swriteWord8ArrayAsWord# :: forall s.MutableByteArray# s -> Int# -> Word# -> State# s -> State# swriteWord8ArrayAsWord#=MutableByteArray# s -> Int# -> Word# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Word# -> State# s -> State# swriteWord8ArrayAsWord#{-|Write a machine address; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}writeWord8ArrayAsAddr#::MutableByteArray#s->Int#->Addr#->State#s->State#swriteWord8ArrayAsAddr# :: forall s.MutableByteArray# s -> Int# -> Addr# -> State# s -> State# swriteWord8ArrayAsAddr#=MutableByteArray# s -> Int# -> Addr# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Addr# -> State# s -> State# swriteWord8ArrayAsAddr#{-|Write a single-precision floating-point value; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}writeWord8ArrayAsFloat#::MutableByteArray#s->Int#->Float#->State#s->State#swriteWord8ArrayAsFloat# :: forall s.MutableByteArray# s -> Int# -> Float# -> State# s -> State# swriteWord8ArrayAsFloat#=MutableByteArray# s -> Int# -> Float# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Float# -> State# s -> State# swriteWord8ArrayAsFloat#{-|Write a double-precision floating-point value; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}writeWord8ArrayAsDouble#::MutableByteArray#s->Int#->Double#->State#s->State#swriteWord8ArrayAsDouble# :: forall s.MutableByteArray# s -> Int# -> Double# -> State# s -> State# swriteWord8ArrayAsDouble#=MutableByteArray# s -> Int# -> Double# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Double# -> State# s -> State# swriteWord8ArrayAsDouble#{-|Write a 'StablePtr#' value; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}writeWord8ArrayAsStablePtr#::MutableByteArray#s->Int#->StablePtr#a->State#s->State#swriteWord8ArrayAsStablePtr# :: forall s a.MutableByteArray# s -> Int# -> StablePtr# a -> State# s -> State# swriteWord8ArrayAsStablePtr#=MutableByteArray# s -> Int# -> StablePtr# a -> State# s -> State# sforall s a.MutableByteArray# s -> Int# -> StablePtr# a -> State# s -> State# swriteWord8ArrayAsStablePtr#{-|Write a 16-bit signed integer; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}writeWord8ArrayAsInt16#::MutableByteArray#s->Int#->Int16#->State#s->State#swriteWord8ArrayAsInt16# :: forall s.MutableByteArray# s -> Int# -> Int16# -> State# s -> State# swriteWord8ArrayAsInt16#=MutableByteArray# s -> Int# -> Int16# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Int16# -> State# s -> State# swriteWord8ArrayAsInt16#{-|Write a 16-bit unsigned integer; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}writeWord8ArrayAsWord16#::MutableByteArray#s->Int#->Word16#->State#s->State#swriteWord8ArrayAsWord16# :: forall s.MutableByteArray# s -> Int# -> Word16# -> State# s -> State# swriteWord8ArrayAsWord16#=MutableByteArray# s -> Int# -> Word16# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Word16# -> State# s -> State# swriteWord8ArrayAsWord16#{-|Write a 32-bit signed integer; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}writeWord8ArrayAsInt32#::MutableByteArray#s->Int#->Int32#->State#s->State#swriteWord8ArrayAsInt32# :: forall s.MutableByteArray# s -> Int# -> Int32# -> State# s -> State# swriteWord8ArrayAsInt32#=MutableByteArray# s -> Int# -> Int32# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Int32# -> State# s -> State# swriteWord8ArrayAsInt32#{-|Write a 32-bit unsigned integer; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}writeWord8ArrayAsWord32#::MutableByteArray#s->Int#->Word32#->State#s->State#swriteWord8ArrayAsWord32# :: forall s.MutableByteArray# s -> Int# -> Word32# -> State# s -> State# swriteWord8ArrayAsWord32#=MutableByteArray# s -> Int# -> Word32# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Word32# -> State# s -> State# swriteWord8ArrayAsWord32#{-|Write a 64-bit signed integer; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}writeWord8ArrayAsInt64#::MutableByteArray#s->Int#->Int64#->State#s->State#swriteWord8ArrayAsInt64# :: forall s.MutableByteArray# s -> Int# -> Int64# -> State# s -> State# swriteWord8ArrayAsInt64#=MutableByteArray# s -> Int# -> Int64# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Int64# -> State# s -> State# swriteWord8ArrayAsInt64#{-|Write a 64-bit unsigned integer; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}writeWord8ArrayAsWord64#::MutableByteArray#s->Int#->Word64#->State#s->State#swriteWord8ArrayAsWord64# :: forall s.MutableByteArray# s -> Int# -> Word64# -> State# s -> State# swriteWord8ArrayAsWord64#=MutableByteArray# s -> Int# -> Word64# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Word64# -> State# s -> State# swriteWord8ArrayAsWord64#{-|@'compareByteArrays#' src1 src1_ofs src2 src2_ofs n@ compares    @n@ bytes starting at offset @src1_ofs@ in the first    'ByteArray#' @src1@ to the range of @n@ bytes    (i.e. same length) starting at offset @src2_ofs@ of the second    'ByteArray#' @src2@.  Both arrays must fully contain the    specified ranges, but this is not checked.  Returns an 'Int#'    less than, equal to, or greater than zero if the range is found,    respectively, to be byte-wise lexicographically less than, to    match, or be greater than the second range.    @since 0.5.2.0-}compareByteArrays#::ByteArray#->Int#->ByteArray#->Int#->Int#->Int#compareByteArrays# :: ByteArray# -> Int# -> ByteArray# -> Int# -> Int# -> Int#compareByteArrays#=ByteArray# -> Int# -> ByteArray# -> Int# -> Int# -> Int#compareByteArrays#{-| @'copyByteArray#' src src_ofs dst dst_ofs len@ copies the range    starting at offset @src_ofs@ of length @len@ from the    'ByteArray#' @src@ to the 'MutableByteArray#' @dst@    starting at offset @dst_ofs@.  Both arrays must fully contain    the specified ranges, but this is not checked.  The two arrays must    not be the same array in different states, but this is not checked    either.  __/Warning:/__ this can fail with an unchecked exception.-}copyByteArray#::ByteArray#->Int#->MutableByteArray#s->Int#->Int#->State#s->State#scopyByteArray# :: forall s.ByteArray#-> Int#-> MutableByteArray# s-> Int#-> Int#-> State# s-> State# scopyByteArray#=ByteArray#-> Int#-> MutableByteArray# s-> Int#-> Int#-> State# s-> State# sforall s.ByteArray#-> Int#-> MutableByteArray# s-> Int#-> Int#-> State# s-> State# scopyByteArray#{-| @'copyMutableByteArray#' src src_ofs dst dst_ofs len@ copies the    range starting at offset @src_ofs@ of length @len@ from the    'MutableByteArray#' @src@ to the 'MutableByteArray#' @dst@    starting at offset @dst_ofs@.  Both arrays must fully contain the    specified ranges, but this is not checked.  The regions are    allowed to overlap, although this is only possible when the same    array is provided as both the source and the destination.  __/Warning:/__ this can fail with an unchecked exception.-}copyMutableByteArray#::MutableByteArray#s->Int#->MutableByteArray#s->Int#->Int#->State#s->State#scopyMutableByteArray# :: forall s.MutableByteArray# s-> Int#-> MutableByteArray# s-> Int#-> Int#-> State# s-> State# scopyMutableByteArray#=MutableByteArray# s-> Int#-> MutableByteArray# s-> Int#-> Int#-> State# s-> State# sforall s.MutableByteArray# s-> Int#-> MutableByteArray# s-> Int#-> Int#-> State# s-> State# scopyMutableByteArray#{-| @'copyMutableByteArrayNonOverlapping#' src src_ofs dst dst_ofs len@    copies the range starting at offset @src_ofs@ of length @len@ from    the 'MutableByteArray#' @src@ to the 'MutableByteArray#' @dst@    starting at offset @dst_ofs@.  Both arrays must fully contain the    specified ranges, but this is not checked.  The regions are /not/    allowed to overlap, but this is also not checked.    @since 0.11.0  __/Warning:/__ this can fail with an unchecked exception.-}copyMutableByteArrayNonOverlapping#::MutableByteArray#s->Int#->MutableByteArray#s->Int#->Int#->State#s->State#scopyMutableByteArrayNonOverlapping# :: forall s.MutableByteArray# s-> Int#-> MutableByteArray# s-> Int#-> Int#-> State# s-> State# scopyMutableByteArrayNonOverlapping#=MutableByteArray# s-> Int#-> MutableByteArray# s-> Int#-> Int#-> State# s-> State# sforall s.MutableByteArray# s-> Int#-> MutableByteArray# s-> Int#-> Int#-> State# s-> State# scopyMutableByteArrayNonOverlapping#{-|Copy a range of the ByteArray\# to the memory range starting at the Addr\#.   The ByteArray\# and the memory region at Addr\# must fully contain the   specified ranges, but this is not checked. The Addr\# must not point into the   ByteArray\# (e.g. if the ByteArray\# were pinned), but this is not checked   either.__/Warning:/__ this can fail with an unchecked exception.-}copyByteArrayToAddr#::ByteArray#->Int#->Addr#->Int#->State#s->State#scopyByteArrayToAddr# :: forall s.ByteArray# -> Int# -> Addr# -> Int# -> State# s -> State# scopyByteArrayToAddr#=ByteArray# -> Int# -> Addr# -> Int# -> State# s -> State# sforall s.ByteArray# -> Int# -> Addr# -> Int# -> State# s -> State# scopyByteArrayToAddr#{-|Copy a range of the MutableByteArray\# to the memory range starting at the   Addr\#. The MutableByteArray\# and the memory region at Addr\# must fully   contain the specified ranges, but this is not checked. The Addr\# must not   point into the MutableByteArray\# (e.g. if the MutableByteArray\# were   pinned), but this is not checked either.__/Warning:/__ this can fail with an unchecked exception.-}copyMutableByteArrayToAddr#::MutableByteArray#s->Int#->Addr#->Int#->State#s->State#scopyMutableByteArrayToAddr# :: forall s.MutableByteArray# s-> Int# -> Addr# -> Int# -> State# s -> State# scopyMutableByteArrayToAddr#=MutableByteArray# s-> Int# -> Addr# -> Int# -> State# s -> State# sforall s.MutableByteArray# s-> Int# -> Addr# -> Int# -> State# s -> State# scopyMutableByteArrayToAddr#{-|Copy a memory range starting at the Addr\# to the specified range in the   MutableByteArray\#. The memory region at Addr\# and the ByteArray\# must fully   contain the specified ranges, but this is not checked. The Addr\# must not   point into the MutableByteArray\# (e.g. if the MutableByteArray\# were pinned),   but this is not checked either.__/Warning:/__ this can fail with an unchecked exception.-}copyAddrToByteArray#::Addr#->MutableByteArray#s->Int#->Int#->State#s->State#scopyAddrToByteArray# :: forall s.Addr#-> MutableByteArray# s -> Int# -> Int# -> State# s -> State# scopyAddrToByteArray#=Addr#-> MutableByteArray# s -> Int# -> Int# -> State# s -> State# sforall s.Addr#-> MutableByteArray# s -> Int# -> Int# -> State# s -> State# scopyAddrToByteArray#{-| @'copyAddrToAddr#' src dest len@ copies @len@ bytes    from @src@ to @dest@.  These two memory ranges are allowed to overlap.    Analogous to the standard C function @memmove@, but with a different    argument order.    @since 0.11.0  __/Warning:/__ this can fail with an unchecked exception.-}copyAddrToAddr#::Addr#->Addr#->Int#->State#(RealWorld)->State#(RealWorld)copyAddrToAddr# :: Addr# -> Addr# -> Int# -> State# RealWorld -> State# RealWorldcopyAddrToAddr#=Addr# -> Addr# -> Int# -> State# RealWorld -> State# RealWorldcopyAddrToAddr#{-| @'copyAddrToAddrNonOverlapping#' src dest len@ copies @len@ bytes    from @src@ to @dest@.  As the name suggests, these two memory ranges    /must not overlap/, although this pre-condition is not checked.    Analogous to the standard C function @memcpy@, but with a different    argument order.    @since 0.11.0  __/Warning:/__ this can fail with an unchecked exception.-}copyAddrToAddrNonOverlapping#::Addr#->Addr#->Int#->State#(RealWorld)->State#(RealWorld)copyAddrToAddrNonOverlapping# :: Addr# -> Addr# -> Int# -> State# RealWorld -> State# RealWorldcopyAddrToAddrNonOverlapping#=Addr# -> Addr# -> Int# -> State# RealWorld -> State# RealWorldcopyAddrToAddrNonOverlapping#{-|@'setByteArray#' ba off len c@ sets the byte range @[off, off+len)@ of   the 'MutableByteArray#' to the byte @c@.__/Warning:/__ this can fail with an unchecked exception.-}setByteArray#::MutableByteArray#s->Int#->Int#->Int#->State#s->State#ssetByteArray# :: forall s.MutableByteArray# s -> Int# -> Int# -> Int# -> State# s -> State# ssetByteArray#=MutableByteArray# s -> Int# -> Int# -> Int# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Int# -> Int# -> State# s -> State# ssetByteArray#{-| @'setAddrRange#' dest len c@ sets all of the bytes in    @[dest, dest+len)@ to the value @c@.    Analogous to the standard C function @memset@, but with a different    argument order.    @since 0.11.0  __/Warning:/__ this can fail with an unchecked exception.-}setAddrRange#::Addr#->Int#->Int#->State#(RealWorld)->State#(RealWorld)setAddrRange# :: Addr# -> Int# -> Int# -> State# RealWorld -> State# RealWorldsetAddrRange#=Addr# -> Int# -> Int# -> State# RealWorld -> State# RealWorldsetAddrRange#{-|Given an array and an offset in machine words, read an element. The    index is assumed to be in bounds. Implies a full memory barrier.__/Warning:/__ this can fail with an unchecked exception.-}atomicReadIntArray#::MutableByteArray#s->Int#->State#s->(#State#s,Int##)atomicReadIntArray# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int# #)atomicReadIntArray#=MutableByteArray# s -> Int# -> State# s -> (# State# s, Int# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int# #)atomicReadIntArray#{-|Given an array and an offset in machine words, write an element. The    index is assumed to be in bounds. Implies a full memory barrier.__/Warning:/__ this can fail with an unchecked exception.-}atomicWriteIntArray#::MutableByteArray#s->Int#->Int#->State#s->State#satomicWriteIntArray# :: forall s.MutableByteArray# s -> Int# -> Int# -> State# s -> State# satomicWriteIntArray#=MutableByteArray# s -> Int# -> Int# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Int# -> State# s -> State# satomicWriteIntArray#{-|Given an array, an offset in machine words, the expected old value, and    the new value, perform an atomic compare and swap i.e. write the new    value if the current value matches the provided old value. Returns    the value of the element before the operation. Implies a full memory    barrier.__/Warning:/__ this can fail with an unchecked exception.-}casIntArray#::MutableByteArray#s->Int#->Int#->Int#->State#s->(#State#s,Int##)casIntArray# :: forall s.MutableByteArray# s-> Int# -> Int# -> Int# -> State# s -> (# State# s, Int# #)casIntArray#=MutableByteArray# s-> Int# -> Int# -> Int# -> State# s -> (# State# s, Int# #)forall s.MutableByteArray# s-> Int# -> Int# -> Int# -> State# s -> (# State# s, Int# #)casIntArray#{-|Given an array, an offset in bytes, the expected old value, and    the new value, perform an atomic compare and swap i.e. write the new    value if the current value matches the provided old value. Returns    the value of the element before the operation. Implies a full memory    barrier.__/Warning:/__ this can fail with an unchecked exception.-}casInt8Array#::MutableByteArray#s->Int#->Int8#->Int8#->State#s->(#State#s,Int8##)casInt8Array# :: forall s.MutableByteArray# s-> Int# -> Int8# -> Int8# -> State# s -> (# State# s, Int8# #)casInt8Array#=MutableByteArray# s-> Int# -> Int8# -> Int8# -> State# s -> (# State# s, Int8# #)forall s.MutableByteArray# s-> Int# -> Int8# -> Int8# -> State# s -> (# State# s, Int8# #)casInt8Array#{-|Given an array, an offset in 16 bit units, the expected old value, and    the new value, perform an atomic compare and swap i.e. write the new    value if the current value matches the provided old value. Returns    the value of the element before the operation. Implies a full memory    barrier.__/Warning:/__ this can fail with an unchecked exception.-}casInt16Array#::MutableByteArray#s->Int#->Int16#->Int16#->State#s->(#State#s,Int16##)casInt16Array# :: forall s.MutableByteArray# s-> Int# -> Int16# -> Int16# -> State# s -> (# State# s, Int16# #)casInt16Array#=MutableByteArray# s-> Int# -> Int16# -> Int16# -> State# s -> (# State# s, Int16# #)forall s.MutableByteArray# s-> Int# -> Int16# -> Int16# -> State# s -> (# State# s, Int16# #)casInt16Array#{-|Given an array, an offset in 32 bit units, the expected old value, and    the new value, perform an atomic compare and swap i.e. write the new    value if the current value matches the provided old value. Returns    the value of the element before the operation. Implies a full memory    barrier.__/Warning:/__ this can fail with an unchecked exception.-}casInt32Array#::MutableByteArray#s->Int#->Int32#->Int32#->State#s->(#State#s,Int32##)casInt32Array# :: forall s.MutableByteArray# s-> Int# -> Int32# -> Int32# -> State# s -> (# State# s, Int32# #)casInt32Array#=MutableByteArray# s-> Int# -> Int32# -> Int32# -> State# s -> (# State# s, Int32# #)forall s.MutableByteArray# s-> Int# -> Int32# -> Int32# -> State# s -> (# State# s, Int32# #)casInt32Array#{-|Given an array, an offset in 64 bit units, the expected old value, and    the new value, perform an atomic compare and swap i.e. write the new    value if the current value matches the provided old value. Returns    the value of the element before the operation. Implies a full memory    barrier.__/Warning:/__ this can fail with an unchecked exception.-}casInt64Array#::MutableByteArray#s->Int#->Int64#->Int64#->State#s->(#State#s,Int64##)casInt64Array# :: forall s.MutableByteArray# s-> Int# -> Int64# -> Int64# -> State# s -> (# State# s, Int64# #)casInt64Array#=MutableByteArray# s-> Int# -> Int64# -> Int64# -> State# s -> (# State# s, Int64# #)forall s.MutableByteArray# s-> Int# -> Int64# -> Int64# -> State# s -> (# State# s, Int64# #)casInt64Array#{-|Given an array, and offset in machine words, and a value to add,    atomically add the value to the element. Returns the value of the    element before the operation. Implies a full memory barrier.__/Warning:/__ this can fail with an unchecked exception.-}fetchAddIntArray#::MutableByteArray#s->Int#->Int#->State#s->(#State#s,Int##)fetchAddIntArray# :: forall s.MutableByteArray# s-> Int# -> Int# -> State# s -> (# State# s, Int# #)fetchAddIntArray#=MutableByteArray# s-> Int# -> Int# -> State# s -> (# State# s, Int# #)forall s.MutableByteArray# s-> Int# -> Int# -> State# s -> (# State# s, Int# #)fetchAddIntArray#{-|Given an array, and offset in machine words, and a value to subtract,    atomically subtract the value from the element. Returns the value of    the element before the operation. Implies a full memory barrier.__/Warning:/__ this can fail with an unchecked exception.-}fetchSubIntArray#::MutableByteArray#s->Int#->Int#->State#s->(#State#s,Int##)fetchSubIntArray# :: forall s.MutableByteArray# s-> Int# -> Int# -> State# s -> (# State# s, Int# #)fetchSubIntArray#=MutableByteArray# s-> Int# -> Int# -> State# s -> (# State# s, Int# #)forall s.MutableByteArray# s-> Int# -> Int# -> State# s -> (# State# s, Int# #)fetchSubIntArray#{-|Given an array, and offset in machine words, and a value to AND,    atomically AND the value into the element. Returns the value of the    element before the operation. Implies a full memory barrier.__/Warning:/__ this can fail with an unchecked exception.-}fetchAndIntArray#::MutableByteArray#s->Int#->Int#->State#s->(#State#s,Int##)fetchAndIntArray# :: forall s.MutableByteArray# s-> Int# -> Int# -> State# s -> (# State# s, Int# #)fetchAndIntArray#=MutableByteArray# s-> Int# -> Int# -> State# s -> (# State# s, Int# #)forall s.MutableByteArray# s-> Int# -> Int# -> State# s -> (# State# s, Int# #)fetchAndIntArray#{-|Given an array, and offset in machine words, and a value to NAND,    atomically NAND the value into the element. Returns the value of the    element before the operation. Implies a full memory barrier.__/Warning:/__ this can fail with an unchecked exception.-}fetchNandIntArray#::MutableByteArray#s->Int#->Int#->State#s->(#State#s,Int##)fetchNandIntArray# :: forall s.MutableByteArray# s-> Int# -> Int# -> State# s -> (# State# s, Int# #)fetchNandIntArray#=MutableByteArray# s-> Int# -> Int# -> State# s -> (# State# s, Int# #)forall s.MutableByteArray# s-> Int# -> Int# -> State# s -> (# State# s, Int# #)fetchNandIntArray#{-|Given an array, and offset in machine words, and a value to OR,    atomically OR the value into the element. Returns the value of the    element before the operation. Implies a full memory barrier.__/Warning:/__ this can fail with an unchecked exception.-}fetchOrIntArray#::MutableByteArray#s->Int#->Int#->State#s->(#State#s,Int##)fetchOrIntArray# :: forall s.MutableByteArray# s-> Int# -> Int# -> State# s -> (# State# s, Int# #)fetchOrIntArray#=MutableByteArray# s-> Int# -> Int# -> State# s -> (# State# s, Int# #)forall s.MutableByteArray# s-> Int# -> Int# -> State# s -> (# State# s, Int# #)fetchOrIntArray#{-|Given an array, and offset in machine words, and a value to XOR,    atomically XOR the value into the element. Returns the value of the    element before the operation. Implies a full memory barrier.__/Warning:/__ this can fail with an unchecked exception.-}fetchXorIntArray#::MutableByteArray#s->Int#->Int#->State#s->(#State#s,Int##)fetchXorIntArray# :: forall s.MutableByteArray# s-> Int# -> Int# -> State# s -> (# State# s, Int# #)fetchXorIntArray#=MutableByteArray# s-> Int# -> Int# -> State# s -> (# State# s, Int# #)forall s.MutableByteArray# s-> Int# -> Int# -> State# s -> (# State# s, Int# #)fetchXorIntArray#{-| An arbitrary machine address assumed to point outside         the garbage-collected heap. -}dataAddr#{-| The null address. -}nullAddr#::Addr#nullAddr# :: Addr#nullAddr#=Addr#nullAddr#plusAddr#::Addr#->Int#->Addr#plusAddr# :: Addr# -> Int# -> Addr#plusAddr#=Addr# -> Int# -> Addr#plusAddr#{-|Result is meaningless if two 'Addr#'s are so far apart that their         difference doesn't fit in an 'Int#'.-}minusAddr#::Addr#->Addr#->Int#minusAddr# :: Addr# -> Addr# -> Int#minusAddr#=Addr# -> Addr# -> Int#minusAddr#{-|Return the remainder when the 'Addr#' arg, treated like an 'Int#',          is divided by the 'Int#' arg.-}remAddr#::Addr#->Int#->Int#remAddr# :: Addr# -> Int# -> Int#remAddr#=Addr# -> Int# -> Int#remAddr#{-|Coerce directly from address to int.-}{-# DEPRECATEDaddr2Int#" This operation is strongly deprecated. "#-}addr2Int#::Addr#->Int#addr2Int# :: Addr# -> Int#addr2Int#=Addr# -> Int#addr2Int#{-|Coerce directly from int to address.-}{-# DEPRECATEDint2Addr#" This operation is strongly deprecated. "#-}int2Addr#::Int#->Addr#int2Addr# :: Int# -> Addr#int2Addr#=Int# -> Addr#int2Addr#gtAddr#::Addr#->Addr#->Int#gtAddr# :: Addr# -> Addr# -> Int#gtAddr#=Addr# -> Addr# -> Int#gtAddr#geAddr#::Addr#->Addr#->Int#geAddr# :: Addr# -> Addr# -> Int#geAddr#=Addr# -> Addr# -> Int#geAddr#eqAddr#::Addr#->Addr#->Int#eqAddr# :: Addr# -> Addr# -> Int#eqAddr#=Addr# -> Addr# -> Int#eqAddr#neAddr#::Addr#->Addr#->Int#neAddr# :: Addr# -> Addr# -> Int#neAddr#=Addr# -> Addr# -> Int#neAddr#ltAddr#::Addr#->Addr#->Int#ltAddr# :: Addr# -> Addr# -> Int#ltAddr#=Addr# -> Addr# -> Int#ltAddr#leAddr#::Addr#->Addr#->Int#leAddr# :: Addr# -> Addr# -> Int#leAddr#=Addr# -> Addr# -> Int#leAddr#{-|Read an 8-bit character; offset in bytes.-}indexCharOffAddr#::Addr#->Int#->Char#indexCharOffAddr# :: Addr# -> Int# -> Char#indexCharOffAddr#=Addr# -> Int# -> Char#indexCharOffAddr#{-|Read a 32-bit character; offset in 4-byte words.On some platforms, the access may failfor an insufficiently aligned @Addr#@.-}indexWideCharOffAddr#::Addr#->Int#->Char#indexWideCharOffAddr# :: Addr# -> Int# -> Char#indexWideCharOffAddr#=Addr# -> Int# -> Char#indexWideCharOffAddr#{-|Read a word-sized integer; offset in machine words.On some platforms, the access may failfor an insufficiently aligned @Addr#@.-}indexIntOffAddr#::Addr#->Int#->Int#indexIntOffAddr# :: Addr# -> Int# -> Int#indexIntOffAddr#=Addr# -> Int# -> Int#indexIntOffAddr#{-|Read a word-sized unsigned integer; offset in machine words.On some platforms, the access may failfor an insufficiently aligned @Addr#@.-}indexWordOffAddr#::Addr#->Int#->Word#indexWordOffAddr# :: Addr# -> Int# -> Word#indexWordOffAddr#=Addr# -> Int# -> Word#indexWordOffAddr#{-|Read a machine address; offset in machine words.On some platforms, the access may failfor an insufficiently aligned @Addr#@.-}indexAddrOffAddr#::Addr#->Int#->Addr#indexAddrOffAddr# :: Addr# -> Int# -> Addr#indexAddrOffAddr#=Addr# -> Int# -> Addr#indexAddrOffAddr#{-|Read a single-precision floating-point value; offset in 4-byte words.On some platforms, the access may failfor an insufficiently aligned @Addr#@.-}indexFloatOffAddr#::Addr#->Int#->Float#indexFloatOffAddr# :: Addr# -> Int# -> Float#indexFloatOffAddr#=Addr# -> Int# -> Float#indexFloatOffAddr#{-|Read a double-precision floating-point value; offset in 8-byte words.On some platforms, the access may failfor an insufficiently aligned @Addr#@.-}indexDoubleOffAddr#::Addr#->Int#->Double#indexDoubleOffAddr# :: Addr# -> Int# -> Double#indexDoubleOffAddr#=Addr# -> Int# -> Double#indexDoubleOffAddr#{-|Read a 'StablePtr#' value; offset in machine words.On some platforms, the access may failfor an insufficiently aligned @Addr#@.-}indexStablePtrOffAddr#::Addr#->Int#->StablePtr#aindexStablePtrOffAddr# :: forall a. Addr# -> Int# -> StablePtr# aindexStablePtrOffAddr#=Addr# -> Int# -> StablePtr# aforall a. Addr# -> Int# -> StablePtr# aindexStablePtrOffAddr#{-|Read an 8-bit signed integer; offset in bytes.-}indexInt8OffAddr#::Addr#->Int#->Int8#indexInt8OffAddr# :: Addr# -> Int# -> Int8#indexInt8OffAddr#=Addr# -> Int# -> Int8#indexInt8OffAddr#{-|Read an 8-bit unsigned integer; offset in bytes.-}indexWord8OffAddr#::Addr#->Int#->Word8#indexWord8OffAddr# :: Addr# -> Int# -> Word8#indexWord8OffAddr#=Addr# -> Int# -> Word8#indexWord8OffAddr#{-|Read a 16-bit signed integer; offset in 2-byte words.On some platforms, the access may failfor an insufficiently aligned @Addr#@.-}indexInt16OffAddr#::Addr#->Int#->Int16#indexInt16OffAddr# :: Addr# -> Int# -> Int16#indexInt16OffAddr#=Addr# -> Int# -> Int16#indexInt16OffAddr#{-|Read a 16-bit unsigned integer; offset in 2-byte words.On some platforms, the access may failfor an insufficiently aligned @Addr#@.-}indexWord16OffAddr#::Addr#->Int#->Word16#indexWord16OffAddr# :: Addr# -> Int# -> Word16#indexWord16OffAddr#=Addr# -> Int# -> Word16#indexWord16OffAddr#{-|Read a 32-bit signed integer; offset in 4-byte words.On some platforms, the access may failfor an insufficiently aligned @Addr#@.-}indexInt32OffAddr#::Addr#->Int#->Int32#indexInt32OffAddr# :: Addr# -> Int# -> Int32#indexInt32OffAddr#=Addr# -> Int# -> Int32#indexInt32OffAddr#{-|Read a 32-bit unsigned integer; offset in 4-byte words.On some platforms, the access may failfor an insufficiently aligned @Addr#@.-}indexWord32OffAddr#::Addr#->Int#->Word32#indexWord32OffAddr# :: Addr# -> Int# -> Word32#indexWord32OffAddr#=Addr# -> Int# -> Word32#indexWord32OffAddr#{-|Read a 64-bit signed integer; offset in 8-byte words.On some platforms, the access may failfor an insufficiently aligned @Addr#@.-}indexInt64OffAddr#::Addr#->Int#->Int64#indexInt64OffAddr# :: Addr# -> Int# -> Int64#indexInt64OffAddr#=Addr# -> Int# -> Int64#indexInt64OffAddr#{-|Read a 64-bit unsigned integer; offset in 8-byte words.On some platforms, the access may failfor an insufficiently aligned @Addr#@.-}indexWord64OffAddr#::Addr#->Int#->Word64#indexWord64OffAddr# :: Addr# -> Int# -> Word64#indexWord64OffAddr#=Addr# -> Int# -> Word64#indexWord64OffAddr#{-|Read an 8-bit character; offset in bytes.-}indexWord8OffAddrAsChar#::Addr#->Int#->Char#indexWord8OffAddrAsChar# :: Addr# -> Int# -> Char#indexWord8OffAddrAsChar#=Addr# -> Int# -> Char#indexWord8OffAddrAsChar#{-|Read a 32-bit character; offset in bytes.-}indexWord8OffAddrAsWideChar#::Addr#->Int#->Char#indexWord8OffAddrAsWideChar# :: Addr# -> Int# -> Char#indexWord8OffAddrAsWideChar#=Addr# -> Int# -> Char#indexWord8OffAddrAsWideChar#{-|Read a word-sized integer; offset in bytes.-}indexWord8OffAddrAsInt#::Addr#->Int#->Int#indexWord8OffAddrAsInt# :: Addr# -> Int# -> Int#indexWord8OffAddrAsInt#=Addr# -> Int# -> Int#indexWord8OffAddrAsInt#{-|Read a word-sized unsigned integer; offset in bytes.-}indexWord8OffAddrAsWord#::Addr#->Int#->Word#indexWord8OffAddrAsWord# :: Addr# -> Int# -> Word#indexWord8OffAddrAsWord#=Addr# -> Int# -> Word#indexWord8OffAddrAsWord#{-|Read a machine address; offset in bytes.-}indexWord8OffAddrAsAddr#::Addr#->Int#->Addr#indexWord8OffAddrAsAddr# :: Addr# -> Int# -> Addr#indexWord8OffAddrAsAddr#=Addr# -> Int# -> Addr#indexWord8OffAddrAsAddr#{-|Read a single-precision floating-point value; offset in bytes.-}indexWord8OffAddrAsFloat#::Addr#->Int#->Float#indexWord8OffAddrAsFloat# :: Addr# -> Int# -> Float#indexWord8OffAddrAsFloat#=Addr# -> Int# -> Float#indexWord8OffAddrAsFloat#{-|Read a double-precision floating-point value; offset in bytes.-}indexWord8OffAddrAsDouble#::Addr#->Int#->Double#indexWord8OffAddrAsDouble# :: Addr# -> Int# -> Double#indexWord8OffAddrAsDouble#=Addr# -> Int# -> Double#indexWord8OffAddrAsDouble#{-|Read a 'StablePtr#' value; offset in bytes.-}indexWord8OffAddrAsStablePtr#::Addr#->Int#->StablePtr#aindexWord8OffAddrAsStablePtr# :: forall a. Addr# -> Int# -> StablePtr# aindexWord8OffAddrAsStablePtr#=Addr# -> Int# -> StablePtr# aforall a. Addr# -> Int# -> StablePtr# aindexWord8OffAddrAsStablePtr#{-|Read a 16-bit signed integer; offset in bytes.-}indexWord8OffAddrAsInt16#::Addr#->Int#->Int16#indexWord8OffAddrAsInt16# :: Addr# -> Int# -> Int16#indexWord8OffAddrAsInt16#=Addr# -> Int# -> Int16#indexWord8OffAddrAsInt16#{-|Read a 16-bit unsigned integer; offset in bytes.-}indexWord8OffAddrAsWord16#::Addr#->Int#->Word16#indexWord8OffAddrAsWord16# :: Addr# -> Int# -> Word16#indexWord8OffAddrAsWord16#=Addr# -> Int# -> Word16#indexWord8OffAddrAsWord16#{-|Read a 32-bit signed integer; offset in bytes.-}indexWord8OffAddrAsInt32#::Addr#->Int#->Int32#indexWord8OffAddrAsInt32# :: Addr# -> Int# -> Int32#indexWord8OffAddrAsInt32#=Addr# -> Int# -> Int32#indexWord8OffAddrAsInt32#{-|Read a 32-bit unsigned integer; offset in bytes.-}indexWord8OffAddrAsWord32#::Addr#->Int#->Word32#indexWord8OffAddrAsWord32# :: Addr# -> Int# -> Word32#indexWord8OffAddrAsWord32#=Addr# -> Int# -> Word32#indexWord8OffAddrAsWord32#{-|Read a 64-bit signed integer; offset in bytes.-}indexWord8OffAddrAsInt64#::Addr#->Int#->Int64#indexWord8OffAddrAsInt64# :: Addr# -> Int# -> Int64#indexWord8OffAddrAsInt64#=Addr# -> Int# -> Int64#indexWord8OffAddrAsInt64#{-|Read a 64-bit unsigned integer; offset in bytes.-}indexWord8OffAddrAsWord64#::Addr#->Int#->Word64#indexWord8OffAddrAsWord64# :: Addr# -> Int# -> Word64#indexWord8OffAddrAsWord64#=Addr# -> Int# -> Word64#indexWord8OffAddrAsWord64#{-|Read an 8-bit character; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}readCharOffAddr#::Addr#->Int#->State#s->(#State#s,Char##)readCharOffAddr# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Char# #)readCharOffAddr#=Addr# -> Int# -> State# s -> (# State# s, Char# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Char# #)readCharOffAddr#{-|Read a 32-bit character; offset in 4-byte words.On some platforms, the access may failfor an insufficiently aligned @Addr#@.__/Warning:/__ this can fail with an unchecked exception.-}readWideCharOffAddr#::Addr#->Int#->State#s->(#State#s,Char##)readWideCharOffAddr# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Char# #)readWideCharOffAddr#=Addr# -> Int# -> State# s -> (# State# s, Char# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Char# #)readWideCharOffAddr#{-|Read a word-sized integer; offset in machine words.On some platforms, the access may failfor an insufficiently aligned @Addr#@.__/Warning:/__ this can fail with an unchecked exception.-}readIntOffAddr#::Addr#->Int#->State#s->(#State#s,Int##)readIntOffAddr# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Int# #)readIntOffAddr#=Addr# -> Int# -> State# s -> (# State# s, Int# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Int# #)readIntOffAddr#{-|Read a word-sized unsigned integer; offset in machine words.On some platforms, the access may failfor an insufficiently aligned @Addr#@.__/Warning:/__ this can fail with an unchecked exception.-}readWordOffAddr#::Addr#->Int#->State#s->(#State#s,Word##)readWordOffAddr# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Word# #)readWordOffAddr#=Addr# -> Int# -> State# s -> (# State# s, Word# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Word# #)readWordOffAddr#{-|Read a machine address; offset in machine words.On some platforms, the access may failfor an insufficiently aligned @Addr#@.__/Warning:/__ this can fail with an unchecked exception.-}readAddrOffAddr#::Addr#->Int#->State#s->(#State#s,Addr##)readAddrOffAddr# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Addr# #)readAddrOffAddr#=Addr# -> Int# -> State# s -> (# State# s, Addr# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Addr# #)readAddrOffAddr#{-|Read a single-precision floating-point value; offset in 4-byte words.On some platforms, the access may failfor an insufficiently aligned @Addr#@.__/Warning:/__ this can fail with an unchecked exception.-}readFloatOffAddr#::Addr#->Int#->State#s->(#State#s,Float##)readFloatOffAddr# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Float# #)readFloatOffAddr#=Addr# -> Int# -> State# s -> (# State# s, Float# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Float# #)readFloatOffAddr#{-|Read a double-precision floating-point value; offset in 8-byte words.On some platforms, the access may failfor an insufficiently aligned @Addr#@.__/Warning:/__ this can fail with an unchecked exception.-}readDoubleOffAddr#::Addr#->Int#->State#s->(#State#s,Double##)readDoubleOffAddr# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Double# #)readDoubleOffAddr#=Addr# -> Int# -> State# s -> (# State# s, Double# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Double# #)readDoubleOffAddr#{-|Read a 'StablePtr#' value; offset in machine words.On some platforms, the access may failfor an insufficiently aligned @Addr#@.__/Warning:/__ this can fail with an unchecked exception.-}readStablePtrOffAddr#::Addr#->Int#->State#s->(#State#s,StablePtr#a#)readStablePtrOffAddr# :: forall s a.Addr# -> Int# -> State# s -> (# State# s, StablePtr# a #)readStablePtrOffAddr#=Addr# -> Int# -> State# s -> (# State# s, StablePtr# a #)forall s a.Addr# -> Int# -> State# s -> (# State# s, StablePtr# a #)readStablePtrOffAddr#{-|Read an 8-bit signed integer; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}readInt8OffAddr#::Addr#->Int#->State#s->(#State#s,Int8##)readInt8OffAddr# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Int8# #)readInt8OffAddr#=Addr# -> Int# -> State# s -> (# State# s, Int8# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Int8# #)readInt8OffAddr#{-|Read an 8-bit unsigned integer; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}readWord8OffAddr#::Addr#->Int#->State#s->(#State#s,Word8##)readWord8OffAddr# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Word8# #)readWord8OffAddr#=Addr# -> Int# -> State# s -> (# State# s, Word8# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Word8# #)readWord8OffAddr#{-|Read a 16-bit signed integer; offset in 2-byte words.On some platforms, the access may failfor an insufficiently aligned @Addr#@.__/Warning:/__ this can fail with an unchecked exception.-}readInt16OffAddr#::Addr#->Int#->State#s->(#State#s,Int16##)readInt16OffAddr# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Int16# #)readInt16OffAddr#=Addr# -> Int# -> State# s -> (# State# s, Int16# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Int16# #)readInt16OffAddr#{-|Read a 16-bit unsigned integer; offset in 2-byte words.On some platforms, the access may failfor an insufficiently aligned @Addr#@.__/Warning:/__ this can fail with an unchecked exception.-}readWord16OffAddr#::Addr#->Int#->State#s->(#State#s,Word16##)readWord16OffAddr# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Word16# #)readWord16OffAddr#=Addr# -> Int# -> State# s -> (# State# s, Word16# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Word16# #)readWord16OffAddr#{-|Read a 32-bit signed integer; offset in 4-byte words.On some platforms, the access may failfor an insufficiently aligned @Addr#@.__/Warning:/__ this can fail with an unchecked exception.-}readInt32OffAddr#::Addr#->Int#->State#s->(#State#s,Int32##)readInt32OffAddr# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Int32# #)readInt32OffAddr#=Addr# -> Int# -> State# s -> (# State# s, Int32# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Int32# #)readInt32OffAddr#{-|Read a 32-bit unsigned integer; offset in 4-byte words.On some platforms, the access may failfor an insufficiently aligned @Addr#@.__/Warning:/__ this can fail with an unchecked exception.-}readWord32OffAddr#::Addr#->Int#->State#s->(#State#s,Word32##)readWord32OffAddr# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Word32# #)readWord32OffAddr#=Addr# -> Int# -> State# s -> (# State# s, Word32# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Word32# #)readWord32OffAddr#{-|Read a 64-bit signed integer; offset in 8-byte words.On some platforms, the access may failfor an insufficiently aligned @Addr#@.__/Warning:/__ this can fail with an unchecked exception.-}readInt64OffAddr#::Addr#->Int#->State#s->(#State#s,Int64##)readInt64OffAddr# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Int64# #)readInt64OffAddr#=Addr# -> Int# -> State# s -> (# State# s, Int64# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Int64# #)readInt64OffAddr#{-|Read a 64-bit unsigned integer; offset in 8-byte words.On some platforms, the access may failfor an insufficiently aligned @Addr#@.__/Warning:/__ this can fail with an unchecked exception.-}readWord64OffAddr#::Addr#->Int#->State#s->(#State#s,Word64##)readWord64OffAddr# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Word64# #)readWord64OffAddr#=Addr# -> Int# -> State# s -> (# State# s, Word64# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Word64# #)readWord64OffAddr#{-|Read an 8-bit character; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}readWord8OffAddrAsChar#::Addr#->Int#->State#s->(#State#s,Char##)readWord8OffAddrAsChar# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Char# #)readWord8OffAddrAsChar#=Addr# -> Int# -> State# s -> (# State# s, Char# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Char# #)readWord8OffAddrAsChar#{-|Read a 32-bit character; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}readWord8OffAddrAsWideChar#::Addr#->Int#->State#s->(#State#s,Char##)readWord8OffAddrAsWideChar# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Char# #)readWord8OffAddrAsWideChar#=Addr# -> Int# -> State# s -> (# State# s, Char# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Char# #)readWord8OffAddrAsWideChar#{-|Read a word-sized integer; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}readWord8OffAddrAsInt#::Addr#->Int#->State#s->(#State#s,Int##)readWord8OffAddrAsInt# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Int# #)readWord8OffAddrAsInt#=Addr# -> Int# -> State# s -> (# State# s, Int# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Int# #)readWord8OffAddrAsInt#{-|Read a word-sized unsigned integer; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}readWord8OffAddrAsWord#::Addr#->Int#->State#s->(#State#s,Word##)readWord8OffAddrAsWord# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Word# #)readWord8OffAddrAsWord#=Addr# -> Int# -> State# s -> (# State# s, Word# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Word# #)readWord8OffAddrAsWord#{-|Read a machine address; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}readWord8OffAddrAsAddr#::Addr#->Int#->State#s->(#State#s,Addr##)readWord8OffAddrAsAddr# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Addr# #)readWord8OffAddrAsAddr#=Addr# -> Int# -> State# s -> (# State# s, Addr# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Addr# #)readWord8OffAddrAsAddr#{-|Read a single-precision floating-point value; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}readWord8OffAddrAsFloat#::Addr#->Int#->State#s->(#State#s,Float##)readWord8OffAddrAsFloat# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Float# #)readWord8OffAddrAsFloat#=Addr# -> Int# -> State# s -> (# State# s, Float# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Float# #)readWord8OffAddrAsFloat#{-|Read a double-precision floating-point value; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}readWord8OffAddrAsDouble#::Addr#->Int#->State#s->(#State#s,Double##)readWord8OffAddrAsDouble# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Double# #)readWord8OffAddrAsDouble#=Addr# -> Int# -> State# s -> (# State# s, Double# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Double# #)readWord8OffAddrAsDouble#{-|Read a 'StablePtr#' value; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}readWord8OffAddrAsStablePtr#::Addr#->Int#->State#s->(#State#s,StablePtr#a#)readWord8OffAddrAsStablePtr# :: forall s a.Addr# -> Int# -> State# s -> (# State# s, StablePtr# a #)readWord8OffAddrAsStablePtr#=Addr# -> Int# -> State# s -> (# State# s, StablePtr# a #)forall s a.Addr# -> Int# -> State# s -> (# State# s, StablePtr# a #)readWord8OffAddrAsStablePtr#{-|Read a 16-bit signed integer; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}readWord8OffAddrAsInt16#::Addr#->Int#->State#s->(#State#s,Int16##)readWord8OffAddrAsInt16# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Int16# #)readWord8OffAddrAsInt16#=Addr# -> Int# -> State# s -> (# State# s, Int16# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Int16# #)readWord8OffAddrAsInt16#{-|Read a 16-bit unsigned integer; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}readWord8OffAddrAsWord16#::Addr#->Int#->State#s->(#State#s,Word16##)readWord8OffAddrAsWord16# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Word16# #)readWord8OffAddrAsWord16#=Addr# -> Int# -> State# s -> (# State# s, Word16# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Word16# #)readWord8OffAddrAsWord16#{-|Read a 32-bit signed integer; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}readWord8OffAddrAsInt32#::Addr#->Int#->State#s->(#State#s,Int32##)readWord8OffAddrAsInt32# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Int32# #)readWord8OffAddrAsInt32#=Addr# -> Int# -> State# s -> (# State# s, Int32# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Int32# #)readWord8OffAddrAsInt32#{-|Read a 32-bit unsigned integer; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}readWord8OffAddrAsWord32#::Addr#->Int#->State#s->(#State#s,Word32##)readWord8OffAddrAsWord32# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Word32# #)readWord8OffAddrAsWord32#=Addr# -> Int# -> State# s -> (# State# s, Word32# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Word32# #)readWord8OffAddrAsWord32#{-|Read a 64-bit signed integer; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}readWord8OffAddrAsInt64#::Addr#->Int#->State#s->(#State#s,Int64##)readWord8OffAddrAsInt64# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Int64# #)readWord8OffAddrAsInt64#=Addr# -> Int# -> State# s -> (# State# s, Int64# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Int64# #)readWord8OffAddrAsInt64#{-|Read a 64-bit unsigned integer; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}readWord8OffAddrAsWord64#::Addr#->Int#->State#s->(#State#s,Word64##)readWord8OffAddrAsWord64# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Word64# #)readWord8OffAddrAsWord64#=Addr# -> Int# -> State# s -> (# State# s, Word64# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Word64# #)readWord8OffAddrAsWord64#{-|Write an 8-bit character; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}writeCharOffAddr#::Addr#->Int#->Char#->State#s->State#swriteCharOffAddr# :: forall s. Addr# -> Int# -> Char# -> State# s -> State# swriteCharOffAddr#=Addr# -> Int# -> Char# -> State# s -> State# sforall s. Addr# -> Int# -> Char# -> State# s -> State# swriteCharOffAddr#{-|Write a 32-bit character; offset in 4-byte words.On some platforms, the access may failfor an insufficiently aligned @Addr#@.__/Warning:/__ this can fail with an unchecked exception.-}writeWideCharOffAddr#::Addr#->Int#->Char#->State#s->State#swriteWideCharOffAddr# :: forall s. Addr# -> Int# -> Char# -> State# s -> State# swriteWideCharOffAddr#=Addr# -> Int# -> Char# -> State# s -> State# sforall s. Addr# -> Int# -> Char# -> State# s -> State# swriteWideCharOffAddr#{-|Write a word-sized integer; offset in machine words.On some platforms, the access may failfor an insufficiently aligned @Addr#@.__/Warning:/__ this can fail with an unchecked exception.-}writeIntOffAddr#::Addr#->Int#->Int#->State#s->State#swriteIntOffAddr# :: forall s. Addr# -> Int# -> Int# -> State# s -> State# swriteIntOffAddr#=Addr# -> Int# -> Int# -> State# s -> State# sforall s. Addr# -> Int# -> Int# -> State# s -> State# swriteIntOffAddr#{-|Write a word-sized unsigned integer; offset in machine words.On some platforms, the access may failfor an insufficiently aligned @Addr#@.__/Warning:/__ this can fail with an unchecked exception.-}writeWordOffAddr#::Addr#->Int#->Word#->State#s->State#swriteWordOffAddr# :: forall s. Addr# -> Int# -> Word# -> State# s -> State# swriteWordOffAddr#=Addr# -> Int# -> Word# -> State# s -> State# sforall s. Addr# -> Int# -> Word# -> State# s -> State# swriteWordOffAddr#{-|Write a machine address; offset in machine words.On some platforms, the access may failfor an insufficiently aligned @Addr#@.__/Warning:/__ this can fail with an unchecked exception.-}writeAddrOffAddr#::Addr#->Int#->Addr#->State#s->State#swriteAddrOffAddr# :: forall s. Addr# -> Int# -> Addr# -> State# s -> State# swriteAddrOffAddr#=Addr# -> Int# -> Addr# -> State# s -> State# sforall s. Addr# -> Int# -> Addr# -> State# s -> State# swriteAddrOffAddr#{-|Write a single-precision floating-point value; offset in 4-byte words.On some platforms, the access may failfor an insufficiently aligned @Addr#@.__/Warning:/__ this can fail with an unchecked exception.-}writeFloatOffAddr#::Addr#->Int#->Float#->State#s->State#swriteFloatOffAddr# :: forall s. Addr# -> Int# -> Float# -> State# s -> State# swriteFloatOffAddr#=Addr# -> Int# -> Float# -> State# s -> State# sforall s. Addr# -> Int# -> Float# -> State# s -> State# swriteFloatOffAddr#{-|Write a double-precision floating-point value; offset in 8-byte words.On some platforms, the access may failfor an insufficiently aligned @Addr#@.__/Warning:/__ this can fail with an unchecked exception.-}writeDoubleOffAddr#::Addr#->Int#->Double#->State#s->State#swriteDoubleOffAddr# :: forall s. Addr# -> Int# -> Double# -> State# s -> State# swriteDoubleOffAddr#=Addr# -> Int# -> Double# -> State# s -> State# sforall s. Addr# -> Int# -> Double# -> State# s -> State# swriteDoubleOffAddr#{-|Write a 'StablePtr#' value; offset in machine words.On some platforms, the access may failfor an insufficiently aligned @Addr#@.__/Warning:/__ this can fail with an unchecked exception.-}writeStablePtrOffAddr#::Addr#->Int#->StablePtr#a->State#s->State#swriteStablePtrOffAddr# :: forall a s. Addr# -> Int# -> StablePtr# a -> State# s -> State# swriteStablePtrOffAddr#=Addr# -> Int# -> StablePtr# a -> State# s -> State# sforall a s. Addr# -> Int# -> StablePtr# a -> State# s -> State# swriteStablePtrOffAddr#{-|Write an 8-bit signed integer; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}writeInt8OffAddr#::Addr#->Int#->Int8#->State#s->State#swriteInt8OffAddr# :: forall s. Addr# -> Int# -> Int8# -> State# s -> State# swriteInt8OffAddr#=Addr# -> Int# -> Int8# -> State# s -> State# sforall s. Addr# -> Int# -> Int8# -> State# s -> State# swriteInt8OffAddr#{-|Write an 8-bit unsigned integer; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}writeWord8OffAddr#::Addr#->Int#->Word8#->State#s->State#swriteWord8OffAddr# :: forall s. Addr# -> Int# -> Word8# -> State# s -> State# swriteWord8OffAddr#=Addr# -> Int# -> Word8# -> State# s -> State# sforall s. Addr# -> Int# -> Word8# -> State# s -> State# swriteWord8OffAddr#{-|Write a 16-bit signed integer; offset in 2-byte words.On some platforms, the access may failfor an insufficiently aligned @Addr#@.__/Warning:/__ this can fail with an unchecked exception.-}writeInt16OffAddr#::Addr#->Int#->Int16#->State#s->State#swriteInt16OffAddr# :: forall s. Addr# -> Int# -> Int16# -> State# s -> State# swriteInt16OffAddr#=Addr# -> Int# -> Int16# -> State# s -> State# sforall s. Addr# -> Int# -> Int16# -> State# s -> State# swriteInt16OffAddr#{-|Write a 16-bit unsigned integer; offset in 2-byte words.On some platforms, the access may failfor an insufficiently aligned @Addr#@.__/Warning:/__ this can fail with an unchecked exception.-}writeWord16OffAddr#::Addr#->Int#->Word16#->State#s->State#swriteWord16OffAddr# :: forall s. Addr# -> Int# -> Word16# -> State# s -> State# swriteWord16OffAddr#=Addr# -> Int# -> Word16# -> State# s -> State# sforall s. Addr# -> Int# -> Word16# -> State# s -> State# swriteWord16OffAddr#{-|Write a 32-bit signed integer; offset in 4-byte words.On some platforms, the access may failfor an insufficiently aligned @Addr#@.__/Warning:/__ this can fail with an unchecked exception.-}writeInt32OffAddr#::Addr#->Int#->Int32#->State#s->State#swriteInt32OffAddr# :: forall s. Addr# -> Int# -> Int32# -> State# s -> State# swriteInt32OffAddr#=Addr# -> Int# -> Int32# -> State# s -> State# sforall s. Addr# -> Int# -> Int32# -> State# s -> State# swriteInt32OffAddr#{-|Write a 32-bit unsigned integer; offset in 4-byte words.On some platforms, the access may failfor an insufficiently aligned @Addr#@.__/Warning:/__ this can fail with an unchecked exception.-}writeWord32OffAddr#::Addr#->Int#->Word32#->State#s->State#swriteWord32OffAddr# :: forall s. Addr# -> Int# -> Word32# -> State# s -> State# swriteWord32OffAddr#=Addr# -> Int# -> Word32# -> State# s -> State# sforall s. Addr# -> Int# -> Word32# -> State# s -> State# swriteWord32OffAddr#{-|Write a 64-bit signed integer; offset in 8-byte words.On some platforms, the access may failfor an insufficiently aligned @Addr#@.__/Warning:/__ this can fail with an unchecked exception.-}writeInt64OffAddr#::Addr#->Int#->Int64#->State#s->State#swriteInt64OffAddr# :: forall s. Addr# -> Int# -> Int64# -> State# s -> State# swriteInt64OffAddr#=Addr# -> Int# -> Int64# -> State# s -> State# sforall s. Addr# -> Int# -> Int64# -> State# s -> State# swriteInt64OffAddr#{-|Write a 64-bit unsigned integer; offset in 8-byte words.On some platforms, the access may failfor an insufficiently aligned @Addr#@.__/Warning:/__ this can fail with an unchecked exception.-}writeWord64OffAddr#::Addr#->Int#->Word64#->State#s->State#swriteWord64OffAddr# :: forall s. Addr# -> Int# -> Word64# -> State# s -> State# swriteWord64OffAddr#=Addr# -> Int# -> Word64# -> State# s -> State# sforall s. Addr# -> Int# -> Word64# -> State# s -> State# swriteWord64OffAddr#{-|Write an 8-bit character; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}writeWord8OffAddrAsChar#::Addr#->Int#->Char#->State#s->State#swriteWord8OffAddrAsChar# :: forall s. Addr# -> Int# -> Char# -> State# s -> State# swriteWord8OffAddrAsChar#=Addr# -> Int# -> Char# -> State# s -> State# sforall s. Addr# -> Int# -> Char# -> State# s -> State# swriteWord8OffAddrAsChar#{-|Write a 32-bit character; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}writeWord8OffAddrAsWideChar#::Addr#->Int#->Char#->State#s->State#swriteWord8OffAddrAsWideChar# :: forall s. Addr# -> Int# -> Char# -> State# s -> State# swriteWord8OffAddrAsWideChar#=Addr# -> Int# -> Char# -> State# s -> State# sforall s. Addr# -> Int# -> Char# -> State# s -> State# swriteWord8OffAddrAsWideChar#{-|Write a word-sized integer; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}writeWord8OffAddrAsInt#::Addr#->Int#->Int#->State#s->State#swriteWord8OffAddrAsInt# :: forall s. Addr# -> Int# -> Int# -> State# s -> State# swriteWord8OffAddrAsInt#=Addr# -> Int# -> Int# -> State# s -> State# sforall s. Addr# -> Int# -> Int# -> State# s -> State# swriteWord8OffAddrAsInt#{-|Write a word-sized unsigned integer; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}writeWord8OffAddrAsWord#::Addr#->Int#->Word#->State#s->State#swriteWord8OffAddrAsWord# :: forall s. Addr# -> Int# -> Word# -> State# s -> State# swriteWord8OffAddrAsWord#=Addr# -> Int# -> Word# -> State# s -> State# sforall s. Addr# -> Int# -> Word# -> State# s -> State# swriteWord8OffAddrAsWord#{-|Write a machine address; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}writeWord8OffAddrAsAddr#::Addr#->Int#->Addr#->State#s->State#swriteWord8OffAddrAsAddr# :: forall s. Addr# -> Int# -> Addr# -> State# s -> State# swriteWord8OffAddrAsAddr#=Addr# -> Int# -> Addr# -> State# s -> State# sforall s. Addr# -> Int# -> Addr# -> State# s -> State# swriteWord8OffAddrAsAddr#{-|Write a single-precision floating-point value; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}writeWord8OffAddrAsFloat#::Addr#->Int#->Float#->State#s->State#swriteWord8OffAddrAsFloat# :: forall s. Addr# -> Int# -> Float# -> State# s -> State# swriteWord8OffAddrAsFloat#=Addr# -> Int# -> Float# -> State# s -> State# sforall s. Addr# -> Int# -> Float# -> State# s -> State# swriteWord8OffAddrAsFloat#{-|Write a double-precision floating-point value; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}writeWord8OffAddrAsDouble#::Addr#->Int#->Double#->State#s->State#swriteWord8OffAddrAsDouble# :: forall s. Addr# -> Int# -> Double# -> State# s -> State# swriteWord8OffAddrAsDouble#=Addr# -> Int# -> Double# -> State# s -> State# sforall s. Addr# -> Int# -> Double# -> State# s -> State# swriteWord8OffAddrAsDouble#{-|Write a 'StablePtr#' value; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}writeWord8OffAddrAsStablePtr#::Addr#->Int#->StablePtr#a->State#s->State#swriteWord8OffAddrAsStablePtr# :: forall a s. Addr# -> Int# -> StablePtr# a -> State# s -> State# swriteWord8OffAddrAsStablePtr#=Addr# -> Int# -> StablePtr# a -> State# s -> State# sforall a s. Addr# -> Int# -> StablePtr# a -> State# s -> State# swriteWord8OffAddrAsStablePtr#{-|Write a 16-bit signed integer; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}writeWord8OffAddrAsInt16#::Addr#->Int#->Int16#->State#s->State#swriteWord8OffAddrAsInt16# :: forall s. Addr# -> Int# -> Int16# -> State# s -> State# swriteWord8OffAddrAsInt16#=Addr# -> Int# -> Int16# -> State# s -> State# sforall s. Addr# -> Int# -> Int16# -> State# s -> State# swriteWord8OffAddrAsInt16#{-|Write a 16-bit unsigned integer; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}writeWord8OffAddrAsWord16#::Addr#->Int#->Word16#->State#s->State#swriteWord8OffAddrAsWord16# :: forall s. Addr# -> Int# -> Word16# -> State# s -> State# swriteWord8OffAddrAsWord16#=Addr# -> Int# -> Word16# -> State# s -> State# sforall s. Addr# -> Int# -> Word16# -> State# s -> State# swriteWord8OffAddrAsWord16#{-|Write a 32-bit signed integer; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}writeWord8OffAddrAsInt32#::Addr#->Int#->Int32#->State#s->State#swriteWord8OffAddrAsInt32# :: forall s. Addr# -> Int# -> Int32# -> State# s -> State# swriteWord8OffAddrAsInt32#=Addr# -> Int# -> Int32# -> State# s -> State# sforall s. Addr# -> Int# -> Int32# -> State# s -> State# swriteWord8OffAddrAsInt32#{-|Write a 32-bit unsigned integer; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}writeWord8OffAddrAsWord32#::Addr#->Int#->Word32#->State#s->State#swriteWord8OffAddrAsWord32# :: forall s. Addr# -> Int# -> Word32# -> State# s -> State# swriteWord8OffAddrAsWord32#=Addr# -> Int# -> Word32# -> State# s -> State# sforall s. Addr# -> Int# -> Word32# -> State# s -> State# swriteWord8OffAddrAsWord32#{-|Write a 64-bit signed integer; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}writeWord8OffAddrAsInt64#::Addr#->Int#->Int64#->State#s->State#swriteWord8OffAddrAsInt64# :: forall s. Addr# -> Int# -> Int64# -> State# s -> State# swriteWord8OffAddrAsInt64#=Addr# -> Int# -> Int64# -> State# s -> State# sforall s. Addr# -> Int# -> Int64# -> State# s -> State# swriteWord8OffAddrAsInt64#{-|Write a 64-bit unsigned integer; offset in bytes.__/Warning:/__ this can fail with an unchecked exception.-}writeWord8OffAddrAsWord64#::Addr#->Int#->Word64#->State#s->State#swriteWord8OffAddrAsWord64# :: forall s. Addr# -> Int# -> Word64# -> State# s -> State# swriteWord8OffAddrAsWord64#=Addr# -> Int# -> Word64# -> State# s -> State# sforall s. Addr# -> Int# -> Word64# -> State# s -> State# swriteWord8OffAddrAsWord64#{-|The atomic exchange operation. Atomically exchanges the value at the first address    with the Addr# given as second argument. Implies a read barrier.__/Warning:/__ this can fail with an unchecked exception.-}atomicExchangeAddrAddr#::Addr#->Addr#->State#s->(#State#s,Addr##)atomicExchangeAddrAddr# :: forall s. Addr# -> Addr# -> State# s -> (# State# s, Addr# #)atomicExchangeAddrAddr#=Addr# -> Addr# -> State# s -> (# State# s, Addr# #)forall s. Addr# -> Addr# -> State# s -> (# State# s, Addr# #)atomicExchangeAddrAddr#{-|The atomic exchange operation. Atomically exchanges the value at the address    with the given value. Returns the old value. Implies a read barrier.__/Warning:/__ this can fail with an unchecked exception.-}atomicExchangeWordAddr#::Addr#->Word#->State#s->(#State#s,Word##)atomicExchangeWordAddr# :: forall s. Addr# -> Word# -> State# s -> (# State# s, Word# #)atomicExchangeWordAddr#=Addr# -> Word# -> State# s -> (# State# s, Word# #)forall s. Addr# -> Word# -> State# s -> (# State# s, Word# #)atomicExchangeWordAddr#{-| Compare and swap on a word-sized memory location.     Use as: \s -> atomicCasAddrAddr# location expected desired s     This version always returns the old value read. This follows the normal     protocol for CAS operations (and matches the underlying instruction on     most architectures).     Implies a full memory barrier.__/Warning:/__ this can fail with an unchecked exception.-}atomicCasAddrAddr#::Addr#->Addr#->Addr#->State#s->(#State#s,Addr##)atomicCasAddrAddr# :: forall s.Addr# -> Addr# -> Addr# -> State# s -> (# State# s, Addr# #)atomicCasAddrAddr#=Addr# -> Addr# -> Addr# -> State# s -> (# State# s, Addr# #)forall s.Addr# -> Addr# -> Addr# -> State# s -> (# State# s, Addr# #)atomicCasAddrAddr#{-| Compare and swap on a word-sized and aligned memory location.     Use as: \s -> atomicCasWordAddr# location expected desired s     This version always returns the old value read. This follows the normal     protocol for CAS operations (and matches the underlying instruction on     most architectures).     Implies a full memory barrier.__/Warning:/__ this can fail with an unchecked exception.-}atomicCasWordAddr#::Addr#->Word#->Word#->State#s->(#State#s,Word##)atomicCasWordAddr# :: forall s.Addr# -> Word# -> Word# -> State# s -> (# State# s, Word# #)atomicCasWordAddr#=Addr# -> Word# -> Word# -> State# s -> (# State# s, Word# #)forall s.Addr# -> Word# -> Word# -> State# s -> (# State# s, Word# #)atomicCasWordAddr#{-| Compare and swap on a 8 bit-sized and aligned memory location.     Use as: \s -> atomicCasWordAddr8# location expected desired s     This version always returns the old value read. This follows the normal     protocol for CAS operations (and matches the underlying instruction on     most architectures).     Implies a full memory barrier.__/Warning:/__ this can fail with an unchecked exception.-}atomicCasWord8Addr#::Addr#->Word8#->Word8#->State#s->(#State#s,Word8##)atomicCasWord8Addr# :: forall s.Addr# -> Word8# -> Word8# -> State# s -> (# State# s, Word8# #)atomicCasWord8Addr#=Addr# -> Word8# -> Word8# -> State# s -> (# State# s, Word8# #)forall s.Addr# -> Word8# -> Word8# -> State# s -> (# State# s, Word8# #)atomicCasWord8Addr#{-| Compare and swap on a 16 bit-sized and aligned memory location.     Use as: \s -> atomicCasWordAddr16# location expected desired s     This version always returns the old value read. This follows the normal     protocol for CAS operations (and matches the underlying instruction on     most architectures).     Implies a full memory barrier.__/Warning:/__ this can fail with an unchecked exception.-}atomicCasWord16Addr#::Addr#->Word16#->Word16#->State#s->(#State#s,Word16##)atomicCasWord16Addr# :: forall s.Addr# -> Word16# -> Word16# -> State# s -> (# State# s, Word16# #)atomicCasWord16Addr#=Addr# -> Word16# -> Word16# -> State# s -> (# State# s, Word16# #)forall s.Addr# -> Word16# -> Word16# -> State# s -> (# State# s, Word16# #)atomicCasWord16Addr#{-| Compare and swap on a 32 bit-sized and aligned memory location.     Use as: \s -> atomicCasWordAddr32# location expected desired s     This version always returns the old value read. This follows the normal     protocol for CAS operations (and matches the underlying instruction on     most architectures).     Implies a full memory barrier.__/Warning:/__ this can fail with an unchecked exception.-}atomicCasWord32Addr#::Addr#->Word32#->Word32#->State#s->(#State#s,Word32##)atomicCasWord32Addr# :: forall s.Addr# -> Word32# -> Word32# -> State# s -> (# State# s, Word32# #)atomicCasWord32Addr#=Addr# -> Word32# -> Word32# -> State# s -> (# State# s, Word32# #)forall s.Addr# -> Word32# -> Word32# -> State# s -> (# State# s, Word32# #)atomicCasWord32Addr#{-| Compare and swap on a 64 bit-sized and aligned memory location.     Use as: \s -> atomicCasWordAddr64# location expected desired s     This version always returns the old value read. This follows the normal     protocol for CAS operations (and matches the underlying instruction on     most architectures).     Implies a full memory barrier.__/Warning:/__ this can fail with an unchecked exception.-}atomicCasWord64Addr#::Addr#->Word64#->Word64#->State#s->(#State#s,Word64##)atomicCasWord64Addr# :: forall s.Addr# -> Word64# -> Word64# -> State# s -> (# State# s, Word64# #)atomicCasWord64Addr#=Addr# -> Word64# -> Word64# -> State# s -> (# State# s, Word64# #)forall s.Addr# -> Word64# -> Word64# -> State# s -> (# State# s, Word64# #)atomicCasWord64Addr#{-|Given an address, and a value to add,    atomically add the value to the element. Returns the value of the    element before the operation. Implies a full memory barrier.__/Warning:/__ this can fail with an unchecked exception.-}fetchAddWordAddr#::Addr#->Word#->State#s->(#State#s,Word##)fetchAddWordAddr# :: forall s. Addr# -> Word# -> State# s -> (# State# s, Word# #)fetchAddWordAddr#=Addr# -> Word# -> State# s -> (# State# s, Word# #)forall s. Addr# -> Word# -> State# s -> (# State# s, Word# #)fetchAddWordAddr#{-|Given an address, and a value to subtract,    atomically subtract the value from the element. Returns the value of    the element before the operation. Implies a full memory barrier.__/Warning:/__ this can fail with an unchecked exception.-}fetchSubWordAddr#::Addr#->Word#->State#s->(#State#s,Word##)fetchSubWordAddr# :: forall s. Addr# -> Word# -> State# s -> (# State# s, Word# #)fetchSubWordAddr#=Addr# -> Word# -> State# s -> (# State# s, Word# #)forall s. Addr# -> Word# -> State# s -> (# State# s, Word# #)fetchSubWordAddr#{-|Given an address, and a value to AND,    atomically AND the value into the element. Returns the value of the    element before the operation. Implies a full memory barrier.__/Warning:/__ this can fail with an unchecked exception.-}fetchAndWordAddr#::Addr#->Word#->State#s->(#State#s,Word##)fetchAndWordAddr# :: forall s. Addr# -> Word# -> State# s -> (# State# s, Word# #)fetchAndWordAddr#=Addr# -> Word# -> State# s -> (# State# s, Word# #)forall s. Addr# -> Word# -> State# s -> (# State# s, Word# #)fetchAndWordAddr#{-|Given an address, and a value to NAND,    atomically NAND the value into the element. Returns the value of the    element before the operation. Implies a full memory barrier.__/Warning:/__ this can fail with an unchecked exception.-}fetchNandWordAddr#::Addr#->Word#->State#s->(#State#s,Word##)fetchNandWordAddr# :: forall s. Addr# -> Word# -> State# s -> (# State# s, Word# #)fetchNandWordAddr#=Addr# -> Word# -> State# s -> (# State# s, Word# #)forall s. Addr# -> Word# -> State# s -> (# State# s, Word# #)fetchNandWordAddr#{-|Given an address, and a value to OR,    atomically OR the value into the element. Returns the value of the    element before the operation. Implies a full memory barrier.__/Warning:/__ this can fail with an unchecked exception.-}fetchOrWordAddr#::Addr#->Word#->State#s->(#State#s,Word##)fetchOrWordAddr# :: forall s. Addr# -> Word# -> State# s -> (# State# s, Word# #)fetchOrWordAddr#=Addr# -> Word# -> State# s -> (# State# s, Word# #)forall s. Addr# -> Word# -> State# s -> (# State# s, Word# #)fetchOrWordAddr#{-|Given an address, and a value to XOR,    atomically XOR the value into the element. Returns the value of the    element before the operation. Implies a full memory barrier.__/Warning:/__ this can fail with an unchecked exception.-}fetchXorWordAddr#::Addr#->Word#->State#s->(#State#s,Word##)fetchXorWordAddr# :: forall s. Addr# -> Word# -> State# s -> (# State# s, Word# #)fetchXorWordAddr#=Addr# -> Word# -> State# s -> (# State# s, Word# #)forall s. Addr# -> Word# -> State# s -> (# State# s, Word# #)fetchXorWordAddr#{-|Given an address, read a machine word.  Implies a full memory barrier.__/Warning:/__ this can fail with an unchecked exception.-}atomicReadWordAddr#::Addr#->State#s->(#State#s,Word##)atomicReadWordAddr# :: forall s. Addr# -> State# s -> (# State# s, Word# #)atomicReadWordAddr#=Addr# -> State# s -> (# State# s, Word# #)forall s. Addr# -> State# s -> (# State# s, Word# #)atomicReadWordAddr#{-|Given an address, write a machine word. Implies a full memory barrier.__/Warning:/__ this can fail with an unchecked exception.-}atomicWriteWordAddr#::Addr#->Word#->State#s->State#satomicWriteWordAddr# :: forall s. Addr# -> Word# -> State# s -> State# satomicWriteWordAddr#=Addr# -> Word# -> State# s -> State# sforall s. Addr# -> Word# -> State# s -> State# satomicWriteWordAddr#{-|A 'MutVar#' behaves like a single-element mutable array.-}dataMutVar#sa{-|Create 'MutVar#' with specified initial value in specified state thread.-}newMutVar#::a_levpoly->State#s->(#State#s,MutVar#sa_levpoly#)newMutVar# :: forall a_levpoly s.a_levpoly -> State# s -> (# State# s, MutVar# s a_levpoly #)newMutVar#=a_levpoly -> State# s -> (# State# s, MutVar# s a_levpoly #)forall a_levpoly s.a_levpoly -> State# s -> (# State# s, MutVar# s a_levpoly #)newMutVar#{-|Read contents of 'MutVar#'. Result is not yet evaluated.-}readMutVar#::MutVar#sa_levpoly->State#s->(#State#s,a_levpoly#)readMutVar# :: forall s a_levpoly.MutVar# s a_levpoly -> State# s -> (# State# s, a_levpoly #)readMutVar#=MutVar# s a_levpoly -> State# s -> (# State# s, a_levpoly #)forall s a_levpoly.MutVar# s a_levpoly -> State# s -> (# State# s, a_levpoly #)readMutVar#{-|Write contents of 'MutVar#'.-}writeMutVar#::MutVar#sa_levpoly->a_levpoly->State#s->State#swriteMutVar# :: forall s a_levpoly.MutVar# s a_levpoly -> a_levpoly -> State# s -> State# swriteMutVar#=MutVar# s a_levpoly -> a_levpoly -> State# s -> State# sforall s a_levpoly.MutVar# s a_levpoly -> a_levpoly -> State# s -> State# swriteMutVar#{-|Atomically exchange the value of a 'MutVar#'.-}atomicSwapMutVar#::MutVar#sa_levpoly->a_levpoly->State#s->(#State#s,a_levpoly#)atomicSwapMutVar# :: forall s a_levpoly.MutVar# s a_levpoly-> a_levpoly -> State# s -> (# State# s, a_levpoly #)atomicSwapMutVar#=MutVar# s a_levpoly-> a_levpoly -> State# s -> (# State# s, a_levpoly #)forall s a_levpoly.MutVar# s a_levpoly-> a_levpoly -> State# s -> (# State# s, a_levpoly #)atomicSwapMutVar#{-| Modify the contents of a 'MutVar#', returning the previous     contents @x :: a@ and the result of applying the given function to the     previous contents @f x :: c@.     The @data@ type @c@ (not a @newtype@!) must be a record whose first field     is of lifted type @a :: Type@ and is not unpacked. For example, product     types @c ~ Solo a@ or @c ~ (a, b)@ work well. If the record type is both     monomorphic and strict in its first field, it's recommended to mark the     latter @{-# NOUNPACK #-}@ explicitly.     Under the hood 'atomicModifyMutVar2#' atomically replaces a pointer to an     old @x :: a@ with a pointer to a selector thunk @fst r@, where     @fst@ is a selector for the first field of the record and @r@ is a     function application thunk @r = f x@.     @atomicModifyIORef2Native@ from @atomic-modify-general@ package makes an     effort to reflect restrictions on @c@ faithfully, providing a     well-typed high-level wrapper.-}atomicModifyMutVar2#::MutVar#sa->(a->c)->State#s->(#State#s,a,c#)atomicModifyMutVar2# :: forall s a c.MutVar# s a -> (a -> c) -> State# s -> (# State# s, a, c #)atomicModifyMutVar2#=MutVar# s a -> (a -> c) -> State# s -> (# State# s, a, c #)forall s a c.MutVar# s a -> (a -> c) -> State# s -> (# State# s, a, c #)atomicModifyMutVar2#{-| Modify the contents of a 'MutVar#', returning the previous     contents and the result of applying the given function to the     previous contents. -}atomicModifyMutVar_#::MutVar#sa->(a->a)->State#s->(#State#s,a,a#)atomicModifyMutVar_# :: forall s a.MutVar# s a -> (a -> a) -> State# s -> (# State# s, a, a #)atomicModifyMutVar_#=MutVar# s a -> (a -> a) -> State# s -> (# State# s, a, a #)forall s a.MutVar# s a -> (a -> a) -> State# s -> (# State# s, a, a #)atomicModifyMutVar_#{-| Compare-and-swap: perform a pointer equality test between     the first value passed to this function and the value     stored inside the 'MutVar#'. If the pointers are equal,     replace the stored value with the second value passed to this     function, otherwise do nothing.     Returns the final value stored inside the 'MutVar#'.     The 'Int#' indicates whether a swap took place,     with @1#@ meaning that we didn't swap, and @0#@     that we did.     Implies a full memory barrier.     Because the comparison is done on the level of pointers,     all of the difficulties of using     'reallyUnsafePtrEquality#' correctly apply to     'casMutVar#' as well.   -}casMutVar#::MutVar#sa_levpoly->a_levpoly->a_levpoly->State#s->(#State#s,Int#,a_levpoly#)casMutVar# :: forall s a_levpoly.MutVar# s a_levpoly-> a_levpoly-> a_levpoly-> State# s-> (# State# s, Int#, a_levpoly #)casMutVar#=MutVar# s a_levpoly-> a_levpoly-> a_levpoly-> State# s-> (# State# s, Int#, a_levpoly #)forall s a_levpoly.MutVar# s a_levpoly-> a_levpoly-> a_levpoly-> State# s-> (# State# s, Int#, a_levpoly #)casMutVar#{-| @'catch#' k handler s@ evaluates @k s@, invoking @handler@ on any exceptions     thrown.     Note that the result type here isn't quite as unrestricted as the     polymorphic type might suggest; see the section \"RuntimeRep polymorphism     in continuation-style primops\" for details. -}catch#::(State#(RealWorld)->(#State#(RealWorld),a_reppoly#))->(b_levpoly->State#(RealWorld)->(#State#(RealWorld),a_reppoly#))->State#(RealWorld)->(#State#(RealWorld),a_reppoly#)catch# :: forall a_reppoly b_levpoly.(State# RealWorld -> (# State# RealWorld, a_reppoly #))-> (b_levpoly    -> State# RealWorld -> (# State# RealWorld, a_reppoly #))-> State# RealWorld-> (# State# RealWorld, a_reppoly #)catch#=(State# RealWorld -> (# State# RealWorld, a_reppoly #))-> (b_levpoly    -> State# RealWorld -> (# State# RealWorld, a_reppoly #))-> State# RealWorld-> (# State# RealWorld, a_reppoly #)forall a_reppoly b_levpoly.(State# RealWorld -> (# State# RealWorld, a_reppoly #))-> (b_levpoly    -> State# RealWorld -> (# State# RealWorld, a_reppoly #))-> State# RealWorld-> (# State# RealWorld, a_reppoly #)catch#raise#::a_levpoly->b_reppolyraise# :: forall a_levpoly b_reppoly. a_levpoly -> b_reppolyraise#=a_levpoly -> b_reppolyforall a_levpoly b_reppoly. a_levpoly -> b_reppolyraise#raiseUnderflow#::(##)->b_reppolyraiseUnderflow# :: forall b_reppoly. (# #) -> b_reppolyraiseUnderflow#=(# #) -> b_reppolyforall b_reppoly. (# #) -> b_reppolyraiseUnderflow#raiseOverflow#::(##)->b_reppolyraiseOverflow# :: forall b_reppoly. (# #) -> b_reppolyraiseOverflow#=(# #) -> b_reppolyforall b_reppoly. (# #) -> b_reppolyraiseOverflow#raiseDivZero#::(##)->b_reppolyraiseDivZero# :: forall b_reppoly. (# #) -> b_reppolyraiseDivZero#=(# #) -> b_reppolyforall b_reppoly. (# #) -> b_reppolyraiseDivZero#raiseIO#::a_levpoly->State#(RealWorld)->(#State#(RealWorld),b_reppoly#)raiseIO# :: forall a_levpoly b_reppoly.a_levpoly -> State# RealWorld -> (# State# RealWorld, b_reppoly #)raiseIO#=a_levpoly -> State# RealWorld -> (# State# RealWorld, b_reppoly #)forall a_levpoly b_reppoly.a_levpoly -> State# RealWorld -> (# State# RealWorld, b_reppoly #)raiseIO#{-| @'maskAsyncExceptions#' k s@ evaluates @k s@ such that asynchronous     exceptions are deferred until after evaluation has finished.     Note that the result type here isn't quite as unrestricted as the     polymorphic type might suggest; see the section \"RuntimeRep polymorphism     in continuation-style primops\" for details. -}maskAsyncExceptions#::(State#(RealWorld)->(#State#(RealWorld),a_reppoly#))->State#(RealWorld)->(#State#(RealWorld),a_reppoly#)maskAsyncExceptions# :: forall a_reppoly.(State# RealWorld -> (# State# RealWorld, a_reppoly #))-> State# RealWorld -> (# State# RealWorld, a_reppoly #)maskAsyncExceptions#=(State# RealWorld -> (# State# RealWorld, a_reppoly #))-> State# RealWorld -> (# State# RealWorld, a_reppoly #)forall a_reppoly.(State# RealWorld -> (# State# RealWorld, a_reppoly #))-> State# RealWorld -> (# State# RealWorld, a_reppoly #)maskAsyncExceptions#{-| @'maskUninterruptible#' k s@ evaluates @k s@ such that asynchronous     exceptions are deferred until after evaluation has finished.     Note that the result type here isn't quite as unrestricted as the     polymorphic type might suggest; see the section \"RuntimeRep polymorphism     in continuation-style primops\" for details. -}maskUninterruptible#::(State#(RealWorld)->(#State#(RealWorld),a_reppoly#))->State#(RealWorld)->(#State#(RealWorld),a_reppoly#)maskUninterruptible# :: forall a_reppoly.(State# RealWorld -> (# State# RealWorld, a_reppoly #))-> State# RealWorld -> (# State# RealWorld, a_reppoly #)maskUninterruptible#=(State# RealWorld -> (# State# RealWorld, a_reppoly #))-> State# RealWorld -> (# State# RealWorld, a_reppoly #)forall a_reppoly.(State# RealWorld -> (# State# RealWorld, a_reppoly #))-> State# RealWorld -> (# State# RealWorld, a_reppoly #)maskUninterruptible#{-| @'unmaskAsyncUninterruptible#' k s@ evaluates @k s@ such that asynchronous     exceptions are unmasked.     Note that the result type here isn't quite as unrestricted as the     polymorphic type might suggest; see the section \"RuntimeRep polymorphism     in continuation-style primops\" for details. -}unmaskAsyncExceptions#::(State#(RealWorld)->(#State#(RealWorld),a_reppoly#))->State#(RealWorld)->(#State#(RealWorld),a_reppoly#)unmaskAsyncExceptions# :: forall a_reppoly.(State# RealWorld -> (# State# RealWorld, a_reppoly #))-> State# RealWorld -> (# State# RealWorld, a_reppoly #)unmaskAsyncExceptions#=(State# RealWorld -> (# State# RealWorld, a_reppoly #))-> State# RealWorld -> (# State# RealWorld, a_reppoly #)forall a_reppoly.(State# RealWorld -> (# State# RealWorld, a_reppoly #))-> State# RealWorld -> (# State# RealWorld, a_reppoly #)unmaskAsyncExceptions#getMaskingState#::State#(RealWorld)->(#State#(RealWorld),Int##)getMaskingState# :: State# RealWorld -> (# State# RealWorld, Int# #)getMaskingState#=State# RealWorld -> (# State# RealWorld, Int# #)getMaskingState#{-| See "GHC.Prim#continuations". -}dataPromptTag#a{-| See "GHC.Prim#continuations". -}newPromptTag#::State#(RealWorld)->(#State#(RealWorld),PromptTag#a#)newPromptTag# :: forall a. State# RealWorld -> (# State# RealWorld, PromptTag# a #)newPromptTag#=State# RealWorld -> (# State# RealWorld, PromptTag# a #)forall a. State# RealWorld -> (# State# RealWorld, PromptTag# a #)newPromptTag#{-| See "GHC.Prim#continuations". -}prompt#::PromptTag#a->(State#(RealWorld)->(#State#(RealWorld),a#))->State#(RealWorld)->(#State#(RealWorld),a#)prompt# :: forall a.PromptTag# a-> (State# RealWorld -> (# State# RealWorld, a #))-> State# RealWorld-> (# State# RealWorld, a #)prompt#=PromptTag# a-> (State# RealWorld -> (# State# RealWorld, a #))-> State# RealWorld-> (# State# RealWorld, a #)forall a.PromptTag# a-> (State# RealWorld -> (# State# RealWorld, a #))-> State# RealWorld-> (# State# RealWorld, a #)prompt#{-| See "GHC.Prim#continuations". __/Warning:/__ this can fail with an unchecked exception.-}control0#::PromptTag#a->(((State#(RealWorld)->(#State#(RealWorld),b_reppoly#))->State#(RealWorld)->(#State#(RealWorld),a#))->State#(RealWorld)->(#State#(RealWorld),a#))->State#(RealWorld)->(#State#(RealWorld),b_reppoly#)control0# :: forall a b_reppoly.PromptTag# a-> (((State# RealWorld -> (# State# RealWorld, b_reppoly #))     -> State# RealWorld -> (# State# RealWorld, a #))    -> State# RealWorld -> (# State# RealWorld, a #))-> State# RealWorld-> (# State# RealWorld, b_reppoly #)control0#=PromptTag# a-> (((State# RealWorld -> (# State# RealWorld, b_reppoly #))     -> State# RealWorld -> (# State# RealWorld, a #))    -> State# RealWorld -> (# State# RealWorld, a #))-> State# RealWorld-> (# State# RealWorld, b_reppoly #)forall a b_reppoly.PromptTag# a-> (((State# RealWorld -> (# State# RealWorld, b_reppoly #))     -> State# RealWorld -> (# State# RealWorld, a #))    -> State# RealWorld -> (# State# RealWorld, a #))-> State# RealWorld-> (# State# RealWorld, b_reppoly #)control0#dataTVar#saatomically#::(State#(RealWorld)->(#State#(RealWorld),a_levpoly#))->State#(RealWorld)->(#State#(RealWorld),a_levpoly#)atomically# :: forall a_reppoly.(State# RealWorld -> (# State# RealWorld, a_reppoly #))-> State# RealWorld -> (# State# RealWorld, a_reppoly #)atomically#=(State# RealWorld -> (# State# RealWorld, a_levpoly #))-> State# RealWorld -> (# State# RealWorld, a_levpoly #)forall a_reppoly.(State# RealWorld -> (# State# RealWorld, a_reppoly #))-> State# RealWorld -> (# State# RealWorld, a_reppoly #)atomically#retry#::State#(RealWorld)->(#State#(RealWorld),a_levpoly#)retry# :: forall a_levpoly.State# RealWorld -> (# State# RealWorld, a_levpoly #)retry#=State# RealWorld -> (# State# RealWorld, a_levpoly #)forall a_levpoly.State# RealWorld -> (# State# RealWorld, a_levpoly #)retry#catchRetry#::(State#(RealWorld)->(#State#(RealWorld),a_levpoly#))->(State#(RealWorld)->(#State#(RealWorld),a_levpoly#))->State#(RealWorld)->(#State#(RealWorld),a_levpoly#)catchRetry# :: forall a_levpoly.(State# RealWorld -> (# State# RealWorld, a_levpoly #))-> (State# RealWorld -> (# State# RealWorld, a_levpoly #))-> State# RealWorld-> (# State# RealWorld, a_levpoly #)catchRetry#=(State# RealWorld -> (# State# RealWorld, a_levpoly #))-> (State# RealWorld -> (# State# RealWorld, a_levpoly #))-> State# RealWorld-> (# State# RealWorld, a_levpoly #)forall a_levpoly.(State# RealWorld -> (# State# RealWorld, a_levpoly #))-> (State# RealWorld -> (# State# RealWorld, a_levpoly #))-> State# RealWorld-> (# State# RealWorld, a_levpoly #)catchRetry#catchSTM#::(State#(RealWorld)->(#State#(RealWorld),a_levpoly#))->(b->State#(RealWorld)->(#State#(RealWorld),a_levpoly#))->State#(RealWorld)->(#State#(RealWorld),a_levpoly#)catchSTM# :: forall a_reppoly b_levpoly.(State# RealWorld -> (# State# RealWorld, a_reppoly #))-> (b_levpoly    -> State# RealWorld -> (# State# RealWorld, a_reppoly #))-> State# RealWorld-> (# State# RealWorld, a_reppoly #)catchSTM#=(State# RealWorld -> (# State# RealWorld, a_levpoly #))-> (b -> State# RealWorld -> (# State# RealWorld, a_levpoly #))-> State# RealWorld-> (# State# RealWorld, a_levpoly #)forall a_reppoly b_levpoly.(State# RealWorld -> (# State# RealWorld, a_reppoly #))-> (b_levpoly    -> State# RealWorld -> (# State# RealWorld, a_reppoly #))-> State# RealWorld-> (# State# RealWorld, a_reppoly #)catchSTM#{-|Create a new 'TVar#' holding a specified initial value.-}newTVar#::a_levpoly->State#s->(#State#s,TVar#sa_levpoly#)newTVar# :: forall a_levpoly s.a_levpoly -> State# s -> (# State# s, TVar# s a_levpoly #)newTVar#=a_levpoly -> State# s -> (# State# s, TVar# s a_levpoly #)forall a_levpoly s.a_levpoly -> State# s -> (# State# s, TVar# s a_levpoly #)newTVar#{-|Read contents of 'TVar#' inside an STM transaction,    i.e. within a call to 'atomically#'.    Does not force evaluation of the result.-}readTVar#::TVar#sa_levpoly->State#s->(#State#s,a_levpoly#)readTVar# :: forall s a_levpoly.TVar# s a_levpoly -> State# s -> (# State# s, a_levpoly #)readTVar#=TVar# s a_levpoly -> State# s -> (# State# s, a_levpoly #)forall s a_levpoly.TVar# s a_levpoly -> State# s -> (# State# s, a_levpoly #)readTVar#{-|Read contents of 'TVar#' outside an STM transaction.   Does not force evaluation of the result.-}readTVarIO#::TVar#sa_levpoly->State#s->(#State#s,a_levpoly#)readTVarIO# :: forall s a_levpoly.TVar# s a_levpoly -> State# s -> (# State# s, a_levpoly #)readTVarIO#=TVar# s a_levpoly -> State# s -> (# State# s, a_levpoly #)forall s a_levpoly.TVar# s a_levpoly -> State# s -> (# State# s, a_levpoly #)readTVarIO#{-|Write contents of 'TVar#'.-}writeTVar#::TVar#sa_levpoly->a_levpoly->State#s->State#swriteTVar# :: forall s a_levpoly.TVar# s a_levpoly -> a_levpoly -> State# s -> State# swriteTVar#=TVar# s a_levpoly -> a_levpoly -> State# s -> State# sforall s a_levpoly.TVar# s a_levpoly -> a_levpoly -> State# s -> State# swriteTVar#{-| A shared mutable variable (/not/ the same as a 'MutVar#'!).        (Note: in a non-concurrent implementation, @('MVar#' a)@ can be        represented by @('MutVar#' (Maybe a))@.) -}dataMVar#sa{-|Create new 'MVar#'; initially empty.-}newMVar#::State#s->(#State#s,MVar#sa_levpoly#)newMVar# :: forall s a_levpoly. State# s -> (# State# s, MVar# s a_levpoly #)newMVar#=State# s -> (# State# s, MVar# s a_levpoly #)forall s a_levpoly. State# s -> (# State# s, MVar# s a_levpoly #)newMVar#{-|If 'MVar#' is empty, block until it becomes full.   Then remove and return its contents, and set it empty.-}takeMVar#::MVar#sa_levpoly->State#s->(#State#s,a_levpoly#)takeMVar# :: forall s a_levpoly.MVar# s a_levpoly -> State# s -> (# State# s, a_levpoly #)takeMVar#=MVar# s a_levpoly -> State# s -> (# State# s, a_levpoly #)forall s a_levpoly.MVar# s a_levpoly -> State# s -> (# State# s, a_levpoly #)takeMVar#{-|If 'MVar#' is empty, immediately return with integer 0 and value undefined.   Otherwise, return with integer 1 and contents of 'MVar#', and set 'MVar#' empty.-}tryTakeMVar#::MVar#sa_levpoly->State#s->(#State#s,Int#,a_levpoly#)tryTakeMVar# :: forall s a_levpoly.MVar# s a_levpoly -> State# s -> (# State# s, Int#, a_levpoly #)tryTakeMVar#=MVar# s a_levpoly -> State# s -> (# State# s, Int#, a_levpoly #)forall s a_levpoly.MVar# s a_levpoly -> State# s -> (# State# s, Int#, a_levpoly #)tryTakeMVar#{-|If 'MVar#' is full, block until it becomes empty.   Then store value arg as its new contents.-}putMVar#::MVar#sa_levpoly->a_levpoly->State#s->State#sputMVar# :: forall s a_levpoly.MVar# s a_levpoly -> a_levpoly -> State# s -> State# sputMVar#=MVar# s a_levpoly -> a_levpoly -> State# s -> State# sforall s a_levpoly.MVar# s a_levpoly -> a_levpoly -> State# s -> State# sputMVar#{-|If 'MVar#' is full, immediately return with integer 0.    Otherwise, store value arg as 'MVar#''s new contents, and return with integer 1.-}tryPutMVar#::MVar#sa_levpoly->a_levpoly->State#s->(#State#s,Int##)tryPutMVar# :: forall s a_levpoly.MVar# s a_levpoly -> a_levpoly -> State# s -> (# State# s, Int# #)tryPutMVar#=MVar# s a_levpoly -> a_levpoly -> State# s -> (# State# s, Int# #)forall s a_levpoly.MVar# s a_levpoly -> a_levpoly -> State# s -> (# State# s, Int# #)tryPutMVar#{-|If 'MVar#' is empty, block until it becomes full.   Then read its contents without modifying the MVar, without possibility   of intervention from other threads.-}readMVar#::MVar#sa_levpoly->State#s->(#State#s,a_levpoly#)readMVar# :: forall s a_levpoly.MVar# s a_levpoly -> State# s -> (# State# s, a_levpoly #)readMVar#=MVar# s a_levpoly -> State# s -> (# State# s, a_levpoly #)forall s a_levpoly.MVar# s a_levpoly -> State# s -> (# State# s, a_levpoly #)readMVar#{-|If 'MVar#' is empty, immediately return with integer 0 and value undefined.   Otherwise, return with integer 1 and contents of 'MVar#'.-}tryReadMVar#::MVar#sa_levpoly->State#s->(#State#s,Int#,a_levpoly#)tryReadMVar# :: forall s a_levpoly.MVar# s a_levpoly -> State# s -> (# State# s, Int#, a_levpoly #)tryReadMVar#=MVar# s a_levpoly -> State# s -> (# State# s, Int#, a_levpoly #)forall s a_levpoly.MVar# s a_levpoly -> State# s -> (# State# s, Int#, a_levpoly #)tryReadMVar#{-|Return 1 if 'MVar#' is empty; 0 otherwise.-}isEmptyMVar#::MVar#sa_levpoly->State#s->(#State#s,Int##)isEmptyMVar# :: forall s a_levpoly.MVar# s a_levpoly -> State# s -> (# State# s, Int# #)isEmptyMVar#=MVar# s a_levpoly -> State# s -> (# State# s, Int# #)forall s a_levpoly.MVar# s a_levpoly -> State# s -> (# State# s, Int# #)isEmptyMVar#{-| A shared I/O port is almost the same as an 'MVar#'.        The main difference is that IOPort has no deadlock detection or        deadlock breaking code that forcibly releases the lock. -}dataIOPort#sa{-|Create new 'IOPort#'; initially empty.-}newIOPort#::State#s->(#State#s,IOPort#sa_levpoly#)newIOPort# :: forall s a_levpoly. State# s -> (# State# s, IOPort# s a_levpoly #)newIOPort#=State# s -> (# State# s, IOPort# s a_levpoly #)forall s a_levpoly. State# s -> (# State# s, IOPort# s a_levpoly #)newIOPort#{-|If 'IOPort#' is empty, block until it becomes full.   Then remove and return its contents, and set it empty.   Throws an 'IOPortException' if another thread is already   waiting to read this 'IOPort#'.-}readIOPort#::IOPort#sa_levpoly->State#s->(#State#s,a_levpoly#)readIOPort# :: forall s a_levpoly.IOPort# s a_levpoly -> State# s -> (# State# s, a_levpoly #)readIOPort#=IOPort# s a_levpoly -> State# s -> (# State# s, a_levpoly #)forall s a_levpoly.IOPort# s a_levpoly -> State# s -> (# State# s, a_levpoly #)readIOPort#{-|If 'IOPort#' is full, immediately return with integer 0,    throwing an 'IOPortException'.    Otherwise, store value arg as 'IOPort#''s new contents,    and return with integer 1. -}writeIOPort#::IOPort#sa_levpoly->a_levpoly->State#s->(#State#s,Int##)writeIOPort# :: forall s a_levpoly.IOPort# s a_levpoly-> a_levpoly -> State# s -> (# State# s, Int# #)writeIOPort#=IOPort# s a_levpoly-> a_levpoly -> State# s -> (# State# s, Int# #)forall s a_levpoly.IOPort# s a_levpoly-> a_levpoly -> State# s -> (# State# s, Int# #)writeIOPort#{-|Sleep specified number of microseconds.-}delay#::Int#->State#s->State#sdelay# :: forall s. Int# -> State# s -> State# sdelay#=Int# -> State# s -> State# sforall s. Int# -> State# s -> State# sdelay#{-|Block until input is available on specified file descriptor.-}waitRead#::Int#->State#s->State#swaitRead# :: forall s. Int# -> State# s -> State# swaitRead#=Int# -> State# s -> State# sforall s. Int# -> State# s -> State# swaitRead#{-|Block until output is possible on specified file descriptor.-}waitWrite#::Int#->State#s->State#swaitWrite# :: forall s. Int# -> State# s -> State# swaitWrite#=Int# -> State# s -> State# sforall s. Int# -> State# s -> State# swaitWrite#{-| 'State#' is the primitive, unlifted type of states.  It has        one type parameter, thus @'State#' 'RealWorld'@, or @'State#' s@,        where s is a type variable. The only purpose of the type parameter        is to keep different state threads separate.  It is represented by        nothing at all. -}dataState#s{-| 'RealWorld' is deeply magical.  It is /primitive/, but it is not        /unlifted/ (hence @ptrArg@).  We never manipulate values of type        'RealWorld'; it's only used in the type system, to parameterise 'State#'. -}dataRealWorld{-|(In a non-concurrent implementation, this can be a singleton        type, whose (unique) value is returned by 'myThreadId#'.  The        other operations can be omitted.)-}dataThreadId#fork#::(State#(RealWorld)->(#State#(RealWorld),a_reppoly#))->State#(RealWorld)->(#State#(RealWorld),ThreadId##)fork# :: forall a_reppoly.(State# RealWorld -> (# State# RealWorld, a_reppoly #))-> State# RealWorld -> (# State# RealWorld, ThreadId# #)fork#=(State# RealWorld -> (# State# RealWorld, a_reppoly #))-> State# RealWorld -> (# State# RealWorld, ThreadId# #)forall a_reppoly.(State# RealWorld -> (# State# RealWorld, a_reppoly #))-> State# RealWorld -> (# State# RealWorld, ThreadId# #)fork#forkOn#::Int#->(State#(RealWorld)->(#State#(RealWorld),a_reppoly#))->State#(RealWorld)->(#State#(RealWorld),ThreadId##)forkOn# :: forall a_reppoly.Int#-> (State# RealWorld -> (# State# RealWorld, a_reppoly #))-> State# RealWorld-> (# State# RealWorld, ThreadId# #)forkOn#=Int#-> (State# RealWorld -> (# State# RealWorld, a_reppoly #))-> State# RealWorld-> (# State# RealWorld, ThreadId# #)forall a_reppoly.Int#-> (State# RealWorld -> (# State# RealWorld, a_reppoly #))-> State# RealWorld-> (# State# RealWorld, ThreadId# #)forkOn#killThread#::ThreadId#->a->State#(RealWorld)->State#(RealWorld)killThread# :: forall a. ThreadId# -> a -> State# RealWorld -> State# RealWorldkillThread#=ThreadId# -> a -> State# RealWorld -> State# RealWorldforall a. ThreadId# -> a -> State# RealWorld -> State# RealWorldkillThread#yield#::State#(RealWorld)->State#(RealWorld)yield# :: State# RealWorld -> State# RealWorldyield#=State# RealWorld -> State# RealWorldyield#myThreadId#::State#(RealWorld)->(#State#(RealWorld),ThreadId##)myThreadId# :: State# RealWorld -> (# State# RealWorld, ThreadId# #)myThreadId#=State# RealWorld -> (# State# RealWorld, ThreadId# #)myThreadId#{-|Set the label of the given thread. The @ByteArray#@ should contain    a UTF-8-encoded string.-}labelThread#::ThreadId#->ByteArray#->State#(RealWorld)->State#(RealWorld)labelThread# :: ThreadId# -> ByteArray# -> State# RealWorld -> State# RealWorldlabelThread#=ThreadId# -> ByteArray# -> State# RealWorld -> State# RealWorldlabelThread#isCurrentThreadBound#::State#(RealWorld)->(#State#(RealWorld),Int##)isCurrentThreadBound# :: State# RealWorld -> (# State# RealWorld, Int# #)isCurrentThreadBound#=State# RealWorld -> (# State# RealWorld, Int# #)isCurrentThreadBound#noDuplicate#::State#s->State#snoDuplicate# :: forall s. State# s -> State# snoDuplicate#=State# s -> State# sforall s. State# s -> State# snoDuplicate#{-|Get the label of the given thread.    Morally of type @ThreadId# -> IO (Maybe ByteArray#)@, with a @1#@ tag    denoting @Just@.    @since 0.10-}threadLabel#::ThreadId#->State#(RealWorld)->(#State#(RealWorld),Int#,ByteArray##)threadLabel# :: ThreadId#-> State# RealWorld -> (# State# RealWorld, Int#, ByteArray# #)threadLabel#=ThreadId#-> State# RealWorld -> (# State# RealWorld, Int#, ByteArray# #)threadLabel#{-|Get the status of the given thread. Result is    @(ThreadStatus, Capability, Locked)@ where    @ThreadStatus@ is one of the status constants defined in    @rts/Constants.h@, @Capability@ is the number of    the capability which currently owns the thread, and    @Locked@ is a boolean indicating whether the    thread is bound to that capability.    @since 0.9-}threadStatus#::ThreadId#->State#(RealWorld)->(#State#(RealWorld),Int#,Int#,Int##)threadStatus# :: ThreadId#-> State# RealWorld -> (# State# RealWorld, Int#, Int#, Int# #)threadStatus#=ThreadId#-> State# RealWorld -> (# State# RealWorld, Int#, Int#, Int# #)threadStatus#{-| Returns an array of the threads started by the program. Note that this     threads which have finished execution may or may not be present in this     list, depending upon whether they have been collected by the garbage collector.     @since 0.10-}listThreads#::State#(RealWorld)->(#State#(RealWorld),Array#(ThreadId#)#)listThreads# :: State# RealWorld -> (# State# RealWorld, Array# ThreadId# #)listThreads#=State# RealWorld -> (# State# RealWorld, Array# ThreadId# #)listThreads#dataWeak#b{-| @'mkWeak#' k v finalizer s@ creates a weak reference to value @k@,     with an associated reference to some value @v@. If @k@ is still     alive then @v@ can be retrieved using 'deRefWeak#'. Note that     the type of @k@ must be represented by a pointer (i.e. of kind     @'TYPE' ''LiftedRep' or @'TYPE' ''UnliftedRep'@). -}mkWeak#::a_levpoly->b_levpoly->(State#(RealWorld)->(#State#(RealWorld),c#))->State#(RealWorld)->(#State#(RealWorld),Weak#b_levpoly#)mkWeak# :: forall a_levpoly b_levpoly c.a_levpoly-> b_levpoly-> (State# RealWorld -> (# State# RealWorld, c #))-> State# RealWorld-> (# State# RealWorld, Weak# b_levpoly #)mkWeak#=a_levpoly-> b_levpoly-> (State# RealWorld -> (# State# RealWorld, c #))-> State# RealWorld-> (# State# RealWorld, Weak# b_levpoly #)forall a_levpoly b_levpoly c.a_levpoly-> b_levpoly-> (State# RealWorld -> (# State# RealWorld, c #))-> State# RealWorld-> (# State# RealWorld, Weak# b_levpoly #)mkWeak#mkWeakNoFinalizer#::a_levpoly->b_levpoly->State#(RealWorld)->(#State#(RealWorld),Weak#b_levpoly#)mkWeakNoFinalizer# :: forall a_levpoly b_levpoly.a_levpoly-> b_levpoly-> State# RealWorld-> (# State# RealWorld, Weak# b_levpoly #)mkWeakNoFinalizer#=a_levpoly-> b_levpoly-> State# RealWorld-> (# State# RealWorld, Weak# b_levpoly #)forall a_levpoly b_levpoly.a_levpoly-> b_levpoly-> State# RealWorld-> (# State# RealWorld, Weak# b_levpoly #)mkWeakNoFinalizer#{-| @'addCFinalizerToWeak#' fptr ptr flag eptr w@ attaches a C     function pointer @fptr@ to a weak pointer @w@ as a finalizer. If     @flag@ is zero, @fptr@ will be called with one argument,     @ptr@. Otherwise, it will be called with two arguments,     @eptr@ and @ptr@. 'addCFinalizerToWeak#' returns     1 on success, or 0 if @w@ is already dead. -}addCFinalizerToWeak#::Addr#->Addr#->Int#->Addr#->Weak#b_levpoly->State#(RealWorld)->(#State#(RealWorld),Int##)addCFinalizerToWeak# :: forall b_levpoly.Addr#-> Addr#-> Int#-> Addr#-> Weak# b_levpoly-> State# RealWorld-> (# State# RealWorld, Int# #)addCFinalizerToWeak#=Addr#-> Addr#-> Int#-> Addr#-> Weak# b_levpoly-> State# RealWorld-> (# State# RealWorld, Int# #)forall b_levpoly.Addr#-> Addr#-> Int#-> Addr#-> Weak# b_levpoly-> State# RealWorld-> (# State# RealWorld, Int# #)addCFinalizerToWeak#deRefWeak#::Weak#a_levpoly->State#(RealWorld)->(#State#(RealWorld),Int#,a_levpoly#)deRefWeak# :: forall a_levpoly.Weak# a_levpoly-> State# RealWorld -> (# State# RealWorld, Int#, a_levpoly #)deRefWeak#=Weak# a_levpoly-> State# RealWorld -> (# State# RealWorld, Int#, a_levpoly #)forall a_levpoly.Weak# a_levpoly-> State# RealWorld -> (# State# RealWorld, Int#, a_levpoly #)deRefWeak#{-| Finalize a weak pointer. The return value is an unboxed tuple     containing the new state of the world and an "unboxed Maybe",     represented by an 'Int#' and a (possibly invalid) finalization     action. An 'Int#' of @1@ indicates that the finalizer is valid. The     return value @b@ from the finalizer should be ignored. -}finalizeWeak#::Weak#a_levpoly->State#(RealWorld)->(#State#(RealWorld),Int#,State#(RealWorld)->(#State#(RealWorld),b#)#)finalizeWeak# :: forall a_levpoly b.Weak# a_levpoly-> State# RealWorld-> (# State# RealWorld, Int#,      State# RealWorld -> (# State# RealWorld, b #) #)finalizeWeak#=Weak# a_levpoly-> State# RealWorld-> (# State# RealWorld, Int#,      State# RealWorld -> (# State# RealWorld, b #) #)forall a_levpoly b.Weak# a_levpoly-> State# RealWorld-> (# State# RealWorld, Int#,      State# RealWorld -> (# State# RealWorld, b #) #)finalizeWeak#touch#::a_levpoly->State#s->State#stouch# :: forall a_levpoly s. a_levpoly -> State# s -> State# stouch#=a_levpoly -> State# s -> State# sforall a_levpoly s. a_levpoly -> State# s -> State# stouch#dataStablePtr#adataStableName#amakeStablePtr#::a_levpoly->State#(RealWorld)->(#State#(RealWorld),StablePtr#a_levpoly#)makeStablePtr# :: forall a_levpoly.a_levpoly-> State# RealWorld -> (# State# RealWorld, StablePtr# a_levpoly #)makeStablePtr#=a_levpoly-> State# RealWorld -> (# State# RealWorld, StablePtr# a_levpoly #)forall a_levpoly.a_levpoly-> State# RealWorld -> (# State# RealWorld, StablePtr# a_levpoly #)makeStablePtr#deRefStablePtr#::StablePtr#a_levpoly->State#(RealWorld)->(#State#(RealWorld),a_levpoly#)deRefStablePtr# :: forall a_levpoly.StablePtr# a_levpoly-> State# RealWorld -> (# State# RealWorld, a_levpoly #)deRefStablePtr#=StablePtr# a_levpoly-> State# RealWorld -> (# State# RealWorld, a_levpoly #)forall a_levpoly.StablePtr# a_levpoly-> State# RealWorld -> (# State# RealWorld, a_levpoly #)deRefStablePtr#eqStablePtr#::StablePtr#a_levpoly->StablePtr#a_levpoly->Int#eqStablePtr# :: forall a_levpoly.StablePtr# a_levpoly -> StablePtr# a_levpoly -> Int#eqStablePtr#=StablePtr# a_levpoly -> StablePtr# a_levpoly -> Int#forall a_levpoly.StablePtr# a_levpoly -> StablePtr# a_levpoly -> Int#eqStablePtr#makeStableName#::a_levpoly->State#(RealWorld)->(#State#(RealWorld),StableName#a_levpoly#)makeStableName# :: forall a_levpoly.a_levpoly-> State# RealWorld-> (# State# RealWorld, StableName# a_levpoly #)makeStableName#=a_levpoly-> State# RealWorld-> (# State# RealWorld, StableName# a_levpoly #)forall a_levpoly.a_levpoly-> State# RealWorld-> (# State# RealWorld, StableName# a_levpoly #)makeStableName#stableNameToInt#::StableName#a_levpoly->Int#stableNameToInt# :: forall a_levpoly. StableName# a_levpoly -> Int#stableNameToInt#=StableName# a_levpoly -> Int#forall a_levpoly. StableName# a_levpoly -> Int#stableNameToInt#dataCompact#{-| Create a new CNF with a single compact block. The argument is     the capacity of the compact block (in bytes, not words).     The capacity is rounded up to a multiple of the allocator block size     and is capped to one mega block. -}compactNew#::Word#->State#(RealWorld)->(#State#(RealWorld),Compact##)compactNew# :: Word# -> State# RealWorld -> (# State# RealWorld, Compact# #)compactNew#=Word# -> State# RealWorld -> (# State# RealWorld, Compact# #)compactNew#{-| Set the new allocation size of the CNF. This value (in bytes)     determines the capacity of each compact block in the CNF. It     does not retroactively affect existing compact blocks in the CNF. -}compactResize#::Compact#->Word#->State#(RealWorld)->State#(RealWorld)compactResize# :: Compact# -> Word# -> State# RealWorld -> State# RealWorldcompactResize#=Compact# -> Word# -> State# RealWorld -> State# RealWorldcompactResize#{-| Returns 1\# if the object is contained in the CNF, 0\# otherwise. -}compactContains#::Compact#->a->State#(RealWorld)->(#State#(RealWorld),Int##)compactContains# :: forall a.Compact# -> a -> State# RealWorld -> (# State# RealWorld, Int# #)compactContains#=Compact# -> a -> State# RealWorld -> (# State# RealWorld, Int# #)forall a.Compact# -> a -> State# RealWorld -> (# State# RealWorld, Int# #)compactContains#{-| Returns 1\# if the object is in any CNF at all, 0\# otherwise. -}compactContainsAny#::a->State#(RealWorld)->(#State#(RealWorld),Int##)compactContainsAny# :: forall a. a -> State# RealWorld -> (# State# RealWorld, Int# #)compactContainsAny#=a -> State# RealWorld -> (# State# RealWorld, Int# #)forall a. a -> State# RealWorld -> (# State# RealWorld, Int# #)compactContainsAny#{-| Returns the address and the utilized size (in bytes) of the     first compact block of a CNF.-}compactGetFirstBlock#::Compact#->State#(RealWorld)->(#State#(RealWorld),Addr#,Word##)compactGetFirstBlock# :: Compact#-> State# RealWorld -> (# State# RealWorld, Addr#, Word# #)compactGetFirstBlock#=Compact#-> State# RealWorld -> (# State# RealWorld, Addr#, Word# #)compactGetFirstBlock#{-| Given a CNF and the address of one its compact blocks, returns the     next compact block and its utilized size, or 'nullAddr#' if the     argument was the last compact block in the CNF. -}compactGetNextBlock#::Compact#->Addr#->State#(RealWorld)->(#State#(RealWorld),Addr#,Word##)compactGetNextBlock# :: Compact#-> Addr#-> State# RealWorld-> (# State# RealWorld, Addr#, Word# #)compactGetNextBlock#=Compact#-> Addr#-> State# RealWorld-> (# State# RealWorld, Addr#, Word# #)compactGetNextBlock#{-| Attempt to allocate a compact block with the capacity (in     bytes) given by the first argument. The 'Addr#' is a pointer     to previous compact block of the CNF or 'nullAddr#' to create a     new CNF with a single compact block.     The resulting block is not known to the GC until     'compactFixupPointers#' is called on it, and care must be taken     so that the address does not escape or memory will be leaked.   -}compactAllocateBlock#::Word#->Addr#->State#(RealWorld)->(#State#(RealWorld),Addr##)compactAllocateBlock# :: Word# -> Addr# -> State# RealWorld -> (# State# RealWorld, Addr# #)compactAllocateBlock#=Word# -> Addr# -> State# RealWorld -> (# State# RealWorld, Addr# #)compactAllocateBlock#{-| Given the pointer to the first block of a CNF and the     address of the root object in the old address space, fix up     the internal pointers inside the CNF to account for     a different position in memory than when it was serialized.     This method must be called exactly once after importing     a serialized CNF. It returns the new CNF and the new adjusted     root address. -}compactFixupPointers#::Addr#->Addr#->State#(RealWorld)->(#State#(RealWorld),Compact#,Addr##)compactFixupPointers# :: Addr#-> Addr#-> State# RealWorld-> (# State# RealWorld, Compact#, Addr# #)compactFixupPointers#=Addr#-> Addr#-> State# RealWorld-> (# State# RealWorld, Compact#, Addr# #)compactFixupPointers#{-| Recursively add a closure and its transitive closure to a     'Compact#' (a CNF), evaluating any unevaluated components     at the same time. Note: 'compactAdd#' is not thread-safe, so     only one thread may call 'compactAdd#' with a particular     'Compact#' at any given time. The primop does not     enforce any mutual exclusion; the caller is expected to     arrange this. -}compactAdd#::Compact#->a->State#(RealWorld)->(#State#(RealWorld),a#)compactAdd# :: forall a.Compact# -> a -> State# RealWorld -> (# State# RealWorld, a #)compactAdd#=Compact# -> a -> State# RealWorld -> (# State# RealWorld, a #)forall a.Compact# -> a -> State# RealWorld -> (# State# RealWorld, a #)compactAdd#{-| Like 'compactAdd#', but retains sharing and cycles   during compaction. -}compactAddWithSharing#::Compact#->a->State#(RealWorld)->(#State#(RealWorld),a#)compactAddWithSharing# :: forall a.Compact# -> a -> State# RealWorld -> (# State# RealWorld, a #)compactAddWithSharing#=Compact# -> a -> State# RealWorld -> (# State# RealWorld, a #)forall a.Compact# -> a -> State# RealWorld -> (# State# RealWorld, a #)compactAddWithSharing#{-| Return the total capacity (in bytes) of all the compact blocks     in the CNF. -}compactSize#::Compact#->State#(RealWorld)->(#State#(RealWorld),Word##)compactSize# :: Compact# -> State# RealWorld -> (# State# RealWorld, Word# #)compactSize#=Compact# -> State# RealWorld -> (# State# RealWorld, Word# #)compactSize#{-| Returns @1#@ if the given pointers are equal and @0#@ otherwise. -}reallyUnsafePtrEquality#::a_levpoly->b_levpoly->Int#reallyUnsafePtrEquality# :: forall a_levpoly b_levpoly. a_levpoly -> b_levpoly -> Int#reallyUnsafePtrEquality#=a_levpoly -> b_levpoly -> Int#forall a_levpoly b_levpoly. a_levpoly -> b_levpoly -> Int#reallyUnsafePtrEquality#{-# DEPRECATEDpar#" Use 'spark#' instead "#-}par#::a->Int#par# :: forall a. a -> Int#par#=a -> Int#forall a. a -> Int#par#spark#::a->State#s->(#State#s,a#)spark# :: forall a s. a -> State# s -> (# State# s, a #)spark#=a -> State# s -> (# State# s, a #)forall a s. a -> State# s -> (# State# s, a #)spark#seq#::a->State#s->(#State#s,a#)seq# :: forall a s. a -> State# s -> (# State# s, a #)seq#=a -> State# s -> (# State# s, a #)forall a s. a -> State# s -> (# State# s, a #)seq#getSpark#::State#s->(#State#s,Int#,a#)getSpark# :: forall s a. State# s -> (# State# s, Int#, a #)getSpark#=State# s -> (# State# s, Int#, a #)forall s a. State# s -> (# State# s, Int#, a #)getSpark#{-| Returns the number of sparks in the local spark pool. -}numSparks#::State#s->(#State#s,Int##)numSparks# :: forall s. State# s -> (# State# s, Int# #)numSparks#=State# s -> (# State# s, Int# #)forall s. State# s -> (# State# s, Int# #)numSparks#{-| @'keepAlive#' x s k@ keeps the value @x@ alive during the execution     of the computation @k@.     Note that the result type here isn't quite as unrestricted as the     polymorphic type might suggest; see the section \"RuntimeRep polymorphism     in continuation-style primops\" for details. -}keepAlive#::a_levpoly->State#s->(State#s->b_reppoly)->b_reppolykeepAlive# :: forall a_levpoly s b_reppoly.a_levpoly -> State# s -> (State# s -> b_reppoly) -> b_reppolykeepAlive#=a_levpoly -> State# s -> (State# s -> b_reppoly) -> b_reppolyforall a_levpoly s b_reppoly.a_levpoly -> State# s -> (State# s -> b_reppoly) -> b_reppolykeepAlive#{-| Used internally to implement @dataToTag#@: Use that function instead!     This one normally offers /no advantage/ and comes with no stability     guarantees: it may change its type, its name, or its behavior     with /no warning/ between compiler releases.     It is expected that this function will be un-exposed in a future     release of ghc.     For more details, look at @Note [DataToTag overview]@     in GHC.Tc.Instance.Class in the source code for     /the specific compiler version you are using./   -}{-# DEPRECATEDdataToTagSmall#" Use dataToTag# from \"GHC.Magic\" instead. "#-}dataToTagSmall#::a_levpoly->Int#dataToTagSmall# :: forall a. a -> Int#dataToTagSmall#=a_levpoly -> Int#forall a. a -> Int#dataToTagSmall#{-| Used internally to implement @dataToTag#@: Use that function instead!     This one offers /no advantage/ and comes with no stability     guarantees: it may change its type, its name, or its behavior     with /no warning/ between compiler releases.     It is expected that this function will be un-exposed in a future     release of ghc.     For more details, look at @Note [DataToTag overview]@     in GHC.Tc.Instance.Class in the source code for     /the specific compiler version you are using./   -}{-# DEPRECATEDdataToTagLarge#" Use dataToTag# from \"GHC.Magic\" instead. "#-}dataToTagLarge#::a_levpoly->Int#dataToTagLarge# :: forall a. a -> Int#dataToTagLarge#=a_levpoly -> Int#forall a. a -> Int#dataToTagLarge#tagToEnum#::Int#->atagToEnum# :: forall a. Int# -> atagToEnum#=letx :: tx=txinInt# -> aforall {t}. tx{-| Primitive bytecode type. -}dataBCO{-| Convert an 'Addr#' to a followable Any type. -}addrToAny#::Addr#->(#a_levpoly#)addrToAny# :: forall a_levpoly. Addr# -> (# a_levpoly #)addrToAny#=Addr# -> (# a_levpoly #)forall a_levpoly. Addr# -> (# a_levpoly #)addrToAny#{-| Retrieve the address of any Haskell value. This is     essentially an 'unsafeCoerce#', but if implemented as such     the core lint pass complains and fails to compile.     As a primop, it is opaque to core/stg, and only appears     in cmm (where the copy propagation pass will get rid of it).     Note that "a" must be a value, not a thunk! It's too late     for strictness analysis to enforce this, so you're on your     own to guarantee this. Also note that 'Addr#' is not a GC     pointer - up to you to guarantee that it does not become     a dangling pointer immediately after you get it.-}anyToAddr#::a->State#(RealWorld)->(#State#(RealWorld),Addr##)anyToAddr# :: forall a. a -> State# RealWorld -> (# State# RealWorld, Addr# #)anyToAddr#=a -> State# RealWorld -> (# State# RealWorld, Addr# #)forall a. a -> State# RealWorld -> (# State# RealWorld, Addr# #)anyToAddr#{-| Wrap a BCO in a @AP_UPD@ thunk which will be updated with the value of     the BCO when evaluated. -}mkApUpd0#::BCO->(#a#)mkApUpd0# :: forall a. BCO -> (# a #)mkApUpd0#=BCO -> (# a #)forall a. BCO -> (# a #)mkApUpd0#{-| @'newBCO#' instrs lits ptrs arity bitmap@ creates a new bytecode object. The     resulting object encodes a function of the given arity with the instructions     encoded in @instrs@, and a static reference table usage bitmap given by     @bitmap@. -}newBCO#::ByteArray#->ByteArray#->Array#a->Int#->ByteArray#->State#s->(#State#s,BCO#)newBCO# :: forall a s.ByteArray#-> ByteArray#-> Array# a-> Int#-> ByteArray#-> State# s-> (# State# s, BCO #)newBCO#=ByteArray#-> ByteArray#-> Array# a-> Int#-> ByteArray#-> State# s-> (# State# s, BCO #)forall a s.ByteArray#-> ByteArray#-> Array# a-> Int#-> ByteArray#-> State# s-> (# State# s, BCO #)newBCO#{-| @'unpackClosure#' closure@ copies the closure and pointers in the     payload of the given closure into two new arrays, and returns a pointer to     the first word of the closure's info table, a non-pointer array for the raw     bytes of the closure, and a pointer array for the pointers in the payload. -}unpackClosure#::a->(#Addr#,ByteArray#,Array#b#)unpackClosure# :: forall a b. a -> (# Addr#, ByteArray#, Array# b #)unpackClosure#=a -> (# Addr#, ByteArray#, Array# b #)forall a b. a -> (# Addr#, ByteArray#, Array# b #)unpackClosure#{-| @'closureSize#' closure@ returns the size of the given closure in     machine words. -}closureSize#::a->Int#closureSize# :: forall a. a -> Int#closureSize#=a -> Int#forall a. a -> Int#closureSize#getApStackVal#::a->Int#->(#Int#,b#)getApStackVal# :: forall a b. a -> Int# -> (# Int#, b #)getApStackVal#=a -> Int# -> (# Int#, b #)forall a b. a -> Int# -> (# Int#, b #)getApStackVal#getCCSOf#::a->State#s->(#State#s,Addr##)getCCSOf# :: forall a s. a -> State# s -> (# State# s, Addr# #)getCCSOf#=a -> State# s -> (# State# s, Addr# #)forall a s. a -> State# s -> (# State# s, Addr# #)getCCSOf#{-| Returns the current 'CostCentreStack' (value is @NULL@ if     not profiling).  Takes a dummy argument which can be used to     avoid the call to 'getCurrentCCS#' being floated out by the     simplifier, which would result in an uninformative stack     ("CAF"). -}getCurrentCCS#::a->State#s->(#State#s,Addr##)getCurrentCCS# :: forall a s. a -> State# s -> (# State# s, Addr# #)getCurrentCCS#=a -> State# s -> (# State# s, Addr# #)forall a s. a -> State# s -> (# State# s, Addr# #)getCurrentCCS#{-| Run the supplied IO action with an empty CCS.  For example, this     is used by the interpreter to run an interpreted computation     without the call stack showing that it was invoked from GHC. -}clearCCS#::(State#s->(#State#s,a#))->State#s->(#State#s,a#)clearCCS# :: forall s a.(State# s -> (# State# s, a #)) -> State# s -> (# State# s, a #)clearCCS#=(State# s -> (# State# s, a #)) -> State# s -> (# State# s, a #)forall s a.(State# s -> (# State# s, a #)) -> State# s -> (# State# s, a #)clearCCS#{-| Fills the given buffer with the @InfoProvEnt@ for the info table of the     given object. Returns @1#@ on success and @0#@ otherwise.-}whereFrom#::a->Addr#->State#s->(#State#s,Int##)whereFrom# :: forall a s. a -> Addr# -> State# s -> (# State# s, Int# #)whereFrom#=a -> Addr# -> State# s -> (# State# s, Int# #)forall a s. a -> Addr# -> State# s -> (# State# s, Int# #)whereFrom#{-|The builtin function type, written in infix form as @a % m -> b@.   Values of this type are functions taking inputs of type @a@ and   producing outputs of type @b@. The multiplicity of the input is   @m@.   Note that @'FUN' m a b@ permits representation polymorphism in both   @a@ and @b@, so that types like @'Int#' -> 'Int#'@ can still be   well-kinded.  -}dataFUNmab{-| The token used in the implementation of the IO monad as a state monad.     It does not pass any information at runtime.     See also 'GHC.Magic.runRW#'. -}realWorld#::State#(RealWorld)realWorld# :: State# RealWorldrealWorld#=State# RealWorldrealWorld#{-| This is an alias for the unboxed unit tuple constructor.     In earlier versions of GHC, 'void#' was a value     of the primitive type 'Void#', which is now defined to be @(# #)@.   -}{-# DEPRECATEDvoid#" Use an unboxed unit tuple instead "#-}void#::(##)void# :: (# #)void#=(# #)void#{-| The type constructor 'Proxy#' is used to bear witness to some   type variable. It's used when you want to pass around proxy values   for doing things like modelling type applications. A 'Proxy#'   is not only unboxed, it also has a polymorphic kind, and has no   runtime representation, being totally free. -}dataProxy#a{-| Witness for an unboxed 'Proxy#' value, which has no runtime   representation. -}proxy#::Proxy#aproxy# :: forall a. Proxy# aproxy#=Proxy# aforall a. Proxy# aproxy#{-| The value of @'seq' a b@ is bottom if @a@ is bottom, and     otherwise equal to @b@. In other words, it evaluates the first     argument @a@ to weak head normal form (WHNF). 'seq' is usually     introduced to improve performance by avoiding unneeded laziness.     A note on evaluation order: the expression @'seq' a b@ does     /not/ guarantee that @a@ will be evaluated before @b@.     The only guarantee given by 'seq' is that the both @a@     and @b@ will be evaluated before 'seq' returns a value.     In particular, this means that @b@ may be evaluated before     @a@. If you need to guarantee a specific order of evaluation,     you must use the function 'pseq' from the "parallel" package. -}infixr0`seq`seq::a->b_reppoly->b_reppolyseq :: forall a b_reppoly. a -> b_reppoly -> b_reppolyseq=a -> b_reppoly -> b_reppolyforall a b_reppoly. a -> b_reppoly -> b_reppolyseq{-| Emits an event via the RTS tracing framework.  The contents     of the event is the zero-terminated byte string passed as the first     argument.  The event will be emitted either to the @.eventlog@ file,     or to stderr, depending on the runtime RTS flags. -}traceEvent#::Addr#->State#s->State#straceEvent# :: forall s. Addr# -> State# s -> State# straceEvent#=Addr# -> State# s -> State# sforall s. Addr# -> State# s -> State# straceEvent#{-| Emits an event via the RTS tracing framework.  The contents     of the event is the binary object passed as the first argument with     the given length passed as the second argument. The event will be     emitted to the @.eventlog@ file. -}traceBinaryEvent#::Addr#->Int#->State#s->State#straceBinaryEvent# :: forall s. Addr# -> Int# -> State# s -> State# straceBinaryEvent#=Addr# -> Int# -> State# s -> State# sforall s. Addr# -> Int# -> State# s -> State# straceBinaryEvent#{-| Emits a marker event via the RTS tracing framework.  The contents     of the event is the zero-terminated byte string passed as the first     argument.  The event will be emitted either to the @.eventlog@ file,     or to stderr, depending on the runtime RTS flags. -}traceMarker#::Addr#->State#s->State#straceMarker# :: forall s. Addr# -> State# s -> State# straceMarker#=Addr# -> State# s -> State# sforall s. Addr# -> State# s -> State# straceMarker#{-| Sets the allocation counter for the current thread to the given value. -}setThreadAllocationCounter#::Int64#->State#(RealWorld)->State#(RealWorld)setThreadAllocationCounter# :: Int64# -> State# RealWorld -> State# RealWorldsetThreadAllocationCounter#=Int64# -> State# RealWorld -> State# RealWorldsetThreadAllocationCounter#{-| Haskell representation of a @StgStack*@ that was created (cloned)     with a function in "GHC.Stack.CloneStack". Please check the     documentation in that module for more detailed explanations. -}dataStackSnapshot#{-| The function 'coerce' allows you to safely convert between values of     types that have the same representation with no run-time overhead. In the     simplest case you can use it instead of a newtype constructor, to go from     the newtype's concrete type to the abstract type. But it also works in     more complicated settings, e.g. converting a list of newtypes to a list of     concrete types.     When used in conversions involving a newtype wrapper,     make sure the newtype constructor is in scope.     This function is representation-polymorphic, but the     'RuntimeRep' type argument is marked as 'Inferred', meaning     that it is not available for visible type application. This means     the typechecker will accept @'coerce' \@'Int' \@Age 42@.     === __Examples__     >>> newtype TTL = TTL Int deriving (Eq, Ord, Show)     >>> newtype Age = Age Int deriving (Eq, Ord, Show)     >>> coerce (Age 42) :: TTL     TTL 42     >>> coerce (+ (1 :: Int)) (Age 42) :: TTL     TTL 43     >>> coerce (map (+ (1 :: Int))) [Age 42, Age 24] :: [TTL]     [TTL 43,TTL 25]   -}coerce::Coercibleab=>a->bcoerce :: forall a b. Coercible a b => a -> bcoerce=a -> bforall a b. Coercible a b => a -> bcoerce{-|__/Warning:/__ this is only available on LLVM.-}dataInt8X16#{-|__/Warning:/__ this is only available on LLVM.-}dataInt16X8#{-|__/Warning:/__ this is only available on LLVM.-}dataInt32X4#{-|__/Warning:/__ this is only available on LLVM.-}dataInt64X2#{-|__/Warning:/__ this is only available on LLVM.-}dataInt8X32#{-|__/Warning:/__ this is only available on LLVM.-}dataInt16X16#{-|__/Warning:/__ this is only available on LLVM.-}dataInt32X8#{-|__/Warning:/__ this is only available on LLVM.-}dataInt64X4#{-|__/Warning:/__ this is only available on LLVM.-}dataInt8X64#{-|__/Warning:/__ this is only available on LLVM.-}dataInt16X32#{-|__/Warning:/__ this is only available on LLVM.-}dataInt32X16#{-|__/Warning:/__ this is only available on LLVM.-}dataInt64X8#{-|__/Warning:/__ this is only available on LLVM.-}dataWord8X16#{-|__/Warning:/__ this is only available on LLVM.-}dataWord16X8#{-|__/Warning:/__ this is only available on LLVM.-}dataWord32X4#{-|__/Warning:/__ this is only available on LLVM.-}dataWord64X2#{-|__/Warning:/__ this is only available on LLVM.-}dataWord8X32#{-|__/Warning:/__ this is only available on LLVM.-}dataWord16X16#{-|__/Warning:/__ this is only available on LLVM.-}dataWord32X8#{-|__/Warning:/__ this is only available on LLVM.-}dataWord64X4#{-|__/Warning:/__ this is only available on LLVM.-}dataWord8X64#{-|__/Warning:/__ this is only available on LLVM.-}dataWord16X32#{-|__/Warning:/__ this is only available on LLVM.-}dataWord32X16#{-|__/Warning:/__ this is only available on LLVM.-}dataWord64X8#{-|__/Warning:/__ this is only available on LLVM.-}dataFloatX4#{-|__/Warning:/__ this is only available on LLVM.-}dataDoubleX2#{-|__/Warning:/__ this is only available on LLVM.-}dataFloatX8#{-|__/Warning:/__ this is only available on LLVM.-}dataDoubleX4#{-|__/Warning:/__ this is only available on LLVM.-}dataFloatX16#{-|__/Warning:/__ this is only available on LLVM.-}dataDoubleX8#{-| Broadcast a scalar to all elements of a vector. __/Warning:/__ this is only available on LLVM.-}broadcastInt8X16#::Int8#->Int8X16#broadcastInt8X16# :: Int8# -> Int8X16#broadcastInt8X16#=Int8# -> Int8X16#broadcastInt8X16#{-| Broadcast a scalar to all elements of a vector. __/Warning:/__ this is only available on LLVM.-}broadcastInt16X8#::Int16#->Int16X8#broadcastInt16X8# :: Int16# -> Int16X8#broadcastInt16X8#=Int16# -> Int16X8#broadcastInt16X8#{-| Broadcast a scalar to all elements of a vector. __/Warning:/__ this is only available on LLVM.-}broadcastInt32X4#::Int32#->Int32X4#broadcastInt32X4# :: Int32# -> Int32X4#broadcastInt32X4#=Int32# -> Int32X4#broadcastInt32X4#{-| Broadcast a scalar to all elements of a vector. __/Warning:/__ this is only available on LLVM.-}broadcastInt64X2#::Int64#->Int64X2#broadcastInt64X2# :: Int64# -> Int64X2#broadcastInt64X2#=Int64# -> Int64X2#broadcastInt64X2#{-| Broadcast a scalar to all elements of a vector. __/Warning:/__ this is only available on LLVM.-}broadcastInt8X32#::Int8#->Int8X32#broadcastInt8X32# :: Int8# -> Int8X32#broadcastInt8X32#=Int8# -> Int8X32#broadcastInt8X32#{-| Broadcast a scalar to all elements of a vector. __/Warning:/__ this is only available on LLVM.-}broadcastInt16X16#::Int16#->Int16X16#broadcastInt16X16# :: Int16# -> Int16X16#broadcastInt16X16#=Int16# -> Int16X16#broadcastInt16X16#{-| Broadcast a scalar to all elements of a vector. __/Warning:/__ this is only available on LLVM.-}broadcastInt32X8#::Int32#->Int32X8#broadcastInt32X8# :: Int32# -> Int32X8#broadcastInt32X8#=Int32# -> Int32X8#broadcastInt32X8#{-| Broadcast a scalar to all elements of a vector. __/Warning:/__ this is only available on LLVM.-}broadcastInt64X4#::Int64#->Int64X4#broadcastInt64X4# :: Int64# -> Int64X4#broadcastInt64X4#=Int64# -> Int64X4#broadcastInt64X4#{-| Broadcast a scalar to all elements of a vector. __/Warning:/__ this is only available on LLVM.-}broadcastInt8X64#::Int8#->Int8X64#broadcastInt8X64# :: Int8# -> Int8X64#broadcastInt8X64#=Int8# -> Int8X64#broadcastInt8X64#{-| Broadcast a scalar to all elements of a vector. __/Warning:/__ this is only available on LLVM.-}broadcastInt16X32#::Int16#->Int16X32#broadcastInt16X32# :: Int16# -> Int16X32#broadcastInt16X32#=Int16# -> Int16X32#broadcastInt16X32#{-| Broadcast a scalar to all elements of a vector. __/Warning:/__ this is only available on LLVM.-}broadcastInt32X16#::Int32#->Int32X16#broadcastInt32X16# :: Int32# -> Int32X16#broadcastInt32X16#=Int32# -> Int32X16#broadcastInt32X16#{-| Broadcast a scalar to all elements of a vector. __/Warning:/__ this is only available on LLVM.-}broadcastInt64X8#::Int64#->Int64X8#broadcastInt64X8# :: Int64# -> Int64X8#broadcastInt64X8#=Int64# -> Int64X8#broadcastInt64X8#{-| Broadcast a scalar to all elements of a vector. __/Warning:/__ this is only available on LLVM.-}broadcastWord8X16#::Word8#->Word8X16#broadcastWord8X16# :: Word8# -> Word8X16#broadcastWord8X16#=Word8# -> Word8X16#broadcastWord8X16#{-| Broadcast a scalar to all elements of a vector. __/Warning:/__ this is only available on LLVM.-}broadcastWord16X8#::Word16#->Word16X8#broadcastWord16X8# :: Word16# -> Word16X8#broadcastWord16X8#=Word16# -> Word16X8#broadcastWord16X8#{-| Broadcast a scalar to all elements of a vector. __/Warning:/__ this is only available on LLVM.-}broadcastWord32X4#::Word32#->Word32X4#broadcastWord32X4# :: Word32# -> Word32X4#broadcastWord32X4#=Word32# -> Word32X4#broadcastWord32X4#{-| Broadcast a scalar to all elements of a vector. __/Warning:/__ this is only available on LLVM.-}broadcastWord64X2#::Word64#->Word64X2#broadcastWord64X2# :: Word64# -> Word64X2#broadcastWord64X2#=Word64# -> Word64X2#broadcastWord64X2#{-| Broadcast a scalar to all elements of a vector. __/Warning:/__ this is only available on LLVM.-}broadcastWord8X32#::Word8#->Word8X32#broadcastWord8X32# :: Word8# -> Word8X32#broadcastWord8X32#=Word8# -> Word8X32#broadcastWord8X32#{-| Broadcast a scalar to all elements of a vector. __/Warning:/__ this is only available on LLVM.-}broadcastWord16X16#::Word16#->Word16X16#broadcastWord16X16# :: Word16# -> Word16X16#broadcastWord16X16#=Word16# -> Word16X16#broadcastWord16X16#{-| Broadcast a scalar to all elements of a vector. __/Warning:/__ this is only available on LLVM.-}broadcastWord32X8#::Word32#->Word32X8#broadcastWord32X8# :: Word32# -> Word32X8#broadcastWord32X8#=Word32# -> Word32X8#broadcastWord32X8#{-| Broadcast a scalar to all elements of a vector. __/Warning:/__ this is only available on LLVM.-}broadcastWord64X4#::Word64#->Word64X4#broadcastWord64X4# :: Word64# -> Word64X4#broadcastWord64X4#=Word64# -> Word64X4#broadcastWord64X4#{-| Broadcast a scalar to all elements of a vector. __/Warning:/__ this is only available on LLVM.-}broadcastWord8X64#::Word8#->Word8X64#broadcastWord8X64# :: Word8# -> Word8X64#broadcastWord8X64#=Word8# -> Word8X64#broadcastWord8X64#{-| Broadcast a scalar to all elements of a vector. __/Warning:/__ this is only available on LLVM.-}broadcastWord16X32#::Word16#->Word16X32#broadcastWord16X32# :: Word16# -> Word16X32#broadcastWord16X32#=Word16# -> Word16X32#broadcastWord16X32#{-| Broadcast a scalar to all elements of a vector. __/Warning:/__ this is only available on LLVM.-}broadcastWord32X16#::Word32#->Word32X16#broadcastWord32X16# :: Word32# -> Word32X16#broadcastWord32X16#=Word32# -> Word32X16#broadcastWord32X16#{-| Broadcast a scalar to all elements of a vector. __/Warning:/__ this is only available on LLVM.-}broadcastWord64X8#::Word64#->Word64X8#broadcastWord64X8# :: Word64# -> Word64X8#broadcastWord64X8#=Word64# -> Word64X8#broadcastWord64X8#{-| Broadcast a scalar to all elements of a vector. __/Warning:/__ this is only available on LLVM.-}broadcastFloatX4#::Float#->FloatX4#broadcastFloatX4# :: Float# -> FloatX4#broadcastFloatX4#=Float# -> FloatX4#broadcastFloatX4#{-| Broadcast a scalar to all elements of a vector. __/Warning:/__ this is only available on LLVM.-}broadcastDoubleX2#::Double#->DoubleX2#broadcastDoubleX2# :: Double# -> DoubleX2#broadcastDoubleX2#=Double# -> DoubleX2#broadcastDoubleX2#{-| Broadcast a scalar to all elements of a vector. __/Warning:/__ this is only available on LLVM.-}broadcastFloatX8#::Float#->FloatX8#broadcastFloatX8# :: Float# -> FloatX8#broadcastFloatX8#=Float# -> FloatX8#broadcastFloatX8#{-| Broadcast a scalar to all elements of a vector. __/Warning:/__ this is only available on LLVM.-}broadcastDoubleX4#::Double#->DoubleX4#broadcastDoubleX4# :: Double# -> DoubleX4#broadcastDoubleX4#=Double# -> DoubleX4#broadcastDoubleX4#{-| Broadcast a scalar to all elements of a vector. __/Warning:/__ this is only available on LLVM.-}broadcastFloatX16#::Float#->FloatX16#broadcastFloatX16# :: Float# -> FloatX16#broadcastFloatX16#=Float# -> FloatX16#broadcastFloatX16#{-| Broadcast a scalar to all elements of a vector. __/Warning:/__ this is only available on LLVM.-}broadcastDoubleX8#::Double#->DoubleX8#broadcastDoubleX8# :: Double# -> DoubleX8#broadcastDoubleX8#=Double# -> DoubleX8#broadcastDoubleX8#{-| Pack the elements of an unboxed tuple into a vector. __/Warning:/__ this is only available on LLVM.-}packInt8X16#::(#Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8##)->Int8X16#packInt8X16# :: (# Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#,   Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8# #)-> Int8X16#packInt8X16#=(# Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#,   Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8# #)-> Int8X16#packInt8X16#{-| Pack the elements of an unboxed tuple into a vector. __/Warning:/__ this is only available on LLVM.-}packInt16X8#::(#Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16##)->Int16X8#packInt16X8# :: (# Int16#, Int16#, Int16#, Int16#, Int16#, Int16#, Int16#,   Int16# #)-> Int16X8#packInt16X8#=(# Int16#, Int16#, Int16#, Int16#, Int16#, Int16#, Int16#,   Int16# #)-> Int16X8#packInt16X8#{-| Pack the elements of an unboxed tuple into a vector. __/Warning:/__ this is only available on LLVM.-}packInt32X4#::(#Int32#,Int32#,Int32#,Int32##)->Int32X4#packInt32X4# :: (# Int32#, Int32#, Int32#, Int32# #) -> Int32X4#packInt32X4#=(# Int32#, Int32#, Int32#, Int32# #) -> Int32X4#packInt32X4#{-| Pack the elements of an unboxed tuple into a vector. __/Warning:/__ this is only available on LLVM.-}packInt64X2#::(#Int64#,Int64##)->Int64X2#packInt64X2# :: (# Int64#, Int64# #) -> Int64X2#packInt64X2#=(# Int64#, Int64# #) -> Int64X2#packInt64X2#{-| Pack the elements of an unboxed tuple into a vector. __/Warning:/__ this is only available on LLVM.-}packInt8X32#::(#Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8##)->Int8X32#packInt8X32# :: (# Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#,   Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#,   Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#,   Int8#, Int8#, Int8#, Int8#, Int8# #)-> Int8X32#packInt8X32#=(# Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#,   Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#,   Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#,   Int8#, Int8#, Int8#, Int8#, Int8# #)-> Int8X32#packInt8X32#{-| Pack the elements of an unboxed tuple into a vector. __/Warning:/__ this is only available on LLVM.-}packInt16X16#::(#Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16##)->Int16X16#packInt16X16# :: (# Int16#, Int16#, Int16#, Int16#, Int16#, Int16#, Int16#, Int16#,   Int16#, Int16#, Int16#, Int16#, Int16#, Int16#, Int16#, Int16# #)-> Int16X16#packInt16X16#=(# Int16#, Int16#, Int16#, Int16#, Int16#, Int16#, Int16#, Int16#,   Int16#, Int16#, Int16#, Int16#, Int16#, Int16#, Int16#, Int16# #)-> Int16X16#packInt16X16#{-| Pack the elements of an unboxed tuple into a vector. __/Warning:/__ this is only available on LLVM.-}packInt32X8#::(#Int32#,Int32#,Int32#,Int32#,Int32#,Int32#,Int32#,Int32##)->Int32X8#packInt32X8# :: (# Int32#, Int32#, Int32#, Int32#, Int32#, Int32#, Int32#,   Int32# #)-> Int32X8#packInt32X8#=(# Int32#, Int32#, Int32#, Int32#, Int32#, Int32#, Int32#,   Int32# #)-> Int32X8#packInt32X8#{-| Pack the elements of an unboxed tuple into a vector. __/Warning:/__ this is only available on LLVM.-}packInt64X4#::(#Int64#,Int64#,Int64#,Int64##)->Int64X4#packInt64X4# :: (# Int64#, Int64#, Int64#, Int64# #) -> Int64X4#packInt64X4#=(# Int64#, Int64#, Int64#, Int64# #) -> Int64X4#packInt64X4#{-| Pack the elements of an unboxed tuple into a vector. __/Warning:/__ this is only available on LLVM.-}packInt8X64#::(#Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8##)->Int8X64#packInt8X64# :: (# Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#,   Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#,   Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#,   Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#,   Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#,   Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#,   Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#,   Int8# #)-> Int8X64#packInt8X64#=(# Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#,   Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#,   Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#,   Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#,   Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#,   Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#,   Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#,   Int8# #)-> Int8X64#packInt8X64#{-| Pack the elements of an unboxed tuple into a vector. __/Warning:/__ this is only available on LLVM.-}packInt16X32#::(#Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16##)->Int16X32#packInt16X32# :: (# Int16#, Int16#, Int16#, Int16#, Int16#, Int16#, Int16#, Int16#,   Int16#, Int16#, Int16#, Int16#, Int16#, Int16#, Int16#, Int16#,   Int16#, Int16#, Int16#, Int16#, Int16#, Int16#, Int16#, Int16#,   Int16#, Int16#, Int16#, Int16#, Int16#, Int16#, Int16#, Int16# #)-> Int16X32#packInt16X32#=(# Int16#, Int16#, Int16#, Int16#, Int16#, Int16#, Int16#, Int16#,   Int16#, Int16#, Int16#, Int16#, Int16#, Int16#, Int16#, Int16#,   Int16#, Int16#, Int16#, Int16#, Int16#, Int16#, Int16#, Int16#,   Int16#, Int16#, Int16#, Int16#, Int16#, Int16#, Int16#, Int16# #)-> Int16X32#packInt16X32#{-| Pack the elements of an unboxed tuple into a vector. __/Warning:/__ this is only available on LLVM.-}packInt32X16#::(#Int32#,Int32#,Int32#,Int32#,Int32#,Int32#,Int32#,Int32#,Int32#,Int32#,Int32#,Int32#,Int32#,Int32#,Int32#,Int32##)->Int32X16#packInt32X16# :: (# Int32#, Int32#, Int32#, Int32#, Int32#, Int32#, Int32#, Int32#,   Int32#, Int32#, Int32#, Int32#, Int32#, Int32#, Int32#, Int32# #)-> Int32X16#packInt32X16#=(# Int32#, Int32#, Int32#, Int32#, Int32#, Int32#, Int32#, Int32#,   Int32#, Int32#, Int32#, Int32#, Int32#, Int32#, Int32#, Int32# #)-> Int32X16#packInt32X16#{-| Pack the elements of an unboxed tuple into a vector. __/Warning:/__ this is only available on LLVM.-}packInt64X8#::(#Int64#,Int64#,Int64#,Int64#,Int64#,Int64#,Int64#,Int64##)->Int64X8#packInt64X8# :: (# Int64#, Int64#, Int64#, Int64#, Int64#, Int64#, Int64#,   Int64# #)-> Int64X8#packInt64X8#=(# Int64#, Int64#, Int64#, Int64#, Int64#, Int64#, Int64#,   Int64# #)-> Int64X8#packInt64X8#{-| Pack the elements of an unboxed tuple into a vector. __/Warning:/__ this is only available on LLVM.-}packWord8X16#::(#Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8##)->Word8X16#packWord8X16# :: (# Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#,   Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8# #)-> Word8X16#packWord8X16#=(# Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#,   Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8# #)-> Word8X16#packWord8X16#{-| Pack the elements of an unboxed tuple into a vector. __/Warning:/__ this is only available on LLVM.-}packWord16X8#::(#Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16##)->Word16X8#packWord16X8# :: (# Word16#, Word16#, Word16#, Word16#, Word16#, Word16#, Word16#,   Word16# #)-> Word16X8#packWord16X8#=(# Word16#, Word16#, Word16#, Word16#, Word16#, Word16#, Word16#,   Word16# #)-> Word16X8#packWord16X8#{-| Pack the elements of an unboxed tuple into a vector. __/Warning:/__ this is only available on LLVM.-}packWord32X4#::(#Word32#,Word32#,Word32#,Word32##)->Word32X4#packWord32X4# :: (# Word32#, Word32#, Word32#, Word32# #) -> Word32X4#packWord32X4#=(# Word32#, Word32#, Word32#, Word32# #) -> Word32X4#packWord32X4#{-| Pack the elements of an unboxed tuple into a vector. __/Warning:/__ this is only available on LLVM.-}packWord64X2#::(#Word64#,Word64##)->Word64X2#packWord64X2# :: (# Word64#, Word64# #) -> Word64X2#packWord64X2#=(# Word64#, Word64# #) -> Word64X2#packWord64X2#{-| Pack the elements of an unboxed tuple into a vector. __/Warning:/__ this is only available on LLVM.-}packWord8X32#::(#Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8##)->Word8X32#packWord8X32# :: (# Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#,   Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#,   Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#,   Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8# #)-> Word8X32#packWord8X32#=(# Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#,   Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#,   Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#,   Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8# #)-> Word8X32#packWord8X32#{-| Pack the elements of an unboxed tuple into a vector. __/Warning:/__ this is only available on LLVM.-}packWord16X16#::(#Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16##)->Word16X16#packWord16X16# :: (# Word16#, Word16#, Word16#, Word16#, Word16#, Word16#, Word16#,   Word16#, Word16#, Word16#, Word16#, Word16#, Word16#, Word16#,   Word16#, Word16# #)-> Word16X16#packWord16X16#=(# Word16#, Word16#, Word16#, Word16#, Word16#, Word16#, Word16#,   Word16#, Word16#, Word16#, Word16#, Word16#, Word16#, Word16#,   Word16#, Word16# #)-> Word16X16#packWord16X16#{-| Pack the elements of an unboxed tuple into a vector. __/Warning:/__ this is only available on LLVM.-}packWord32X8#::(#Word32#,Word32#,Word32#,Word32#,Word32#,Word32#,Word32#,Word32##)->Word32X8#packWord32X8# :: (# Word32#, Word32#, Word32#, Word32#, Word32#, Word32#, Word32#,   Word32# #)-> Word32X8#packWord32X8#=(# Word32#, Word32#, Word32#, Word32#, Word32#, Word32#, Word32#,   Word32# #)-> Word32X8#packWord32X8#{-| Pack the elements of an unboxed tuple into a vector. __/Warning:/__ this is only available on LLVM.-}packWord64X4#::(#Word64#,Word64#,Word64#,Word64##)->Word64X4#packWord64X4# :: (# Word64#, Word64#, Word64#, Word64# #) -> Word64X4#packWord64X4#=(# Word64#, Word64#, Word64#, Word64# #) -> Word64X4#packWord64X4#{-| Pack the elements of an unboxed tuple into a vector. __/Warning:/__ this is only available on LLVM.-}packWord8X64#::(#Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8##)->Word8X64#packWord8X64# :: (# Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#,   Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#,   Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#,   Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#,   Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#,   Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#,   Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#,   Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8# #)-> Word8X64#packWord8X64#=(# Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#,   Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#,   Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#,   Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#,   Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#,   Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#,   Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#,   Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8# #)-> Word8X64#packWord8X64#{-| Pack the elements of an unboxed tuple into a vector. __/Warning:/__ this is only available on LLVM.-}packWord16X32#::(#Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16##)->Word16X32#packWord16X32# :: (# Word16#, Word16#, Word16#, Word16#, Word16#, Word16#, Word16#,   Word16#, Word16#, Word16#, Word16#, Word16#, Word16#, Word16#,   Word16#, Word16#, Word16#, Word16#, Word16#, Word16#, Word16#,   Word16#, Word16#, Word16#, Word16#, Word16#, Word16#, Word16#,   Word16#, Word16#, Word16#, Word16# #)-> Word16X32#packWord16X32#=(# Word16#, Word16#, Word16#, Word16#, Word16#, Word16#, Word16#,   Word16#, Word16#, Word16#, Word16#, Word16#, Word16#, Word16#,   Word16#, Word16#, Word16#, Word16#, Word16#, Word16#, Word16#,   Word16#, Word16#, Word16#, Word16#, Word16#, Word16#, Word16#,   Word16#, Word16#, Word16#, Word16# #)-> Word16X32#packWord16X32#{-| Pack the elements of an unboxed tuple into a vector. __/Warning:/__ this is only available on LLVM.-}packWord32X16#::(#Word32#,Word32#,Word32#,Word32#,Word32#,Word32#,Word32#,Word32#,Word32#,Word32#,Word32#,Word32#,Word32#,Word32#,Word32#,Word32##)->Word32X16#packWord32X16# :: (# Word32#, Word32#, Word32#, Word32#, Word32#, Word32#, Word32#,   Word32#, Word32#, Word32#, Word32#, Word32#, Word32#, Word32#,   Word32#, Word32# #)-> Word32X16#packWord32X16#=(# Word32#, Word32#, Word32#, Word32#, Word32#, Word32#, Word32#,   Word32#, Word32#, Word32#, Word32#, Word32#, Word32#, Word32#,   Word32#, Word32# #)-> Word32X16#packWord32X16#{-| Pack the elements of an unboxed tuple into a vector. __/Warning:/__ this is only available on LLVM.-}packWord64X8#::(#Word64#,Word64#,Word64#,Word64#,Word64#,Word64#,Word64#,Word64##)->Word64X8#packWord64X8# :: (# Word64#, Word64#, Word64#, Word64#, Word64#, Word64#, Word64#,   Word64# #)-> Word64X8#packWord64X8#=(# Word64#, Word64#, Word64#, Word64#, Word64#, Word64#, Word64#,   Word64# #)-> Word64X8#packWord64X8#{-| Pack the elements of an unboxed tuple into a vector. __/Warning:/__ this is only available on LLVM.-}packFloatX4#::(#Float#,Float#,Float#,Float##)->FloatX4#packFloatX4# :: (# Float#, Float#, Float#, Float# #) -> FloatX4#packFloatX4#=(# Float#, Float#, Float#, Float# #) -> FloatX4#packFloatX4#{-| Pack the elements of an unboxed tuple into a vector. __/Warning:/__ this is only available on LLVM.-}packDoubleX2#::(#Double#,Double##)->DoubleX2#packDoubleX2# :: (# Double#, Double# #) -> DoubleX2#packDoubleX2#=(# Double#, Double# #) -> DoubleX2#packDoubleX2#{-| Pack the elements of an unboxed tuple into a vector. __/Warning:/__ this is only available on LLVM.-}packFloatX8#::(#Float#,Float#,Float#,Float#,Float#,Float#,Float#,Float##)->FloatX8#packFloatX8# :: (# Float#, Float#, Float#, Float#, Float#, Float#, Float#,   Float# #)-> FloatX8#packFloatX8#=(# Float#, Float#, Float#, Float#, Float#, Float#, Float#,   Float# #)-> FloatX8#packFloatX8#{-| Pack the elements of an unboxed tuple into a vector. __/Warning:/__ this is only available on LLVM.-}packDoubleX4#::(#Double#,Double#,Double#,Double##)->DoubleX4#packDoubleX4# :: (# Double#, Double#, Double#, Double# #) -> DoubleX4#packDoubleX4#=(# Double#, Double#, Double#, Double# #) -> DoubleX4#packDoubleX4#{-| Pack the elements of an unboxed tuple into a vector. __/Warning:/__ this is only available on LLVM.-}packFloatX16#::(#Float#,Float#,Float#,Float#,Float#,Float#,Float#,Float#,Float#,Float#,Float#,Float#,Float#,Float#,Float#,Float##)->FloatX16#packFloatX16# :: (# Float#, Float#, Float#, Float#, Float#, Float#, Float#, Float#,   Float#, Float#, Float#, Float#, Float#, Float#, Float#, Float# #)-> FloatX16#packFloatX16#=(# Float#, Float#, Float#, Float#, Float#, Float#, Float#, Float#,   Float#, Float#, Float#, Float#, Float#, Float#, Float#, Float# #)-> FloatX16#packFloatX16#{-| Pack the elements of an unboxed tuple into a vector. __/Warning:/__ this is only available on LLVM.-}packDoubleX8#::(#Double#,Double#,Double#,Double#,Double#,Double#,Double#,Double##)->DoubleX8#packDoubleX8# :: (# Double#, Double#, Double#, Double#, Double#, Double#, Double#,   Double# #)-> DoubleX8#packDoubleX8#=(# Double#, Double#, Double#, Double#, Double#, Double#, Double#,   Double# #)-> DoubleX8#packDoubleX8#{-| Unpack the elements of a vector into an unboxed tuple. #__/Warning:/__ this is only available on LLVM.-}unpackInt8X16#::Int8X16#->(#Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8##)unpackInt8X16# :: Int8X16#-> (# Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#,      Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8# #)unpackInt8X16#=Int8X16#-> (# Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#,      Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8# #)unpackInt8X16#{-| Unpack the elements of a vector into an unboxed tuple. #__/Warning:/__ this is only available on LLVM.-}unpackInt16X8#::Int16X8#->(#Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16##)unpackInt16X8# :: Int16X8#-> (# Int16#, Int16#, Int16#, Int16#, Int16#, Int16#, Int16#,      Int16# #)unpackInt16X8#=Int16X8#-> (# Int16#, Int16#, Int16#, Int16#, Int16#, Int16#, Int16#,      Int16# #)unpackInt16X8#{-| Unpack the elements of a vector into an unboxed tuple. #__/Warning:/__ this is only available on LLVM.-}unpackInt32X4#::Int32X4#->(#Int32#,Int32#,Int32#,Int32##)unpackInt32X4# :: Int32X4# -> (# Int32#, Int32#, Int32#, Int32# #)unpackInt32X4#=Int32X4# -> (# Int32#, Int32#, Int32#, Int32# #)unpackInt32X4#{-| Unpack the elements of a vector into an unboxed tuple. #__/Warning:/__ this is only available on LLVM.-}unpackInt64X2#::Int64X2#->(#Int64#,Int64##)unpackInt64X2# :: Int64X2# -> (# Int64#, Int64# #)unpackInt64X2#=Int64X2# -> (# Int64#, Int64# #)unpackInt64X2#{-| Unpack the elements of a vector into an unboxed tuple. #__/Warning:/__ this is only available on LLVM.-}unpackInt8X32#::Int8X32#->(#Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8##)unpackInt8X32# :: Int8X32#-> (# Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#,      Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#,      Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#,      Int8#, Int8#, Int8#, Int8#, Int8#, Int8# #)unpackInt8X32#=Int8X32#-> (# Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#,      Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#,      Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#,      Int8#, Int8#, Int8#, Int8#, Int8#, Int8# #)unpackInt8X32#{-| Unpack the elements of a vector into an unboxed tuple. #__/Warning:/__ this is only available on LLVM.-}unpackInt16X16#::Int16X16#->(#Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16##)unpackInt16X16# :: Int16X16#-> (# Int16#, Int16#, Int16#, Int16#, Int16#, Int16#, Int16#,      Int16#, Int16#, Int16#, Int16#, Int16#, Int16#, Int16#, Int16#,      Int16# #)unpackInt16X16#=Int16X16#-> (# Int16#, Int16#, Int16#, Int16#, Int16#, Int16#, Int16#,      Int16#, Int16#, Int16#, Int16#, Int16#, Int16#, Int16#, Int16#,      Int16# #)unpackInt16X16#{-| Unpack the elements of a vector into an unboxed tuple. #__/Warning:/__ this is only available on LLVM.-}unpackInt32X8#::Int32X8#->(#Int32#,Int32#,Int32#,Int32#,Int32#,Int32#,Int32#,Int32##)unpackInt32X8# :: Int32X8#-> (# Int32#, Int32#, Int32#, Int32#, Int32#, Int32#, Int32#,      Int32# #)unpackInt32X8#=Int32X8#-> (# Int32#, Int32#, Int32#, Int32#, Int32#, Int32#, Int32#,      Int32# #)unpackInt32X8#{-| Unpack the elements of a vector into an unboxed tuple. #__/Warning:/__ this is only available on LLVM.-}unpackInt64X4#::Int64X4#->(#Int64#,Int64#,Int64#,Int64##)unpackInt64X4# :: Int64X4# -> (# Int64#, Int64#, Int64#, Int64# #)unpackInt64X4#=Int64X4# -> (# Int64#, Int64#, Int64#, Int64# #)unpackInt64X4#{-| Unpack the elements of a vector into an unboxed tuple. #__/Warning:/__ this is only available on LLVM.-}unpackInt8X64#::Int8X64#->(#Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8#,Int8##)unpackInt8X64# :: Int8X64#-> (# Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#,      Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#,      Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#,      Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#,      Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#,      Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#,      Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#,      Int8#, Int8# #)unpackInt8X64#=Int8X64#-> (# Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#,      Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#,      Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#,      Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#,      Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#,      Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#,      Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#, Int8#,      Int8#, Int8# #)unpackInt8X64#{-| Unpack the elements of a vector into an unboxed tuple. #__/Warning:/__ this is only available on LLVM.-}unpackInt16X32#::Int16X32#->(#Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16#,Int16##)unpackInt16X32# :: Int16X32#-> (# Int16#, Int16#, Int16#, Int16#, Int16#, Int16#, Int16#,      Int16#, Int16#, Int16#, Int16#, Int16#, Int16#, Int16#, Int16#,      Int16#, Int16#, Int16#, Int16#, Int16#, Int16#, Int16#, Int16#,      Int16#, Int16#, Int16#, Int16#, Int16#, Int16#, Int16#, Int16#,      Int16# #)unpackInt16X32#=Int16X32#-> (# Int16#, Int16#, Int16#, Int16#, Int16#, Int16#, Int16#,      Int16#, Int16#, Int16#, Int16#, Int16#, Int16#, Int16#, Int16#,      Int16#, Int16#, Int16#, Int16#, Int16#, Int16#, Int16#, Int16#,      Int16#, Int16#, Int16#, Int16#, Int16#, Int16#, Int16#, Int16#,      Int16# #)unpackInt16X32#{-| Unpack the elements of a vector into an unboxed tuple. #__/Warning:/__ this is only available on LLVM.-}unpackInt32X16#::Int32X16#->(#Int32#,Int32#,Int32#,Int32#,Int32#,Int32#,Int32#,Int32#,Int32#,Int32#,Int32#,Int32#,Int32#,Int32#,Int32#,Int32##)unpackInt32X16# :: Int32X16#-> (# Int32#, Int32#, Int32#, Int32#, Int32#, Int32#, Int32#,      Int32#, Int32#, Int32#, Int32#, Int32#, Int32#, Int32#, Int32#,      Int32# #)unpackInt32X16#=Int32X16#-> (# Int32#, Int32#, Int32#, Int32#, Int32#, Int32#, Int32#,      Int32#, Int32#, Int32#, Int32#, Int32#, Int32#, Int32#, Int32#,      Int32# #)unpackInt32X16#{-| Unpack the elements of a vector into an unboxed tuple. #__/Warning:/__ this is only available on LLVM.-}unpackInt64X8#::Int64X8#->(#Int64#,Int64#,Int64#,Int64#,Int64#,Int64#,Int64#,Int64##)unpackInt64X8# :: Int64X8#-> (# Int64#, Int64#, Int64#, Int64#, Int64#, Int64#, Int64#,      Int64# #)unpackInt64X8#=Int64X8#-> (# Int64#, Int64#, Int64#, Int64#, Int64#, Int64#, Int64#,      Int64# #)unpackInt64X8#{-| Unpack the elements of a vector into an unboxed tuple. #__/Warning:/__ this is only available on LLVM.-}unpackWord8X16#::Word8X16#->(#Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8##)unpackWord8X16# :: Word8X16#-> (# Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#,      Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#,      Word8# #)unpackWord8X16#=Word8X16#-> (# Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#,      Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#,      Word8# #)unpackWord8X16#{-| Unpack the elements of a vector into an unboxed tuple. #__/Warning:/__ this is only available on LLVM.-}unpackWord16X8#::Word16X8#->(#Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16##)unpackWord16X8# :: Word16X8#-> (# Word16#, Word16#, Word16#, Word16#, Word16#, Word16#,      Word16#, Word16# #)unpackWord16X8#=Word16X8#-> (# Word16#, Word16#, Word16#, Word16#, Word16#, Word16#,      Word16#, Word16# #)unpackWord16X8#{-| Unpack the elements of a vector into an unboxed tuple. #__/Warning:/__ this is only available on LLVM.-}unpackWord32X4#::Word32X4#->(#Word32#,Word32#,Word32#,Word32##)unpackWord32X4# :: Word32X4# -> (# Word32#, Word32#, Word32#, Word32# #)unpackWord32X4#=Word32X4# -> (# Word32#, Word32#, Word32#, Word32# #)unpackWord32X4#{-| Unpack the elements of a vector into an unboxed tuple. #__/Warning:/__ this is only available on LLVM.-}unpackWord64X2#::Word64X2#->(#Word64#,Word64##)unpackWord64X2# :: Word64X2# -> (# Word64#, Word64# #)unpackWord64X2#=Word64X2# -> (# Word64#, Word64# #)unpackWord64X2#{-| Unpack the elements of a vector into an unboxed tuple. #__/Warning:/__ this is only available on LLVM.-}unpackWord8X32#::Word8X32#->(#Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8##)unpackWord8X32# :: Word8X32#-> (# Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#,      Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#,      Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#,      Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#,      Word8# #)unpackWord8X32#=Word8X32#-> (# Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#,      Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#,      Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#,      Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#,      Word8# #)unpackWord8X32#{-| Unpack the elements of a vector into an unboxed tuple. #__/Warning:/__ this is only available on LLVM.-}unpackWord16X16#::Word16X16#->(#Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16##)unpackWord16X16# :: Word16X16#-> (# Word16#, Word16#, Word16#, Word16#, Word16#, Word16#,      Word16#, Word16#, Word16#, Word16#, Word16#, Word16#, Word16#,      Word16#, Word16#, Word16# #)unpackWord16X16#=Word16X16#-> (# Word16#, Word16#, Word16#, Word16#, Word16#, Word16#,      Word16#, Word16#, Word16#, Word16#, Word16#, Word16#, Word16#,      Word16#, Word16#, Word16# #)unpackWord16X16#{-| Unpack the elements of a vector into an unboxed tuple. #__/Warning:/__ this is only available on LLVM.-}unpackWord32X8#::Word32X8#->(#Word32#,Word32#,Word32#,Word32#,Word32#,Word32#,Word32#,Word32##)unpackWord32X8# :: Word32X8#-> (# Word32#, Word32#, Word32#, Word32#, Word32#, Word32#,      Word32#, Word32# #)unpackWord32X8#=Word32X8#-> (# Word32#, Word32#, Word32#, Word32#, Word32#, Word32#,      Word32#, Word32# #)unpackWord32X8#{-| Unpack the elements of a vector into an unboxed tuple. #__/Warning:/__ this is only available on LLVM.-}unpackWord64X4#::Word64X4#->(#Word64#,Word64#,Word64#,Word64##)unpackWord64X4# :: Word64X4# -> (# Word64#, Word64#, Word64#, Word64# #)unpackWord64X4#=Word64X4# -> (# Word64#, Word64#, Word64#, Word64# #)unpackWord64X4#{-| Unpack the elements of a vector into an unboxed tuple. #__/Warning:/__ this is only available on LLVM.-}unpackWord8X64#::Word8X64#->(#Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8#,Word8##)unpackWord8X64# :: Word8X64#-> (# Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#,      Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#,      Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#,      Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#,      Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#,      Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#,      Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#,      Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#,      Word8# #)unpackWord8X64#=Word8X64#-> (# Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#,      Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#,      Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#,      Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#,      Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#,      Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#,      Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#,      Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#, Word8#,      Word8# #)unpackWord8X64#{-| Unpack the elements of a vector into an unboxed tuple. #__/Warning:/__ this is only available on LLVM.-}unpackWord16X32#::Word16X32#->(#Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16#,Word16##)unpackWord16X32# :: Word16X32#-> (# Word16#, Word16#, Word16#, Word16#, Word16#, Word16#,      Word16#, Word16#, Word16#, Word16#, Word16#, Word16#, Word16#,      Word16#, Word16#, Word16#, Word16#, Word16#, Word16#, Word16#,      Word16#, Word16#, Word16#, Word16#, Word16#, Word16#, Word16#,      Word16#, Word16#, Word16#, Word16#, Word16# #)unpackWord16X32#=Word16X32#-> (# Word16#, Word16#, Word16#, Word16#, Word16#, Word16#,      Word16#, Word16#, Word16#, Word16#, Word16#, Word16#, Word16#,      Word16#, Word16#, Word16#, Word16#, Word16#, Word16#, Word16#,      Word16#, Word16#, Word16#, Word16#, Word16#, Word16#, Word16#,      Word16#, Word16#, Word16#, Word16#, Word16# #)unpackWord16X32#{-| Unpack the elements of a vector into an unboxed tuple. #__/Warning:/__ this is only available on LLVM.-}unpackWord32X16#::Word32X16#->(#Word32#,Word32#,Word32#,Word32#,Word32#,Word32#,Word32#,Word32#,Word32#,Word32#,Word32#,Word32#,Word32#,Word32#,Word32#,Word32##)unpackWord32X16# :: Word32X16#-> (# Word32#, Word32#, Word32#, Word32#, Word32#, Word32#,      Word32#, Word32#, Word32#, Word32#, Word32#, Word32#, Word32#,      Word32#, Word32#, Word32# #)unpackWord32X16#=Word32X16#-> (# Word32#, Word32#, Word32#, Word32#, Word32#, Word32#,      Word32#, Word32#, Word32#, Word32#, Word32#, Word32#, Word32#,      Word32#, Word32#, Word32# #)unpackWord32X16#{-| Unpack the elements of a vector into an unboxed tuple. #__/Warning:/__ this is only available on LLVM.-}unpackWord64X8#::Word64X8#->(#Word64#,Word64#,Word64#,Word64#,Word64#,Word64#,Word64#,Word64##)unpackWord64X8# :: Word64X8#-> (# Word64#, Word64#, Word64#, Word64#, Word64#, Word64#,      Word64#, Word64# #)unpackWord64X8#=Word64X8#-> (# Word64#, Word64#, Word64#, Word64#, Word64#, Word64#,      Word64#, Word64# #)unpackWord64X8#{-| Unpack the elements of a vector into an unboxed tuple. #__/Warning:/__ this is only available on LLVM.-}unpackFloatX4#::FloatX4#->(#Float#,Float#,Float#,Float##)unpackFloatX4# :: FloatX4# -> (# Float#, Float#, Float#, Float# #)unpackFloatX4#=FloatX4# -> (# Float#, Float#, Float#, Float# #)unpackFloatX4#{-| Unpack the elements of a vector into an unboxed tuple. #__/Warning:/__ this is only available on LLVM.-}unpackDoubleX2#::DoubleX2#->(#Double#,Double##)unpackDoubleX2# :: DoubleX2# -> (# Double#, Double# #)unpackDoubleX2#=DoubleX2# -> (# Double#, Double# #)unpackDoubleX2#{-| Unpack the elements of a vector into an unboxed tuple. #__/Warning:/__ this is only available on LLVM.-}unpackFloatX8#::FloatX8#->(#Float#,Float#,Float#,Float#,Float#,Float#,Float#,Float##)unpackFloatX8# :: FloatX8#-> (# Float#, Float#, Float#, Float#, Float#, Float#, Float#,      Float# #)unpackFloatX8#=FloatX8#-> (# Float#, Float#, Float#, Float#, Float#, Float#, Float#,      Float# #)unpackFloatX8#{-| Unpack the elements of a vector into an unboxed tuple. #__/Warning:/__ this is only available on LLVM.-}unpackDoubleX4#::DoubleX4#->(#Double#,Double#,Double#,Double##)unpackDoubleX4# :: DoubleX4# -> (# Double#, Double#, Double#, Double# #)unpackDoubleX4#=DoubleX4# -> (# Double#, Double#, Double#, Double# #)unpackDoubleX4#{-| Unpack the elements of a vector into an unboxed tuple. #__/Warning:/__ this is only available on LLVM.-}unpackFloatX16#::FloatX16#->(#Float#,Float#,Float#,Float#,Float#,Float#,Float#,Float#,Float#,Float#,Float#,Float#,Float#,Float#,Float#,Float##)unpackFloatX16# :: FloatX16#-> (# Float#, Float#, Float#, Float#, Float#, Float#, Float#,      Float#, Float#, Float#, Float#, Float#, Float#, Float#, Float#,      Float# #)unpackFloatX16#=FloatX16#-> (# Float#, Float#, Float#, Float#, Float#, Float#, Float#,      Float#, Float#, Float#, Float#, Float#, Float#, Float#, Float#,      Float# #)unpackFloatX16#{-| Unpack the elements of a vector into an unboxed tuple. #__/Warning:/__ this is only available on LLVM.-}unpackDoubleX8#::DoubleX8#->(#Double#,Double#,Double#,Double#,Double#,Double#,Double#,Double##)unpackDoubleX8# :: DoubleX8#-> (# Double#, Double#, Double#, Double#, Double#, Double#,      Double#, Double# #)unpackDoubleX8#=DoubleX8#-> (# Double#, Double#, Double#, Double#, Double#, Double#,      Double#, Double# #)unpackDoubleX8#{-| Insert a scalar at the given position in a vector. __/Warning:/__ this is only available on LLVM.-}insertInt8X16#::Int8X16#->Int8#->Int#->Int8X16#insertInt8X16# :: Int8X16# -> Int8# -> Int# -> Int8X16#insertInt8X16#=Int8X16# -> Int8# -> Int# -> Int8X16#insertInt8X16#{-| Insert a scalar at the given position in a vector. __/Warning:/__ this is only available on LLVM.-}insertInt16X8#::Int16X8#->Int16#->Int#->Int16X8#insertInt16X8# :: Int16X8# -> Int16# -> Int# -> Int16X8#insertInt16X8#=Int16X8# -> Int16# -> Int# -> Int16X8#insertInt16X8#{-| Insert a scalar at the given position in a vector. __/Warning:/__ this is only available on LLVM.-}insertInt32X4#::Int32X4#->Int32#->Int#->Int32X4#insertInt32X4# :: Int32X4# -> Int32# -> Int# -> Int32X4#insertInt32X4#=Int32X4# -> Int32# -> Int# -> Int32X4#insertInt32X4#{-| Insert a scalar at the given position in a vector. __/Warning:/__ this is only available on LLVM.-}insertInt64X2#::Int64X2#->Int64#->Int#->Int64X2#insertInt64X2# :: Int64X2# -> Int64# -> Int# -> Int64X2#insertInt64X2#=Int64X2# -> Int64# -> Int# -> Int64X2#insertInt64X2#{-| Insert a scalar at the given position in a vector. __/Warning:/__ this is only available on LLVM.-}insertInt8X32#::Int8X32#->Int8#->Int#->Int8X32#insertInt8X32# :: Int8X32# -> Int8# -> Int# -> Int8X32#insertInt8X32#=Int8X32# -> Int8# -> Int# -> Int8X32#insertInt8X32#{-| Insert a scalar at the given position in a vector. __/Warning:/__ this is only available on LLVM.-}insertInt16X16#::Int16X16#->Int16#->Int#->Int16X16#insertInt16X16# :: Int16X16# -> Int16# -> Int# -> Int16X16#insertInt16X16#=Int16X16# -> Int16# -> Int# -> Int16X16#insertInt16X16#{-| Insert a scalar at the given position in a vector. __/Warning:/__ this is only available on LLVM.-}insertInt32X8#::Int32X8#->Int32#->Int#->Int32X8#insertInt32X8# :: Int32X8# -> Int32# -> Int# -> Int32X8#insertInt32X8#=Int32X8# -> Int32# -> Int# -> Int32X8#insertInt32X8#{-| Insert a scalar at the given position in a vector. __/Warning:/__ this is only available on LLVM.-}insertInt64X4#::Int64X4#->Int64#->Int#->Int64X4#insertInt64X4# :: Int64X4# -> Int64# -> Int# -> Int64X4#insertInt64X4#=Int64X4# -> Int64# -> Int# -> Int64X4#insertInt64X4#{-| Insert a scalar at the given position in a vector. __/Warning:/__ this is only available on LLVM.-}insertInt8X64#::Int8X64#->Int8#->Int#->Int8X64#insertInt8X64# :: Int8X64# -> Int8# -> Int# -> Int8X64#insertInt8X64#=Int8X64# -> Int8# -> Int# -> Int8X64#insertInt8X64#{-| Insert a scalar at the given position in a vector. __/Warning:/__ this is only available on LLVM.-}insertInt16X32#::Int16X32#->Int16#->Int#->Int16X32#insertInt16X32# :: Int16X32# -> Int16# -> Int# -> Int16X32#insertInt16X32#=Int16X32# -> Int16# -> Int# -> Int16X32#insertInt16X32#{-| Insert a scalar at the given position in a vector. __/Warning:/__ this is only available on LLVM.-}insertInt32X16#::Int32X16#->Int32#->Int#->Int32X16#insertInt32X16# :: Int32X16# -> Int32# -> Int# -> Int32X16#insertInt32X16#=Int32X16# -> Int32# -> Int# -> Int32X16#insertInt32X16#{-| Insert a scalar at the given position in a vector. __/Warning:/__ this is only available on LLVM.-}insertInt64X8#::Int64X8#->Int64#->Int#->Int64X8#insertInt64X8# :: Int64X8# -> Int64# -> Int# -> Int64X8#insertInt64X8#=Int64X8# -> Int64# -> Int# -> Int64X8#insertInt64X8#{-| Insert a scalar at the given position in a vector. __/Warning:/__ this is only available on LLVM.-}insertWord8X16#::Word8X16#->Word8#->Int#->Word8X16#insertWord8X16# :: Word8X16# -> Word8# -> Int# -> Word8X16#insertWord8X16#=Word8X16# -> Word8# -> Int# -> Word8X16#insertWord8X16#{-| Insert a scalar at the given position in a vector. __/Warning:/__ this is only available on LLVM.-}insertWord16X8#::Word16X8#->Word16#->Int#->Word16X8#insertWord16X8# :: Word16X8# -> Word16# -> Int# -> Word16X8#insertWord16X8#=Word16X8# -> Word16# -> Int# -> Word16X8#insertWord16X8#{-| Insert a scalar at the given position in a vector. __/Warning:/__ this is only available on LLVM.-}insertWord32X4#::Word32X4#->Word32#->Int#->Word32X4#insertWord32X4# :: Word32X4# -> Word32# -> Int# -> Word32X4#insertWord32X4#=Word32X4# -> Word32# -> Int# -> Word32X4#insertWord32X4#{-| Insert a scalar at the given position in a vector. __/Warning:/__ this is only available on LLVM.-}insertWord64X2#::Word64X2#->Word64#->Int#->Word64X2#insertWord64X2# :: Word64X2# -> Word64# -> Int# -> Word64X2#insertWord64X2#=Word64X2# -> Word64# -> Int# -> Word64X2#insertWord64X2#{-| Insert a scalar at the given position in a vector. __/Warning:/__ this is only available on LLVM.-}insertWord8X32#::Word8X32#->Word8#->Int#->Word8X32#insertWord8X32# :: Word8X32# -> Word8# -> Int# -> Word8X32#insertWord8X32#=Word8X32# -> Word8# -> Int# -> Word8X32#insertWord8X32#{-| Insert a scalar at the given position in a vector. __/Warning:/__ this is only available on LLVM.-}insertWord16X16#::Word16X16#->Word16#->Int#->Word16X16#insertWord16X16# :: Word16X16# -> Word16# -> Int# -> Word16X16#insertWord16X16#=Word16X16# -> Word16# -> Int# -> Word16X16#insertWord16X16#{-| Insert a scalar at the given position in a vector. __/Warning:/__ this is only available on LLVM.-}insertWord32X8#::Word32X8#->Word32#->Int#->Word32X8#insertWord32X8# :: Word32X8# -> Word32# -> Int# -> Word32X8#insertWord32X8#=Word32X8# -> Word32# -> Int# -> Word32X8#insertWord32X8#{-| Insert a scalar at the given position in a vector. __/Warning:/__ this is only available on LLVM.-}insertWord64X4#::Word64X4#->Word64#->Int#->Word64X4#insertWord64X4# :: Word64X4# -> Word64# -> Int# -> Word64X4#insertWord64X4#=Word64X4# -> Word64# -> Int# -> Word64X4#insertWord64X4#{-| Insert a scalar at the given position in a vector. __/Warning:/__ this is only available on LLVM.-}insertWord8X64#::Word8X64#->Word8#->Int#->Word8X64#insertWord8X64# :: Word8X64# -> Word8# -> Int# -> Word8X64#insertWord8X64#=Word8X64# -> Word8# -> Int# -> Word8X64#insertWord8X64#{-| Insert a scalar at the given position in a vector. __/Warning:/__ this is only available on LLVM.-}insertWord16X32#::Word16X32#->Word16#->Int#->Word16X32#insertWord16X32# :: Word16X32# -> Word16# -> Int# -> Word16X32#insertWord16X32#=Word16X32# -> Word16# -> Int# -> Word16X32#insertWord16X32#{-| Insert a scalar at the given position in a vector. __/Warning:/__ this is only available on LLVM.-}insertWord32X16#::Word32X16#->Word32#->Int#->Word32X16#insertWord32X16# :: Word32X16# -> Word32# -> Int# -> Word32X16#insertWord32X16#=Word32X16# -> Word32# -> Int# -> Word32X16#insertWord32X16#{-| Insert a scalar at the given position in a vector. __/Warning:/__ this is only available on LLVM.-}insertWord64X8#::Word64X8#->Word64#->Int#->Word64X8#insertWord64X8# :: Word64X8# -> Word64# -> Int# -> Word64X8#insertWord64X8#=Word64X8# -> Word64# -> Int# -> Word64X8#insertWord64X8#{-| Insert a scalar at the given position in a vector. __/Warning:/__ this is only available on LLVM.-}insertFloatX4#::FloatX4#->Float#->Int#->FloatX4#insertFloatX4# :: FloatX4# -> Float# -> Int# -> FloatX4#insertFloatX4#=FloatX4# -> Float# -> Int# -> FloatX4#insertFloatX4#{-| Insert a scalar at the given position in a vector. __/Warning:/__ this is only available on LLVM.-}insertDoubleX2#::DoubleX2#->Double#->Int#->DoubleX2#insertDoubleX2# :: DoubleX2# -> Double# -> Int# -> DoubleX2#insertDoubleX2#=DoubleX2# -> Double# -> Int# -> DoubleX2#insertDoubleX2#{-| Insert a scalar at the given position in a vector. __/Warning:/__ this is only available on LLVM.-}insertFloatX8#::FloatX8#->Float#->Int#->FloatX8#insertFloatX8# :: FloatX8# -> Float# -> Int# -> FloatX8#insertFloatX8#=FloatX8# -> Float# -> Int# -> FloatX8#insertFloatX8#{-| Insert a scalar at the given position in a vector. __/Warning:/__ this is only available on LLVM.-}insertDoubleX4#::DoubleX4#->Double#->Int#->DoubleX4#insertDoubleX4# :: DoubleX4# -> Double# -> Int# -> DoubleX4#insertDoubleX4#=DoubleX4# -> Double# -> Int# -> DoubleX4#insertDoubleX4#{-| Insert a scalar at the given position in a vector. __/Warning:/__ this is only available on LLVM.-}insertFloatX16#::FloatX16#->Float#->Int#->FloatX16#insertFloatX16# :: FloatX16# -> Float# -> Int# -> FloatX16#insertFloatX16#=FloatX16# -> Float# -> Int# -> FloatX16#insertFloatX16#{-| Insert a scalar at the given position in a vector. __/Warning:/__ this is only available on LLVM.-}insertDoubleX8#::DoubleX8#->Double#->Int#->DoubleX8#insertDoubleX8# :: DoubleX8# -> Double# -> Int# -> DoubleX8#insertDoubleX8#=DoubleX8# -> Double# -> Int# -> DoubleX8#insertDoubleX8#{-| Add two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}plusInt8X16#::Int8X16#->Int8X16#->Int8X16#plusInt8X16# :: Int8X16# -> Int8X16# -> Int8X16#plusInt8X16#=Int8X16# -> Int8X16# -> Int8X16#plusInt8X16#{-| Add two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}plusInt16X8#::Int16X8#->Int16X8#->Int16X8#plusInt16X8# :: Int16X8# -> Int16X8# -> Int16X8#plusInt16X8#=Int16X8# -> Int16X8# -> Int16X8#plusInt16X8#{-| Add two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}plusInt32X4#::Int32X4#->Int32X4#->Int32X4#plusInt32X4# :: Int32X4# -> Int32X4# -> Int32X4#plusInt32X4#=Int32X4# -> Int32X4# -> Int32X4#plusInt32X4#{-| Add two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}plusInt64X2#::Int64X2#->Int64X2#->Int64X2#plusInt64X2# :: Int64X2# -> Int64X2# -> Int64X2#plusInt64X2#=Int64X2# -> Int64X2# -> Int64X2#plusInt64X2#{-| Add two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}plusInt8X32#::Int8X32#->Int8X32#->Int8X32#plusInt8X32# :: Int8X32# -> Int8X32# -> Int8X32#plusInt8X32#=Int8X32# -> Int8X32# -> Int8X32#plusInt8X32#{-| Add two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}plusInt16X16#::Int16X16#->Int16X16#->Int16X16#plusInt16X16# :: Int16X16# -> Int16X16# -> Int16X16#plusInt16X16#=Int16X16# -> Int16X16# -> Int16X16#plusInt16X16#{-| Add two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}plusInt32X8#::Int32X8#->Int32X8#->Int32X8#plusInt32X8# :: Int32X8# -> Int32X8# -> Int32X8#plusInt32X8#=Int32X8# -> Int32X8# -> Int32X8#plusInt32X8#{-| Add two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}plusInt64X4#::Int64X4#->Int64X4#->Int64X4#plusInt64X4# :: Int64X4# -> Int64X4# -> Int64X4#plusInt64X4#=Int64X4# -> Int64X4# -> Int64X4#plusInt64X4#{-| Add two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}plusInt8X64#::Int8X64#->Int8X64#->Int8X64#plusInt8X64# :: Int8X64# -> Int8X64# -> Int8X64#plusInt8X64#=Int8X64# -> Int8X64# -> Int8X64#plusInt8X64#{-| Add two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}plusInt16X32#::Int16X32#->Int16X32#->Int16X32#plusInt16X32# :: Int16X32# -> Int16X32# -> Int16X32#plusInt16X32#=Int16X32# -> Int16X32# -> Int16X32#plusInt16X32#{-| Add two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}plusInt32X16#::Int32X16#->Int32X16#->Int32X16#plusInt32X16# :: Int32X16# -> Int32X16# -> Int32X16#plusInt32X16#=Int32X16# -> Int32X16# -> Int32X16#plusInt32X16#{-| Add two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}plusInt64X8#::Int64X8#->Int64X8#->Int64X8#plusInt64X8# :: Int64X8# -> Int64X8# -> Int64X8#plusInt64X8#=Int64X8# -> Int64X8# -> Int64X8#plusInt64X8#{-| Add two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}plusWord8X16#::Word8X16#->Word8X16#->Word8X16#plusWord8X16# :: Word8X16# -> Word8X16# -> Word8X16#plusWord8X16#=Word8X16# -> Word8X16# -> Word8X16#plusWord8X16#{-| Add two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}plusWord16X8#::Word16X8#->Word16X8#->Word16X8#plusWord16X8# :: Word16X8# -> Word16X8# -> Word16X8#plusWord16X8#=Word16X8# -> Word16X8# -> Word16X8#plusWord16X8#{-| Add two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}plusWord32X4#::Word32X4#->Word32X4#->Word32X4#plusWord32X4# :: Word32X4# -> Word32X4# -> Word32X4#plusWord32X4#=Word32X4# -> Word32X4# -> Word32X4#plusWord32X4#{-| Add two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}plusWord64X2#::Word64X2#->Word64X2#->Word64X2#plusWord64X2# :: Word64X2# -> Word64X2# -> Word64X2#plusWord64X2#=Word64X2# -> Word64X2# -> Word64X2#plusWord64X2#{-| Add two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}plusWord8X32#::Word8X32#->Word8X32#->Word8X32#plusWord8X32# :: Word8X32# -> Word8X32# -> Word8X32#plusWord8X32#=Word8X32# -> Word8X32# -> Word8X32#plusWord8X32#{-| Add two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}plusWord16X16#::Word16X16#->Word16X16#->Word16X16#plusWord16X16# :: Word16X16# -> Word16X16# -> Word16X16#plusWord16X16#=Word16X16# -> Word16X16# -> Word16X16#plusWord16X16#{-| Add two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}plusWord32X8#::Word32X8#->Word32X8#->Word32X8#plusWord32X8# :: Word32X8# -> Word32X8# -> Word32X8#plusWord32X8#=Word32X8# -> Word32X8# -> Word32X8#plusWord32X8#{-| Add two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}plusWord64X4#::Word64X4#->Word64X4#->Word64X4#plusWord64X4# :: Word64X4# -> Word64X4# -> Word64X4#plusWord64X4#=Word64X4# -> Word64X4# -> Word64X4#plusWord64X4#{-| Add two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}plusWord8X64#::Word8X64#->Word8X64#->Word8X64#plusWord8X64# :: Word8X64# -> Word8X64# -> Word8X64#plusWord8X64#=Word8X64# -> Word8X64# -> Word8X64#plusWord8X64#{-| Add two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}plusWord16X32#::Word16X32#->Word16X32#->Word16X32#plusWord16X32# :: Word16X32# -> Word16X32# -> Word16X32#plusWord16X32#=Word16X32# -> Word16X32# -> Word16X32#plusWord16X32#{-| Add two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}plusWord32X16#::Word32X16#->Word32X16#->Word32X16#plusWord32X16# :: Word32X16# -> Word32X16# -> Word32X16#plusWord32X16#=Word32X16# -> Word32X16# -> Word32X16#plusWord32X16#{-| Add two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}plusWord64X8#::Word64X8#->Word64X8#->Word64X8#plusWord64X8# :: Word64X8# -> Word64X8# -> Word64X8#plusWord64X8#=Word64X8# -> Word64X8# -> Word64X8#plusWord64X8#{-| Add two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}plusFloatX4#::FloatX4#->FloatX4#->FloatX4#plusFloatX4# :: FloatX4# -> FloatX4# -> FloatX4#plusFloatX4#=FloatX4# -> FloatX4# -> FloatX4#plusFloatX4#{-| Add two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}plusDoubleX2#::DoubleX2#->DoubleX2#->DoubleX2#plusDoubleX2# :: DoubleX2# -> DoubleX2# -> DoubleX2#plusDoubleX2#=DoubleX2# -> DoubleX2# -> DoubleX2#plusDoubleX2#{-| Add two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}plusFloatX8#::FloatX8#->FloatX8#->FloatX8#plusFloatX8# :: FloatX8# -> FloatX8# -> FloatX8#plusFloatX8#=FloatX8# -> FloatX8# -> FloatX8#plusFloatX8#{-| Add two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}plusDoubleX4#::DoubleX4#->DoubleX4#->DoubleX4#plusDoubleX4# :: DoubleX4# -> DoubleX4# -> DoubleX4#plusDoubleX4#=DoubleX4# -> DoubleX4# -> DoubleX4#plusDoubleX4#{-| Add two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}plusFloatX16#::FloatX16#->FloatX16#->FloatX16#plusFloatX16# :: FloatX16# -> FloatX16# -> FloatX16#plusFloatX16#=FloatX16# -> FloatX16# -> FloatX16#plusFloatX16#{-| Add two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}plusDoubleX8#::DoubleX8#->DoubleX8#->DoubleX8#plusDoubleX8# :: DoubleX8# -> DoubleX8# -> DoubleX8#plusDoubleX8#=DoubleX8# -> DoubleX8# -> DoubleX8#plusDoubleX8#{-| Subtract two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}minusInt8X16#::Int8X16#->Int8X16#->Int8X16#minusInt8X16# :: Int8X16# -> Int8X16# -> Int8X16#minusInt8X16#=Int8X16# -> Int8X16# -> Int8X16#minusInt8X16#{-| Subtract two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}minusInt16X8#::Int16X8#->Int16X8#->Int16X8#minusInt16X8# :: Int16X8# -> Int16X8# -> Int16X8#minusInt16X8#=Int16X8# -> Int16X8# -> Int16X8#minusInt16X8#{-| Subtract two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}minusInt32X4#::Int32X4#->Int32X4#->Int32X4#minusInt32X4# :: Int32X4# -> Int32X4# -> Int32X4#minusInt32X4#=Int32X4# -> Int32X4# -> Int32X4#minusInt32X4#{-| Subtract two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}minusInt64X2#::Int64X2#->Int64X2#->Int64X2#minusInt64X2# :: Int64X2# -> Int64X2# -> Int64X2#minusInt64X2#=Int64X2# -> Int64X2# -> Int64X2#minusInt64X2#{-| Subtract two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}minusInt8X32#::Int8X32#->Int8X32#->Int8X32#minusInt8X32# :: Int8X32# -> Int8X32# -> Int8X32#minusInt8X32#=Int8X32# -> Int8X32# -> Int8X32#minusInt8X32#{-| Subtract two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}minusInt16X16#::Int16X16#->Int16X16#->Int16X16#minusInt16X16# :: Int16X16# -> Int16X16# -> Int16X16#minusInt16X16#=Int16X16# -> Int16X16# -> Int16X16#minusInt16X16#{-| Subtract two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}minusInt32X8#::Int32X8#->Int32X8#->Int32X8#minusInt32X8# :: Int32X8# -> Int32X8# -> Int32X8#minusInt32X8#=Int32X8# -> Int32X8# -> Int32X8#minusInt32X8#{-| Subtract two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}minusInt64X4#::Int64X4#->Int64X4#->Int64X4#minusInt64X4# :: Int64X4# -> Int64X4# -> Int64X4#minusInt64X4#=Int64X4# -> Int64X4# -> Int64X4#minusInt64X4#{-| Subtract two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}minusInt8X64#::Int8X64#->Int8X64#->Int8X64#minusInt8X64# :: Int8X64# -> Int8X64# -> Int8X64#minusInt8X64#=Int8X64# -> Int8X64# -> Int8X64#minusInt8X64#{-| Subtract two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}minusInt16X32#::Int16X32#->Int16X32#->Int16X32#minusInt16X32# :: Int16X32# -> Int16X32# -> Int16X32#minusInt16X32#=Int16X32# -> Int16X32# -> Int16X32#minusInt16X32#{-| Subtract two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}minusInt32X16#::Int32X16#->Int32X16#->Int32X16#minusInt32X16# :: Int32X16# -> Int32X16# -> Int32X16#minusInt32X16#=Int32X16# -> Int32X16# -> Int32X16#minusInt32X16#{-| Subtract two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}minusInt64X8#::Int64X8#->Int64X8#->Int64X8#minusInt64X8# :: Int64X8# -> Int64X8# -> Int64X8#minusInt64X8#=Int64X8# -> Int64X8# -> Int64X8#minusInt64X8#{-| Subtract two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}minusWord8X16#::Word8X16#->Word8X16#->Word8X16#minusWord8X16# :: Word8X16# -> Word8X16# -> Word8X16#minusWord8X16#=Word8X16# -> Word8X16# -> Word8X16#minusWord8X16#{-| Subtract two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}minusWord16X8#::Word16X8#->Word16X8#->Word16X8#minusWord16X8# :: Word16X8# -> Word16X8# -> Word16X8#minusWord16X8#=Word16X8# -> Word16X8# -> Word16X8#minusWord16X8#{-| Subtract two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}minusWord32X4#::Word32X4#->Word32X4#->Word32X4#minusWord32X4# :: Word32X4# -> Word32X4# -> Word32X4#minusWord32X4#=Word32X4# -> Word32X4# -> Word32X4#minusWord32X4#{-| Subtract two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}minusWord64X2#::Word64X2#->Word64X2#->Word64X2#minusWord64X2# :: Word64X2# -> Word64X2# -> Word64X2#minusWord64X2#=Word64X2# -> Word64X2# -> Word64X2#minusWord64X2#{-| Subtract two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}minusWord8X32#::Word8X32#->Word8X32#->Word8X32#minusWord8X32# :: Word8X32# -> Word8X32# -> Word8X32#minusWord8X32#=Word8X32# -> Word8X32# -> Word8X32#minusWord8X32#{-| Subtract two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}minusWord16X16#::Word16X16#->Word16X16#->Word16X16#minusWord16X16# :: Word16X16# -> Word16X16# -> Word16X16#minusWord16X16#=Word16X16# -> Word16X16# -> Word16X16#minusWord16X16#{-| Subtract two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}minusWord32X8#::Word32X8#->Word32X8#->Word32X8#minusWord32X8# :: Word32X8# -> Word32X8# -> Word32X8#minusWord32X8#=Word32X8# -> Word32X8# -> Word32X8#minusWord32X8#{-| Subtract two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}minusWord64X4#::Word64X4#->Word64X4#->Word64X4#minusWord64X4# :: Word64X4# -> Word64X4# -> Word64X4#minusWord64X4#=Word64X4# -> Word64X4# -> Word64X4#minusWord64X4#{-| Subtract two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}minusWord8X64#::Word8X64#->Word8X64#->Word8X64#minusWord8X64# :: Word8X64# -> Word8X64# -> Word8X64#minusWord8X64#=Word8X64# -> Word8X64# -> Word8X64#minusWord8X64#{-| Subtract two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}minusWord16X32#::Word16X32#->Word16X32#->Word16X32#minusWord16X32# :: Word16X32# -> Word16X32# -> Word16X32#minusWord16X32#=Word16X32# -> Word16X32# -> Word16X32#minusWord16X32#{-| Subtract two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}minusWord32X16#::Word32X16#->Word32X16#->Word32X16#minusWord32X16# :: Word32X16# -> Word32X16# -> Word32X16#minusWord32X16#=Word32X16# -> Word32X16# -> Word32X16#minusWord32X16#{-| Subtract two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}minusWord64X8#::Word64X8#->Word64X8#->Word64X8#minusWord64X8# :: Word64X8# -> Word64X8# -> Word64X8#minusWord64X8#=Word64X8# -> Word64X8# -> Word64X8#minusWord64X8#{-| Subtract two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}minusFloatX4#::FloatX4#->FloatX4#->FloatX4#minusFloatX4# :: FloatX4# -> FloatX4# -> FloatX4#minusFloatX4#=FloatX4# -> FloatX4# -> FloatX4#minusFloatX4#{-| Subtract two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}minusDoubleX2#::DoubleX2#->DoubleX2#->DoubleX2#minusDoubleX2# :: DoubleX2# -> DoubleX2# -> DoubleX2#minusDoubleX2#=DoubleX2# -> DoubleX2# -> DoubleX2#minusDoubleX2#{-| Subtract two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}minusFloatX8#::FloatX8#->FloatX8#->FloatX8#minusFloatX8# :: FloatX8# -> FloatX8# -> FloatX8#minusFloatX8#=FloatX8# -> FloatX8# -> FloatX8#minusFloatX8#{-| Subtract two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}minusDoubleX4#::DoubleX4#->DoubleX4#->DoubleX4#minusDoubleX4# :: DoubleX4# -> DoubleX4# -> DoubleX4#minusDoubleX4#=DoubleX4# -> DoubleX4# -> DoubleX4#minusDoubleX4#{-| Subtract two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}minusFloatX16#::FloatX16#->FloatX16#->FloatX16#minusFloatX16# :: FloatX16# -> FloatX16# -> FloatX16#minusFloatX16#=FloatX16# -> FloatX16# -> FloatX16#minusFloatX16#{-| Subtract two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}minusDoubleX8#::DoubleX8#->DoubleX8#->DoubleX8#minusDoubleX8# :: DoubleX8# -> DoubleX8# -> DoubleX8#minusDoubleX8#=DoubleX8# -> DoubleX8# -> DoubleX8#minusDoubleX8#{-| Multiply two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}timesInt8X16#::Int8X16#->Int8X16#->Int8X16#timesInt8X16# :: Int8X16# -> Int8X16# -> Int8X16#timesInt8X16#=Int8X16# -> Int8X16# -> Int8X16#timesInt8X16#{-| Multiply two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}timesInt16X8#::Int16X8#->Int16X8#->Int16X8#timesInt16X8# :: Int16X8# -> Int16X8# -> Int16X8#timesInt16X8#=Int16X8# -> Int16X8# -> Int16X8#timesInt16X8#{-| Multiply two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}timesInt32X4#::Int32X4#->Int32X4#->Int32X4#timesInt32X4# :: Int32X4# -> Int32X4# -> Int32X4#timesInt32X4#=Int32X4# -> Int32X4# -> Int32X4#timesInt32X4#{-| Multiply two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}timesInt64X2#::Int64X2#->Int64X2#->Int64X2#timesInt64X2# :: Int64X2# -> Int64X2# -> Int64X2#timesInt64X2#=Int64X2# -> Int64X2# -> Int64X2#timesInt64X2#{-| Multiply two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}timesInt8X32#::Int8X32#->Int8X32#->Int8X32#timesInt8X32# :: Int8X32# -> Int8X32# -> Int8X32#timesInt8X32#=Int8X32# -> Int8X32# -> Int8X32#timesInt8X32#{-| Multiply two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}timesInt16X16#::Int16X16#->Int16X16#->Int16X16#timesInt16X16# :: Int16X16# -> Int16X16# -> Int16X16#timesInt16X16#=Int16X16# -> Int16X16# -> Int16X16#timesInt16X16#{-| Multiply two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}timesInt32X8#::Int32X8#->Int32X8#->Int32X8#timesInt32X8# :: Int32X8# -> Int32X8# -> Int32X8#timesInt32X8#=Int32X8# -> Int32X8# -> Int32X8#timesInt32X8#{-| Multiply two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}timesInt64X4#::Int64X4#->Int64X4#->Int64X4#timesInt64X4# :: Int64X4# -> Int64X4# -> Int64X4#timesInt64X4#=Int64X4# -> Int64X4# -> Int64X4#timesInt64X4#{-| Multiply two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}timesInt8X64#::Int8X64#->Int8X64#->Int8X64#timesInt8X64# :: Int8X64# -> Int8X64# -> Int8X64#timesInt8X64#=Int8X64# -> Int8X64# -> Int8X64#timesInt8X64#{-| Multiply two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}timesInt16X32#::Int16X32#->Int16X32#->Int16X32#timesInt16X32# :: Int16X32# -> Int16X32# -> Int16X32#timesInt16X32#=Int16X32# -> Int16X32# -> Int16X32#timesInt16X32#{-| Multiply two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}timesInt32X16#::Int32X16#->Int32X16#->Int32X16#timesInt32X16# :: Int32X16# -> Int32X16# -> Int32X16#timesInt32X16#=Int32X16# -> Int32X16# -> Int32X16#timesInt32X16#{-| Multiply two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}timesInt64X8#::Int64X8#->Int64X8#->Int64X8#timesInt64X8# :: Int64X8# -> Int64X8# -> Int64X8#timesInt64X8#=Int64X8# -> Int64X8# -> Int64X8#timesInt64X8#{-| Multiply two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}timesWord8X16#::Word8X16#->Word8X16#->Word8X16#timesWord8X16# :: Word8X16# -> Word8X16# -> Word8X16#timesWord8X16#=Word8X16# -> Word8X16# -> Word8X16#timesWord8X16#{-| Multiply two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}timesWord16X8#::Word16X8#->Word16X8#->Word16X8#timesWord16X8# :: Word16X8# -> Word16X8# -> Word16X8#timesWord16X8#=Word16X8# -> Word16X8# -> Word16X8#timesWord16X8#{-| Multiply two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}timesWord32X4#::Word32X4#->Word32X4#->Word32X4#timesWord32X4# :: Word32X4# -> Word32X4# -> Word32X4#timesWord32X4#=Word32X4# -> Word32X4# -> Word32X4#timesWord32X4#{-| Multiply two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}timesWord64X2#::Word64X2#->Word64X2#->Word64X2#timesWord64X2# :: Word64X2# -> Word64X2# -> Word64X2#timesWord64X2#=Word64X2# -> Word64X2# -> Word64X2#timesWord64X2#{-| Multiply two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}timesWord8X32#::Word8X32#->Word8X32#->Word8X32#timesWord8X32# :: Word8X32# -> Word8X32# -> Word8X32#timesWord8X32#=Word8X32# -> Word8X32# -> Word8X32#timesWord8X32#{-| Multiply two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}timesWord16X16#::Word16X16#->Word16X16#->Word16X16#timesWord16X16# :: Word16X16# -> Word16X16# -> Word16X16#timesWord16X16#=Word16X16# -> Word16X16# -> Word16X16#timesWord16X16#{-| Multiply two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}timesWord32X8#::Word32X8#->Word32X8#->Word32X8#timesWord32X8# :: Word32X8# -> Word32X8# -> Word32X8#timesWord32X8#=Word32X8# -> Word32X8# -> Word32X8#timesWord32X8#{-| Multiply two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}timesWord64X4#::Word64X4#->Word64X4#->Word64X4#timesWord64X4# :: Word64X4# -> Word64X4# -> Word64X4#timesWord64X4#=Word64X4# -> Word64X4# -> Word64X4#timesWord64X4#{-| Multiply two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}timesWord8X64#::Word8X64#->Word8X64#->Word8X64#timesWord8X64# :: Word8X64# -> Word8X64# -> Word8X64#timesWord8X64#=Word8X64# -> Word8X64# -> Word8X64#timesWord8X64#{-| Multiply two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}timesWord16X32#::Word16X32#->Word16X32#->Word16X32#timesWord16X32# :: Word16X32# -> Word16X32# -> Word16X32#timesWord16X32#=Word16X32# -> Word16X32# -> Word16X32#timesWord16X32#{-| Multiply two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}timesWord32X16#::Word32X16#->Word32X16#->Word32X16#timesWord32X16# :: Word32X16# -> Word32X16# -> Word32X16#timesWord32X16#=Word32X16# -> Word32X16# -> Word32X16#timesWord32X16#{-| Multiply two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}timesWord64X8#::Word64X8#->Word64X8#->Word64X8#timesWord64X8# :: Word64X8# -> Word64X8# -> Word64X8#timesWord64X8#=Word64X8# -> Word64X8# -> Word64X8#timesWord64X8#{-| Multiply two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}timesFloatX4#::FloatX4#->FloatX4#->FloatX4#timesFloatX4# :: FloatX4# -> FloatX4# -> FloatX4#timesFloatX4#=FloatX4# -> FloatX4# -> FloatX4#timesFloatX4#{-| Multiply two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}timesDoubleX2#::DoubleX2#->DoubleX2#->DoubleX2#timesDoubleX2# :: DoubleX2# -> DoubleX2# -> DoubleX2#timesDoubleX2#=DoubleX2# -> DoubleX2# -> DoubleX2#timesDoubleX2#{-| Multiply two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}timesFloatX8#::FloatX8#->FloatX8#->FloatX8#timesFloatX8# :: FloatX8# -> FloatX8# -> FloatX8#timesFloatX8#=FloatX8# -> FloatX8# -> FloatX8#timesFloatX8#{-| Multiply two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}timesDoubleX4#::DoubleX4#->DoubleX4#->DoubleX4#timesDoubleX4# :: DoubleX4# -> DoubleX4# -> DoubleX4#timesDoubleX4#=DoubleX4# -> DoubleX4# -> DoubleX4#timesDoubleX4#{-| Multiply two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}timesFloatX16#::FloatX16#->FloatX16#->FloatX16#timesFloatX16# :: FloatX16# -> FloatX16# -> FloatX16#timesFloatX16#=FloatX16# -> FloatX16# -> FloatX16#timesFloatX16#{-| Multiply two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}timesDoubleX8#::DoubleX8#->DoubleX8#->DoubleX8#timesDoubleX8# :: DoubleX8# -> DoubleX8# -> DoubleX8#timesDoubleX8#=DoubleX8# -> DoubleX8# -> DoubleX8#timesDoubleX8#{-| Divide two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}divideFloatX4#::FloatX4#->FloatX4#->FloatX4#divideFloatX4# :: FloatX4# -> FloatX4# -> FloatX4#divideFloatX4#=FloatX4# -> FloatX4# -> FloatX4#divideFloatX4#{-| Divide two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}divideDoubleX2#::DoubleX2#->DoubleX2#->DoubleX2#divideDoubleX2# :: DoubleX2# -> DoubleX2# -> DoubleX2#divideDoubleX2#=DoubleX2# -> DoubleX2# -> DoubleX2#divideDoubleX2#{-| Divide two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}divideFloatX8#::FloatX8#->FloatX8#->FloatX8#divideFloatX8# :: FloatX8# -> FloatX8# -> FloatX8#divideFloatX8#=FloatX8# -> FloatX8# -> FloatX8#divideFloatX8#{-| Divide two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}divideDoubleX4#::DoubleX4#->DoubleX4#->DoubleX4#divideDoubleX4# :: DoubleX4# -> DoubleX4# -> DoubleX4#divideDoubleX4#=DoubleX4# -> DoubleX4# -> DoubleX4#divideDoubleX4#{-| Divide two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}divideFloatX16#::FloatX16#->FloatX16#->FloatX16#divideFloatX16# :: FloatX16# -> FloatX16# -> FloatX16#divideFloatX16#=FloatX16# -> FloatX16# -> FloatX16#divideFloatX16#{-| Divide two vectors element-wise. __/Warning:/__ this is only available on LLVM.-}divideDoubleX8#::DoubleX8#->DoubleX8#->DoubleX8#divideDoubleX8# :: DoubleX8# -> DoubleX8# -> DoubleX8#divideDoubleX8#=DoubleX8# -> DoubleX8# -> DoubleX8#divideDoubleX8#{-| Rounds towards zero element-wise. __/Warning:/__ this is only available on LLVM.-}quotInt8X16#::Int8X16#->Int8X16#->Int8X16#quotInt8X16# :: Int8X16# -> Int8X16# -> Int8X16#quotInt8X16#=Int8X16# -> Int8X16# -> Int8X16#quotInt8X16#{-| Rounds towards zero element-wise. __/Warning:/__ this is only available on LLVM.-}quotInt16X8#::Int16X8#->Int16X8#->Int16X8#quotInt16X8# :: Int16X8# -> Int16X8# -> Int16X8#quotInt16X8#=Int16X8# -> Int16X8# -> Int16X8#quotInt16X8#{-| Rounds towards zero element-wise. __/Warning:/__ this is only available on LLVM.-}quotInt32X4#::Int32X4#->Int32X4#->Int32X4#quotInt32X4# :: Int32X4# -> Int32X4# -> Int32X4#quotInt32X4#=Int32X4# -> Int32X4# -> Int32X4#quotInt32X4#{-| Rounds towards zero element-wise. __/Warning:/__ this is only available on LLVM.-}quotInt64X2#::Int64X2#->Int64X2#->Int64X2#quotInt64X2# :: Int64X2# -> Int64X2# -> Int64X2#quotInt64X2#=Int64X2# -> Int64X2# -> Int64X2#quotInt64X2#{-| Rounds towards zero element-wise. __/Warning:/__ this is only available on LLVM.-}quotInt8X32#::Int8X32#->Int8X32#->Int8X32#quotInt8X32# :: Int8X32# -> Int8X32# -> Int8X32#quotInt8X32#=Int8X32# -> Int8X32# -> Int8X32#quotInt8X32#{-| Rounds towards zero element-wise. __/Warning:/__ this is only available on LLVM.-}quotInt16X16#::Int16X16#->Int16X16#->Int16X16#quotInt16X16# :: Int16X16# -> Int16X16# -> Int16X16#quotInt16X16#=Int16X16# -> Int16X16# -> Int16X16#quotInt16X16#{-| Rounds towards zero element-wise. __/Warning:/__ this is only available on LLVM.-}quotInt32X8#::Int32X8#->Int32X8#->Int32X8#quotInt32X8# :: Int32X8# -> Int32X8# -> Int32X8#quotInt32X8#=Int32X8# -> Int32X8# -> Int32X8#quotInt32X8#{-| Rounds towards zero element-wise. __/Warning:/__ this is only available on LLVM.-}quotInt64X4#::Int64X4#->Int64X4#->Int64X4#quotInt64X4# :: Int64X4# -> Int64X4# -> Int64X4#quotInt64X4#=Int64X4# -> Int64X4# -> Int64X4#quotInt64X4#{-| Rounds towards zero element-wise. __/Warning:/__ this is only available on LLVM.-}quotInt8X64#::Int8X64#->Int8X64#->Int8X64#quotInt8X64# :: Int8X64# -> Int8X64# -> Int8X64#quotInt8X64#=Int8X64# -> Int8X64# -> Int8X64#quotInt8X64#{-| Rounds towards zero element-wise. __/Warning:/__ this is only available on LLVM.-}quotInt16X32#::Int16X32#->Int16X32#->Int16X32#quotInt16X32# :: Int16X32# -> Int16X32# -> Int16X32#quotInt16X32#=Int16X32# -> Int16X32# -> Int16X32#quotInt16X32#{-| Rounds towards zero element-wise. __/Warning:/__ this is only available on LLVM.-}quotInt32X16#::Int32X16#->Int32X16#->Int32X16#quotInt32X16# :: Int32X16# -> Int32X16# -> Int32X16#quotInt32X16#=Int32X16# -> Int32X16# -> Int32X16#quotInt32X16#{-| Rounds towards zero element-wise. __/Warning:/__ this is only available on LLVM.-}quotInt64X8#::Int64X8#->Int64X8#->Int64X8#quotInt64X8# :: Int64X8# -> Int64X8# -> Int64X8#quotInt64X8#=Int64X8# -> Int64X8# -> Int64X8#quotInt64X8#{-| Rounds towards zero element-wise. __/Warning:/__ this is only available on LLVM.-}quotWord8X16#::Word8X16#->Word8X16#->Word8X16#quotWord8X16# :: Word8X16# -> Word8X16# -> Word8X16#quotWord8X16#=Word8X16# -> Word8X16# -> Word8X16#quotWord8X16#{-| Rounds towards zero element-wise. __/Warning:/__ this is only available on LLVM.-}quotWord16X8#::Word16X8#->Word16X8#->Word16X8#quotWord16X8# :: Word16X8# -> Word16X8# -> Word16X8#quotWord16X8#=Word16X8# -> Word16X8# -> Word16X8#quotWord16X8#{-| Rounds towards zero element-wise. __/Warning:/__ this is only available on LLVM.-}quotWord32X4#::Word32X4#->Word32X4#->Word32X4#quotWord32X4# :: Word32X4# -> Word32X4# -> Word32X4#quotWord32X4#=Word32X4# -> Word32X4# -> Word32X4#quotWord32X4#{-| Rounds towards zero element-wise. __/Warning:/__ this is only available on LLVM.-}quotWord64X2#::Word64X2#->Word64X2#->Word64X2#quotWord64X2# :: Word64X2# -> Word64X2# -> Word64X2#quotWord64X2#=Word64X2# -> Word64X2# -> Word64X2#quotWord64X2#{-| Rounds towards zero element-wise. __/Warning:/__ this is only available on LLVM.-}quotWord8X32#::Word8X32#->Word8X32#->Word8X32#quotWord8X32# :: Word8X32# -> Word8X32# -> Word8X32#quotWord8X32#=Word8X32# -> Word8X32# -> Word8X32#quotWord8X32#{-| Rounds towards zero element-wise. __/Warning:/__ this is only available on LLVM.-}quotWord16X16#::Word16X16#->Word16X16#->Word16X16#quotWord16X16# :: Word16X16# -> Word16X16# -> Word16X16#quotWord16X16#=Word16X16# -> Word16X16# -> Word16X16#quotWord16X16#{-| Rounds towards zero element-wise. __/Warning:/__ this is only available on LLVM.-}quotWord32X8#::Word32X8#->Word32X8#->Word32X8#quotWord32X8# :: Word32X8# -> Word32X8# -> Word32X8#quotWord32X8#=Word32X8# -> Word32X8# -> Word32X8#quotWord32X8#{-| Rounds towards zero element-wise. __/Warning:/__ this is only available on LLVM.-}quotWord64X4#::Word64X4#->Word64X4#->Word64X4#quotWord64X4# :: Word64X4# -> Word64X4# -> Word64X4#quotWord64X4#=Word64X4# -> Word64X4# -> Word64X4#quotWord64X4#{-| Rounds towards zero element-wise. __/Warning:/__ this is only available on LLVM.-}quotWord8X64#::Word8X64#->Word8X64#->Word8X64#quotWord8X64# :: Word8X64# -> Word8X64# -> Word8X64#quotWord8X64#=Word8X64# -> Word8X64# -> Word8X64#quotWord8X64#{-| Rounds towards zero element-wise. __/Warning:/__ this is only available on LLVM.-}quotWord16X32#::Word16X32#->Word16X32#->Word16X32#quotWord16X32# :: Word16X32# -> Word16X32# -> Word16X32#quotWord16X32#=Word16X32# -> Word16X32# -> Word16X32#quotWord16X32#{-| Rounds towards zero element-wise. __/Warning:/__ this is only available on LLVM.-}quotWord32X16#::Word32X16#->Word32X16#->Word32X16#quotWord32X16# :: Word32X16# -> Word32X16# -> Word32X16#quotWord32X16#=Word32X16# -> Word32X16# -> Word32X16#quotWord32X16#{-| Rounds towards zero element-wise. __/Warning:/__ this is only available on LLVM.-}quotWord64X8#::Word64X8#->Word64X8#->Word64X8#quotWord64X8# :: Word64X8# -> Word64X8# -> Word64X8#quotWord64X8#=Word64X8# -> Word64X8# -> Word64X8#quotWord64X8#{-| Satisfies @('quot#' x y) 'times#' y 'plus#' ('rem#' x y) == x@. __/Warning:/__ this is only available on LLVM.-}remInt8X16#::Int8X16#->Int8X16#->Int8X16#remInt8X16# :: Int8X16# -> Int8X16# -> Int8X16#remInt8X16#=Int8X16# -> Int8X16# -> Int8X16#remInt8X16#{-| Satisfies @('quot#' x y) 'times#' y 'plus#' ('rem#' x y) == x@. __/Warning:/__ this is only available on LLVM.-}remInt16X8#::Int16X8#->Int16X8#->Int16X8#remInt16X8# :: Int16X8# -> Int16X8# -> Int16X8#remInt16X8#=Int16X8# -> Int16X8# -> Int16X8#remInt16X8#{-| Satisfies @('quot#' x y) 'times#' y 'plus#' ('rem#' x y) == x@. __/Warning:/__ this is only available on LLVM.-}remInt32X4#::Int32X4#->Int32X4#->Int32X4#remInt32X4# :: Int32X4# -> Int32X4# -> Int32X4#remInt32X4#=Int32X4# -> Int32X4# -> Int32X4#remInt32X4#{-| Satisfies @('quot#' x y) 'times#' y 'plus#' ('rem#' x y) == x@. __/Warning:/__ this is only available on LLVM.-}remInt64X2#::Int64X2#->Int64X2#->Int64X2#remInt64X2# :: Int64X2# -> Int64X2# -> Int64X2#remInt64X2#=Int64X2# -> Int64X2# -> Int64X2#remInt64X2#{-| Satisfies @('quot#' x y) 'times#' y 'plus#' ('rem#' x y) == x@. __/Warning:/__ this is only available on LLVM.-}remInt8X32#::Int8X32#->Int8X32#->Int8X32#remInt8X32# :: Int8X32# -> Int8X32# -> Int8X32#remInt8X32#=Int8X32# -> Int8X32# -> Int8X32#remInt8X32#{-| Satisfies @('quot#' x y) 'times#' y 'plus#' ('rem#' x y) == x@. __/Warning:/__ this is only available on LLVM.-}remInt16X16#::Int16X16#->Int16X16#->Int16X16#remInt16X16# :: Int16X16# -> Int16X16# -> Int16X16#remInt16X16#=Int16X16# -> Int16X16# -> Int16X16#remInt16X16#{-| Satisfies @('quot#' x y) 'times#' y 'plus#' ('rem#' x y) == x@. __/Warning:/__ this is only available on LLVM.-}remInt32X8#::Int32X8#->Int32X8#->Int32X8#remInt32X8# :: Int32X8# -> Int32X8# -> Int32X8#remInt32X8#=Int32X8# -> Int32X8# -> Int32X8#remInt32X8#{-| Satisfies @('quot#' x y) 'times#' y 'plus#' ('rem#' x y) == x@. __/Warning:/__ this is only available on LLVM.-}remInt64X4#::Int64X4#->Int64X4#->Int64X4#remInt64X4# :: Int64X4# -> Int64X4# -> Int64X4#remInt64X4#=Int64X4# -> Int64X4# -> Int64X4#remInt64X4#{-| Satisfies @('quot#' x y) 'times#' y 'plus#' ('rem#' x y) == x@. __/Warning:/__ this is only available on LLVM.-}remInt8X64#::Int8X64#->Int8X64#->Int8X64#remInt8X64# :: Int8X64# -> Int8X64# -> Int8X64#remInt8X64#=Int8X64# -> Int8X64# -> Int8X64#remInt8X64#{-| Satisfies @('quot#' x y) 'times#' y 'plus#' ('rem#' x y) == x@. __/Warning:/__ this is only available on LLVM.-}remInt16X32#::Int16X32#->Int16X32#->Int16X32#remInt16X32# :: Int16X32# -> Int16X32# -> Int16X32#remInt16X32#=Int16X32# -> Int16X32# -> Int16X32#remInt16X32#{-| Satisfies @('quot#' x y) 'times#' y 'plus#' ('rem#' x y) == x@. __/Warning:/__ this is only available on LLVM.-}remInt32X16#::Int32X16#->Int32X16#->Int32X16#remInt32X16# :: Int32X16# -> Int32X16# -> Int32X16#remInt32X16#=Int32X16# -> Int32X16# -> Int32X16#remInt32X16#{-| Satisfies @('quot#' x y) 'times#' y 'plus#' ('rem#' x y) == x@. __/Warning:/__ this is only available on LLVM.-}remInt64X8#::Int64X8#->Int64X8#->Int64X8#remInt64X8# :: Int64X8# -> Int64X8# -> Int64X8#remInt64X8#=Int64X8# -> Int64X8# -> Int64X8#remInt64X8#{-| Satisfies @('quot#' x y) 'times#' y 'plus#' ('rem#' x y) == x@. __/Warning:/__ this is only available on LLVM.-}remWord8X16#::Word8X16#->Word8X16#->Word8X16#remWord8X16# :: Word8X16# -> Word8X16# -> Word8X16#remWord8X16#=Word8X16# -> Word8X16# -> Word8X16#remWord8X16#{-| Satisfies @('quot#' x y) 'times#' y 'plus#' ('rem#' x y) == x@. __/Warning:/__ this is only available on LLVM.-}remWord16X8#::Word16X8#->Word16X8#->Word16X8#remWord16X8# :: Word16X8# -> Word16X8# -> Word16X8#remWord16X8#=Word16X8# -> Word16X8# -> Word16X8#remWord16X8#{-| Satisfies @('quot#' x y) 'times#' y 'plus#' ('rem#' x y) == x@. __/Warning:/__ this is only available on LLVM.-}remWord32X4#::Word32X4#->Word32X4#->Word32X4#remWord32X4# :: Word32X4# -> Word32X4# -> Word32X4#remWord32X4#=Word32X4# -> Word32X4# -> Word32X4#remWord32X4#{-| Satisfies @('quot#' x y) 'times#' y 'plus#' ('rem#' x y) == x@. __/Warning:/__ this is only available on LLVM.-}remWord64X2#::Word64X2#->Word64X2#->Word64X2#remWord64X2# :: Word64X2# -> Word64X2# -> Word64X2#remWord64X2#=Word64X2# -> Word64X2# -> Word64X2#remWord64X2#{-| Satisfies @('quot#' x y) 'times#' y 'plus#' ('rem#' x y) == x@. __/Warning:/__ this is only available on LLVM.-}remWord8X32#::Word8X32#->Word8X32#->Word8X32#remWord8X32# :: Word8X32# -> Word8X32# -> Word8X32#remWord8X32#=Word8X32# -> Word8X32# -> Word8X32#remWord8X32#{-| Satisfies @('quot#' x y) 'times#' y 'plus#' ('rem#' x y) == x@. __/Warning:/__ this is only available on LLVM.-}remWord16X16#::Word16X16#->Word16X16#->Word16X16#remWord16X16# :: Word16X16# -> Word16X16# -> Word16X16#remWord16X16#=Word16X16# -> Word16X16# -> Word16X16#remWord16X16#{-| Satisfies @('quot#' x y) 'times#' y 'plus#' ('rem#' x y) == x@. __/Warning:/__ this is only available on LLVM.-}remWord32X8#::Word32X8#->Word32X8#->Word32X8#remWord32X8# :: Word32X8# -> Word32X8# -> Word32X8#remWord32X8#=Word32X8# -> Word32X8# -> Word32X8#remWord32X8#{-| Satisfies @('quot#' x y) 'times#' y 'plus#' ('rem#' x y) == x@. __/Warning:/__ this is only available on LLVM.-}remWord64X4#::Word64X4#->Word64X4#->Word64X4#remWord64X4# :: Word64X4# -> Word64X4# -> Word64X4#remWord64X4#=Word64X4# -> Word64X4# -> Word64X4#remWord64X4#{-| Satisfies @('quot#' x y) 'times#' y 'plus#' ('rem#' x y) == x@. __/Warning:/__ this is only available on LLVM.-}remWord8X64#::Word8X64#->Word8X64#->Word8X64#remWord8X64# :: Word8X64# -> Word8X64# -> Word8X64#remWord8X64#=Word8X64# -> Word8X64# -> Word8X64#remWord8X64#{-| Satisfies @('quot#' x y) 'times#' y 'plus#' ('rem#' x y) == x@. __/Warning:/__ this is only available on LLVM.-}remWord16X32#::Word16X32#->Word16X32#->Word16X32#remWord16X32# :: Word16X32# -> Word16X32# -> Word16X32#remWord16X32#=Word16X32# -> Word16X32# -> Word16X32#remWord16X32#{-| Satisfies @('quot#' x y) 'times#' y 'plus#' ('rem#' x y) == x@. __/Warning:/__ this is only available on LLVM.-}remWord32X16#::Word32X16#->Word32X16#->Word32X16#remWord32X16# :: Word32X16# -> Word32X16# -> Word32X16#remWord32X16#=Word32X16# -> Word32X16# -> Word32X16#remWord32X16#{-| Satisfies @('quot#' x y) 'times#' y 'plus#' ('rem#' x y) == x@. __/Warning:/__ this is only available on LLVM.-}remWord64X8#::Word64X8#->Word64X8#->Word64X8#remWord64X8# :: Word64X8# -> Word64X8# -> Word64X8#remWord64X8#=Word64X8# -> Word64X8# -> Word64X8#remWord64X8#{-| Negate element-wise. __/Warning:/__ this is only available on LLVM.-}negateInt8X16#::Int8X16#->Int8X16#negateInt8X16# :: Int8X16# -> Int8X16#negateInt8X16#=Int8X16# -> Int8X16#negateInt8X16#{-| Negate element-wise. __/Warning:/__ this is only available on LLVM.-}negateInt16X8#::Int16X8#->Int16X8#negateInt16X8# :: Int16X8# -> Int16X8#negateInt16X8#=Int16X8# -> Int16X8#negateInt16X8#{-| Negate element-wise. __/Warning:/__ this is only available on LLVM.-}negateInt32X4#::Int32X4#->Int32X4#negateInt32X4# :: Int32X4# -> Int32X4#negateInt32X4#=Int32X4# -> Int32X4#negateInt32X4#{-| Negate element-wise. __/Warning:/__ this is only available on LLVM.-}negateInt64X2#::Int64X2#->Int64X2#negateInt64X2# :: Int64X2# -> Int64X2#negateInt64X2#=Int64X2# -> Int64X2#negateInt64X2#{-| Negate element-wise. __/Warning:/__ this is only available on LLVM.-}negateInt8X32#::Int8X32#->Int8X32#negateInt8X32# :: Int8X32# -> Int8X32#negateInt8X32#=Int8X32# -> Int8X32#negateInt8X32#{-| Negate element-wise. __/Warning:/__ this is only available on LLVM.-}negateInt16X16#::Int16X16#->Int16X16#negateInt16X16# :: Int16X16# -> Int16X16#negateInt16X16#=Int16X16# -> Int16X16#negateInt16X16#{-| Negate element-wise. __/Warning:/__ this is only available on LLVM.-}negateInt32X8#::Int32X8#->Int32X8#negateInt32X8# :: Int32X8# -> Int32X8#negateInt32X8#=Int32X8# -> Int32X8#negateInt32X8#{-| Negate element-wise. __/Warning:/__ this is only available on LLVM.-}negateInt64X4#::Int64X4#->Int64X4#negateInt64X4# :: Int64X4# -> Int64X4#negateInt64X4#=Int64X4# -> Int64X4#negateInt64X4#{-| Negate element-wise. __/Warning:/__ this is only available on LLVM.-}negateInt8X64#::Int8X64#->Int8X64#negateInt8X64# :: Int8X64# -> Int8X64#negateInt8X64#=Int8X64# -> Int8X64#negateInt8X64#{-| Negate element-wise. __/Warning:/__ this is only available on LLVM.-}negateInt16X32#::Int16X32#->Int16X32#negateInt16X32# :: Int16X32# -> Int16X32#negateInt16X32#=Int16X32# -> Int16X32#negateInt16X32#{-| Negate element-wise. __/Warning:/__ this is only available on LLVM.-}negateInt32X16#::Int32X16#->Int32X16#negateInt32X16# :: Int32X16# -> Int32X16#negateInt32X16#=Int32X16# -> Int32X16#negateInt32X16#{-| Negate element-wise. __/Warning:/__ this is only available on LLVM.-}negateInt64X8#::Int64X8#->Int64X8#negateInt64X8# :: Int64X8# -> Int64X8#negateInt64X8#=Int64X8# -> Int64X8#negateInt64X8#{-| Negate element-wise. __/Warning:/__ this is only available on LLVM.-}negateFloatX4#::FloatX4#->FloatX4#negateFloatX4# :: FloatX4# -> FloatX4#negateFloatX4#=FloatX4# -> FloatX4#negateFloatX4#{-| Negate element-wise. __/Warning:/__ this is only available on LLVM.-}negateDoubleX2#::DoubleX2#->DoubleX2#negateDoubleX2# :: DoubleX2# -> DoubleX2#negateDoubleX2#=DoubleX2# -> DoubleX2#negateDoubleX2#{-| Negate element-wise. __/Warning:/__ this is only available on LLVM.-}negateFloatX8#::FloatX8#->FloatX8#negateFloatX8# :: FloatX8# -> FloatX8#negateFloatX8#=FloatX8# -> FloatX8#negateFloatX8#{-| Negate element-wise. __/Warning:/__ this is only available on LLVM.-}negateDoubleX4#::DoubleX4#->DoubleX4#negateDoubleX4# :: DoubleX4# -> DoubleX4#negateDoubleX4#=DoubleX4# -> DoubleX4#negateDoubleX4#{-| Negate element-wise. __/Warning:/__ this is only available on LLVM.-}negateFloatX16#::FloatX16#->FloatX16#negateFloatX16# :: FloatX16# -> FloatX16#negateFloatX16#=FloatX16# -> FloatX16#negateFloatX16#{-| Negate element-wise. __/Warning:/__ this is only available on LLVM.-}negateDoubleX8#::DoubleX8#->DoubleX8#negateDoubleX8# :: DoubleX8# -> DoubleX8#negateDoubleX8#=DoubleX8# -> DoubleX8#negateDoubleX8#{-| Read a vector from specified index of immutable array. __/Warning:/__ this is only available on LLVM.-}indexInt8X16Array#::ByteArray#->Int#->Int8X16#indexInt8X16Array# :: ByteArray# -> Int# -> Int8X16#indexInt8X16Array#=ByteArray# -> Int# -> Int8X16#indexInt8X16Array#{-| Read a vector from specified index of immutable array. __/Warning:/__ this is only available on LLVM.-}indexInt16X8Array#::ByteArray#->Int#->Int16X8#indexInt16X8Array# :: ByteArray# -> Int# -> Int16X8#indexInt16X8Array#=ByteArray# -> Int# -> Int16X8#indexInt16X8Array#{-| Read a vector from specified index of immutable array. __/Warning:/__ this is only available on LLVM.-}indexInt32X4Array#::ByteArray#->Int#->Int32X4#indexInt32X4Array# :: ByteArray# -> Int# -> Int32X4#indexInt32X4Array#=ByteArray# -> Int# -> Int32X4#indexInt32X4Array#{-| Read a vector from specified index of immutable array. __/Warning:/__ this is only available on LLVM.-}indexInt64X2Array#::ByteArray#->Int#->Int64X2#indexInt64X2Array# :: ByteArray# -> Int# -> Int64X2#indexInt64X2Array#=ByteArray# -> Int# -> Int64X2#indexInt64X2Array#{-| Read a vector from specified index of immutable array. __/Warning:/__ this is only available on LLVM.-}indexInt8X32Array#::ByteArray#->Int#->Int8X32#indexInt8X32Array# :: ByteArray# -> Int# -> Int8X32#indexInt8X32Array#=ByteArray# -> Int# -> Int8X32#indexInt8X32Array#{-| Read a vector from specified index of immutable array. __/Warning:/__ this is only available on LLVM.-}indexInt16X16Array#::ByteArray#->Int#->Int16X16#indexInt16X16Array# :: ByteArray# -> Int# -> Int16X16#indexInt16X16Array#=ByteArray# -> Int# -> Int16X16#indexInt16X16Array#{-| Read a vector from specified index of immutable array. __/Warning:/__ this is only available on LLVM.-}indexInt32X8Array#::ByteArray#->Int#->Int32X8#indexInt32X8Array# :: ByteArray# -> Int# -> Int32X8#indexInt32X8Array#=ByteArray# -> Int# -> Int32X8#indexInt32X8Array#{-| Read a vector from specified index of immutable array. __/Warning:/__ this is only available on LLVM.-}indexInt64X4Array#::ByteArray#->Int#->Int64X4#indexInt64X4Array# :: ByteArray# -> Int# -> Int64X4#indexInt64X4Array#=ByteArray# -> Int# -> Int64X4#indexInt64X4Array#{-| Read a vector from specified index of immutable array. __/Warning:/__ this is only available on LLVM.-}indexInt8X64Array#::ByteArray#->Int#->Int8X64#indexInt8X64Array# :: ByteArray# -> Int# -> Int8X64#indexInt8X64Array#=ByteArray# -> Int# -> Int8X64#indexInt8X64Array#{-| Read a vector from specified index of immutable array. __/Warning:/__ this is only available on LLVM.-}indexInt16X32Array#::ByteArray#->Int#->Int16X32#indexInt16X32Array# :: ByteArray# -> Int# -> Int16X32#indexInt16X32Array#=ByteArray# -> Int# -> Int16X32#indexInt16X32Array#{-| Read a vector from specified index of immutable array. __/Warning:/__ this is only available on LLVM.-}indexInt32X16Array#::ByteArray#->Int#->Int32X16#indexInt32X16Array# :: ByteArray# -> Int# -> Int32X16#indexInt32X16Array#=ByteArray# -> Int# -> Int32X16#indexInt32X16Array#{-| Read a vector from specified index of immutable array. __/Warning:/__ this is only available on LLVM.-}indexInt64X8Array#::ByteArray#->Int#->Int64X8#indexInt64X8Array# :: ByteArray# -> Int# -> Int64X8#indexInt64X8Array#=ByteArray# -> Int# -> Int64X8#indexInt64X8Array#{-| Read a vector from specified index of immutable array. __/Warning:/__ this is only available on LLVM.-}indexWord8X16Array#::ByteArray#->Int#->Word8X16#indexWord8X16Array# :: ByteArray# -> Int# -> Word8X16#indexWord8X16Array#=ByteArray# -> Int# -> Word8X16#indexWord8X16Array#{-| Read a vector from specified index of immutable array. __/Warning:/__ this is only available on LLVM.-}indexWord16X8Array#::ByteArray#->Int#->Word16X8#indexWord16X8Array# :: ByteArray# -> Int# -> Word16X8#indexWord16X8Array#=ByteArray# -> Int# -> Word16X8#indexWord16X8Array#{-| Read a vector from specified index of immutable array. __/Warning:/__ this is only available on LLVM.-}indexWord32X4Array#::ByteArray#->Int#->Word32X4#indexWord32X4Array# :: ByteArray# -> Int# -> Word32X4#indexWord32X4Array#=ByteArray# -> Int# -> Word32X4#indexWord32X4Array#{-| Read a vector from specified index of immutable array. __/Warning:/__ this is only available on LLVM.-}indexWord64X2Array#::ByteArray#->Int#->Word64X2#indexWord64X2Array# :: ByteArray# -> Int# -> Word64X2#indexWord64X2Array#=ByteArray# -> Int# -> Word64X2#indexWord64X2Array#{-| Read a vector from specified index of immutable array. __/Warning:/__ this is only available on LLVM.-}indexWord8X32Array#::ByteArray#->Int#->Word8X32#indexWord8X32Array# :: ByteArray# -> Int# -> Word8X32#indexWord8X32Array#=ByteArray# -> Int# -> Word8X32#indexWord8X32Array#{-| Read a vector from specified index of immutable array. __/Warning:/__ this is only available on LLVM.-}indexWord16X16Array#::ByteArray#->Int#->Word16X16#indexWord16X16Array# :: ByteArray# -> Int# -> Word16X16#indexWord16X16Array#=ByteArray# -> Int# -> Word16X16#indexWord16X16Array#{-| Read a vector from specified index of immutable array. __/Warning:/__ this is only available on LLVM.-}indexWord32X8Array#::ByteArray#->Int#->Word32X8#indexWord32X8Array# :: ByteArray# -> Int# -> Word32X8#indexWord32X8Array#=ByteArray# -> Int# -> Word32X8#indexWord32X8Array#{-| Read a vector from specified index of immutable array. __/Warning:/__ this is only available on LLVM.-}indexWord64X4Array#::ByteArray#->Int#->Word64X4#indexWord64X4Array# :: ByteArray# -> Int# -> Word64X4#indexWord64X4Array#=ByteArray# -> Int# -> Word64X4#indexWord64X4Array#{-| Read a vector from specified index of immutable array. __/Warning:/__ this is only available on LLVM.-}indexWord8X64Array#::ByteArray#->Int#->Word8X64#indexWord8X64Array# :: ByteArray# -> Int# -> Word8X64#indexWord8X64Array#=ByteArray# -> Int# -> Word8X64#indexWord8X64Array#{-| Read a vector from specified index of immutable array. __/Warning:/__ this is only available on LLVM.-}indexWord16X32Array#::ByteArray#->Int#->Word16X32#indexWord16X32Array# :: ByteArray# -> Int# -> Word16X32#indexWord16X32Array#=ByteArray# -> Int# -> Word16X32#indexWord16X32Array#{-| Read a vector from specified index of immutable array. __/Warning:/__ this is only available on LLVM.-}indexWord32X16Array#::ByteArray#->Int#->Word32X16#indexWord32X16Array# :: ByteArray# -> Int# -> Word32X16#indexWord32X16Array#=ByteArray# -> Int# -> Word32X16#indexWord32X16Array#{-| Read a vector from specified index of immutable array. __/Warning:/__ this is only available on LLVM.-}indexWord64X8Array#::ByteArray#->Int#->Word64X8#indexWord64X8Array# :: ByteArray# -> Int# -> Word64X8#indexWord64X8Array#=ByteArray# -> Int# -> Word64X8#indexWord64X8Array#{-| Read a vector from specified index of immutable array. __/Warning:/__ this is only available on LLVM.-}indexFloatX4Array#::ByteArray#->Int#->FloatX4#indexFloatX4Array# :: ByteArray# -> Int# -> FloatX4#indexFloatX4Array#=ByteArray# -> Int# -> FloatX4#indexFloatX4Array#{-| Read a vector from specified index of immutable array. __/Warning:/__ this is only available on LLVM.-}indexDoubleX2Array#::ByteArray#->Int#->DoubleX2#indexDoubleX2Array# :: ByteArray# -> Int# -> DoubleX2#indexDoubleX2Array#=ByteArray# -> Int# -> DoubleX2#indexDoubleX2Array#{-| Read a vector from specified index of immutable array. __/Warning:/__ this is only available on LLVM.-}indexFloatX8Array#::ByteArray#->Int#->FloatX8#indexFloatX8Array# :: ByteArray# -> Int# -> FloatX8#indexFloatX8Array#=ByteArray# -> Int# -> FloatX8#indexFloatX8Array#{-| Read a vector from specified index of immutable array. __/Warning:/__ this is only available on LLVM.-}indexDoubleX4Array#::ByteArray#->Int#->DoubleX4#indexDoubleX4Array# :: ByteArray# -> Int# -> DoubleX4#indexDoubleX4Array#=ByteArray# -> Int# -> DoubleX4#indexDoubleX4Array#{-| Read a vector from specified index of immutable array. __/Warning:/__ this is only available on LLVM.-}indexFloatX16Array#::ByteArray#->Int#->FloatX16#indexFloatX16Array# :: ByteArray# -> Int# -> FloatX16#indexFloatX16Array#=ByteArray# -> Int# -> FloatX16#indexFloatX16Array#{-| Read a vector from specified index of immutable array. __/Warning:/__ this is only available on LLVM.-}indexDoubleX8Array#::ByteArray#->Int#->DoubleX8#indexDoubleX8Array# :: ByteArray# -> Int# -> DoubleX8#indexDoubleX8Array#=ByteArray# -> Int# -> DoubleX8#indexDoubleX8Array#{-| Read a vector from specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readInt8X16Array#::MutableByteArray#s->Int#->State#s->(#State#s,Int8X16##)readInt8X16Array# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int8X16# #)readInt8X16Array#=MutableByteArray# s -> Int# -> State# s -> (# State# s, Int8X16# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int8X16# #)readInt8X16Array#{-| Read a vector from specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readInt16X8Array#::MutableByteArray#s->Int#->State#s->(#State#s,Int16X8##)readInt16X8Array# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int16X8# #)readInt16X8Array#=MutableByteArray# s -> Int# -> State# s -> (# State# s, Int16X8# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int16X8# #)readInt16X8Array#{-| Read a vector from specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readInt32X4Array#::MutableByteArray#s->Int#->State#s->(#State#s,Int32X4##)readInt32X4Array# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int32X4# #)readInt32X4Array#=MutableByteArray# s -> Int# -> State# s -> (# State# s, Int32X4# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int32X4# #)readInt32X4Array#{-| Read a vector from specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readInt64X2Array#::MutableByteArray#s->Int#->State#s->(#State#s,Int64X2##)readInt64X2Array# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int64X2# #)readInt64X2Array#=MutableByteArray# s -> Int# -> State# s -> (# State# s, Int64X2# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int64X2# #)readInt64X2Array#{-| Read a vector from specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readInt8X32Array#::MutableByteArray#s->Int#->State#s->(#State#s,Int8X32##)readInt8X32Array# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int8X32# #)readInt8X32Array#=MutableByteArray# s -> Int# -> State# s -> (# State# s, Int8X32# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int8X32# #)readInt8X32Array#{-| Read a vector from specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readInt16X16Array#::MutableByteArray#s->Int#->State#s->(#State#s,Int16X16##)readInt16X16Array# :: forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Int16X16# #)readInt16X16Array#=MutableByteArray# s-> Int# -> State# s -> (# State# s, Int16X16# #)forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Int16X16# #)readInt16X16Array#{-| Read a vector from specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readInt32X8Array#::MutableByteArray#s->Int#->State#s->(#State#s,Int32X8##)readInt32X8Array# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int32X8# #)readInt32X8Array#=MutableByteArray# s -> Int# -> State# s -> (# State# s, Int32X8# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int32X8# #)readInt32X8Array#{-| Read a vector from specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readInt64X4Array#::MutableByteArray#s->Int#->State#s->(#State#s,Int64X4##)readInt64X4Array# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int64X4# #)readInt64X4Array#=MutableByteArray# s -> Int# -> State# s -> (# State# s, Int64X4# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int64X4# #)readInt64X4Array#{-| Read a vector from specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readInt8X64Array#::MutableByteArray#s->Int#->State#s->(#State#s,Int8X64##)readInt8X64Array# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int8X64# #)readInt8X64Array#=MutableByteArray# s -> Int# -> State# s -> (# State# s, Int8X64# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int8X64# #)readInt8X64Array#{-| Read a vector from specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readInt16X32Array#::MutableByteArray#s->Int#->State#s->(#State#s,Int16X32##)readInt16X32Array# :: forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Int16X32# #)readInt16X32Array#=MutableByteArray# s-> Int# -> State# s -> (# State# s, Int16X32# #)forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Int16X32# #)readInt16X32Array#{-| Read a vector from specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readInt32X16Array#::MutableByteArray#s->Int#->State#s->(#State#s,Int32X16##)readInt32X16Array# :: forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Int32X16# #)readInt32X16Array#=MutableByteArray# s-> Int# -> State# s -> (# State# s, Int32X16# #)forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Int32X16# #)readInt32X16Array#{-| Read a vector from specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readInt64X8Array#::MutableByteArray#s->Int#->State#s->(#State#s,Int64X8##)readInt64X8Array# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int64X8# #)readInt64X8Array#=MutableByteArray# s -> Int# -> State# s -> (# State# s, Int64X8# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int64X8# #)readInt64X8Array#{-| Read a vector from specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readWord8X16Array#::MutableByteArray#s->Int#->State#s->(#State#s,Word8X16##)readWord8X16Array# :: forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Word8X16# #)readWord8X16Array#=MutableByteArray# s-> Int# -> State# s -> (# State# s, Word8X16# #)forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Word8X16# #)readWord8X16Array#{-| Read a vector from specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readWord16X8Array#::MutableByteArray#s->Int#->State#s->(#State#s,Word16X8##)readWord16X8Array# :: forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Word16X8# #)readWord16X8Array#=MutableByteArray# s-> Int# -> State# s -> (# State# s, Word16X8# #)forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Word16X8# #)readWord16X8Array#{-| Read a vector from specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readWord32X4Array#::MutableByteArray#s->Int#->State#s->(#State#s,Word32X4##)readWord32X4Array# :: forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Word32X4# #)readWord32X4Array#=MutableByteArray# s-> Int# -> State# s -> (# State# s, Word32X4# #)forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Word32X4# #)readWord32X4Array#{-| Read a vector from specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readWord64X2Array#::MutableByteArray#s->Int#->State#s->(#State#s,Word64X2##)readWord64X2Array# :: forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Word64X2# #)readWord64X2Array#=MutableByteArray# s-> Int# -> State# s -> (# State# s, Word64X2# #)forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Word64X2# #)readWord64X2Array#{-| Read a vector from specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readWord8X32Array#::MutableByteArray#s->Int#->State#s->(#State#s,Word8X32##)readWord8X32Array# :: forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Word8X32# #)readWord8X32Array#=MutableByteArray# s-> Int# -> State# s -> (# State# s, Word8X32# #)forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Word8X32# #)readWord8X32Array#{-| Read a vector from specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readWord16X16Array#::MutableByteArray#s->Int#->State#s->(#State#s,Word16X16##)readWord16X16Array# :: forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Word16X16# #)readWord16X16Array#=MutableByteArray# s-> Int# -> State# s -> (# State# s, Word16X16# #)forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Word16X16# #)readWord16X16Array#{-| Read a vector from specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readWord32X8Array#::MutableByteArray#s->Int#->State#s->(#State#s,Word32X8##)readWord32X8Array# :: forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Word32X8# #)readWord32X8Array#=MutableByteArray# s-> Int# -> State# s -> (# State# s, Word32X8# #)forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Word32X8# #)readWord32X8Array#{-| Read a vector from specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readWord64X4Array#::MutableByteArray#s->Int#->State#s->(#State#s,Word64X4##)readWord64X4Array# :: forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Word64X4# #)readWord64X4Array#=MutableByteArray# s-> Int# -> State# s -> (# State# s, Word64X4# #)forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Word64X4# #)readWord64X4Array#{-| Read a vector from specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readWord8X64Array#::MutableByteArray#s->Int#->State#s->(#State#s,Word8X64##)readWord8X64Array# :: forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Word8X64# #)readWord8X64Array#=MutableByteArray# s-> Int# -> State# s -> (# State# s, Word8X64# #)forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Word8X64# #)readWord8X64Array#{-| Read a vector from specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readWord16X32Array#::MutableByteArray#s->Int#->State#s->(#State#s,Word16X32##)readWord16X32Array# :: forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Word16X32# #)readWord16X32Array#=MutableByteArray# s-> Int# -> State# s -> (# State# s, Word16X32# #)forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Word16X32# #)readWord16X32Array#{-| Read a vector from specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readWord32X16Array#::MutableByteArray#s->Int#->State#s->(#State#s,Word32X16##)readWord32X16Array# :: forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Word32X16# #)readWord32X16Array#=MutableByteArray# s-> Int# -> State# s -> (# State# s, Word32X16# #)forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Word32X16# #)readWord32X16Array#{-| Read a vector from specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readWord64X8Array#::MutableByteArray#s->Int#->State#s->(#State#s,Word64X8##)readWord64X8Array# :: forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Word64X8# #)readWord64X8Array#=MutableByteArray# s-> Int# -> State# s -> (# State# s, Word64X8# #)forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Word64X8# #)readWord64X8Array#{-| Read a vector from specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readFloatX4Array#::MutableByteArray#s->Int#->State#s->(#State#s,FloatX4##)readFloatX4Array# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, FloatX4# #)readFloatX4Array#=MutableByteArray# s -> Int# -> State# s -> (# State# s, FloatX4# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, FloatX4# #)readFloatX4Array#{-| Read a vector from specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readDoubleX2Array#::MutableByteArray#s->Int#->State#s->(#State#s,DoubleX2##)readDoubleX2Array# :: forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, DoubleX2# #)readDoubleX2Array#=MutableByteArray# s-> Int# -> State# s -> (# State# s, DoubleX2# #)forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, DoubleX2# #)readDoubleX2Array#{-| Read a vector from specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readFloatX8Array#::MutableByteArray#s->Int#->State#s->(#State#s,FloatX8##)readFloatX8Array# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, FloatX8# #)readFloatX8Array#=MutableByteArray# s -> Int# -> State# s -> (# State# s, FloatX8# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, FloatX8# #)readFloatX8Array#{-| Read a vector from specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readDoubleX4Array#::MutableByteArray#s->Int#->State#s->(#State#s,DoubleX4##)readDoubleX4Array# :: forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, DoubleX4# #)readDoubleX4Array#=MutableByteArray# s-> Int# -> State# s -> (# State# s, DoubleX4# #)forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, DoubleX4# #)readDoubleX4Array#{-| Read a vector from specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readFloatX16Array#::MutableByteArray#s->Int#->State#s->(#State#s,FloatX16##)readFloatX16Array# :: forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, FloatX16# #)readFloatX16Array#=MutableByteArray# s-> Int# -> State# s -> (# State# s, FloatX16# #)forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, FloatX16# #)readFloatX16Array#{-| Read a vector from specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readDoubleX8Array#::MutableByteArray#s->Int#->State#s->(#State#s,DoubleX8##)readDoubleX8Array# :: forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, DoubleX8# #)readDoubleX8Array#=MutableByteArray# s-> Int# -> State# s -> (# State# s, DoubleX8# #)forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, DoubleX8# #)readDoubleX8Array#{-| Write a vector to specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeInt8X16Array#::MutableByteArray#s->Int#->Int8X16#->State#s->State#swriteInt8X16Array# :: forall s.MutableByteArray# s -> Int# -> Int8X16# -> State# s -> State# swriteInt8X16Array#=MutableByteArray# s -> Int# -> Int8X16# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Int8X16# -> State# s -> State# swriteInt8X16Array#{-| Write a vector to specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeInt16X8Array#::MutableByteArray#s->Int#->Int16X8#->State#s->State#swriteInt16X8Array# :: forall s.MutableByteArray# s -> Int# -> Int16X8# -> State# s -> State# swriteInt16X8Array#=MutableByteArray# s -> Int# -> Int16X8# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Int16X8# -> State# s -> State# swriteInt16X8Array#{-| Write a vector to specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeInt32X4Array#::MutableByteArray#s->Int#->Int32X4#->State#s->State#swriteInt32X4Array# :: forall s.MutableByteArray# s -> Int# -> Int32X4# -> State# s -> State# swriteInt32X4Array#=MutableByteArray# s -> Int# -> Int32X4# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Int32X4# -> State# s -> State# swriteInt32X4Array#{-| Write a vector to specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeInt64X2Array#::MutableByteArray#s->Int#->Int64X2#->State#s->State#swriteInt64X2Array# :: forall s.MutableByteArray# s -> Int# -> Int64X2# -> State# s -> State# swriteInt64X2Array#=MutableByteArray# s -> Int# -> Int64X2# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Int64X2# -> State# s -> State# swriteInt64X2Array#{-| Write a vector to specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeInt8X32Array#::MutableByteArray#s->Int#->Int8X32#->State#s->State#swriteInt8X32Array# :: forall s.MutableByteArray# s -> Int# -> Int8X32# -> State# s -> State# swriteInt8X32Array#=MutableByteArray# s -> Int# -> Int8X32# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Int8X32# -> State# s -> State# swriteInt8X32Array#{-| Write a vector to specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeInt16X16Array#::MutableByteArray#s->Int#->Int16X16#->State#s->State#swriteInt16X16Array# :: forall s.MutableByteArray# s -> Int# -> Int16X16# -> State# s -> State# swriteInt16X16Array#=MutableByteArray# s -> Int# -> Int16X16# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Int16X16# -> State# s -> State# swriteInt16X16Array#{-| Write a vector to specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeInt32X8Array#::MutableByteArray#s->Int#->Int32X8#->State#s->State#swriteInt32X8Array# :: forall s.MutableByteArray# s -> Int# -> Int32X8# -> State# s -> State# swriteInt32X8Array#=MutableByteArray# s -> Int# -> Int32X8# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Int32X8# -> State# s -> State# swriteInt32X8Array#{-| Write a vector to specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeInt64X4Array#::MutableByteArray#s->Int#->Int64X4#->State#s->State#swriteInt64X4Array# :: forall s.MutableByteArray# s -> Int# -> Int64X4# -> State# s -> State# swriteInt64X4Array#=MutableByteArray# s -> Int# -> Int64X4# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Int64X4# -> State# s -> State# swriteInt64X4Array#{-| Write a vector to specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeInt8X64Array#::MutableByteArray#s->Int#->Int8X64#->State#s->State#swriteInt8X64Array# :: forall s.MutableByteArray# s -> Int# -> Int8X64# -> State# s -> State# swriteInt8X64Array#=MutableByteArray# s -> Int# -> Int8X64# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Int8X64# -> State# s -> State# swriteInt8X64Array#{-| Write a vector to specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeInt16X32Array#::MutableByteArray#s->Int#->Int16X32#->State#s->State#swriteInt16X32Array# :: forall s.MutableByteArray# s -> Int# -> Int16X32# -> State# s -> State# swriteInt16X32Array#=MutableByteArray# s -> Int# -> Int16X32# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Int16X32# -> State# s -> State# swriteInt16X32Array#{-| Write a vector to specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeInt32X16Array#::MutableByteArray#s->Int#->Int32X16#->State#s->State#swriteInt32X16Array# :: forall s.MutableByteArray# s -> Int# -> Int32X16# -> State# s -> State# swriteInt32X16Array#=MutableByteArray# s -> Int# -> Int32X16# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Int32X16# -> State# s -> State# swriteInt32X16Array#{-| Write a vector to specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeInt64X8Array#::MutableByteArray#s->Int#->Int64X8#->State#s->State#swriteInt64X8Array# :: forall s.MutableByteArray# s -> Int# -> Int64X8# -> State# s -> State# swriteInt64X8Array#=MutableByteArray# s -> Int# -> Int64X8# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Int64X8# -> State# s -> State# swriteInt64X8Array#{-| Write a vector to specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeWord8X16Array#::MutableByteArray#s->Int#->Word8X16#->State#s->State#swriteWord8X16Array# :: forall s.MutableByteArray# s -> Int# -> Word8X16# -> State# s -> State# swriteWord8X16Array#=MutableByteArray# s -> Int# -> Word8X16# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Word8X16# -> State# s -> State# swriteWord8X16Array#{-| Write a vector to specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeWord16X8Array#::MutableByteArray#s->Int#->Word16X8#->State#s->State#swriteWord16X8Array# :: forall s.MutableByteArray# s -> Int# -> Word16X8# -> State# s -> State# swriteWord16X8Array#=MutableByteArray# s -> Int# -> Word16X8# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Word16X8# -> State# s -> State# swriteWord16X8Array#{-| Write a vector to specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeWord32X4Array#::MutableByteArray#s->Int#->Word32X4#->State#s->State#swriteWord32X4Array# :: forall s.MutableByteArray# s -> Int# -> Word32X4# -> State# s -> State# swriteWord32X4Array#=MutableByteArray# s -> Int# -> Word32X4# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Word32X4# -> State# s -> State# swriteWord32X4Array#{-| Write a vector to specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeWord64X2Array#::MutableByteArray#s->Int#->Word64X2#->State#s->State#swriteWord64X2Array# :: forall s.MutableByteArray# s -> Int# -> Word64X2# -> State# s -> State# swriteWord64X2Array#=MutableByteArray# s -> Int# -> Word64X2# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Word64X2# -> State# s -> State# swriteWord64X2Array#{-| Write a vector to specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeWord8X32Array#::MutableByteArray#s->Int#->Word8X32#->State#s->State#swriteWord8X32Array# :: forall s.MutableByteArray# s -> Int# -> Word8X32# -> State# s -> State# swriteWord8X32Array#=MutableByteArray# s -> Int# -> Word8X32# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Word8X32# -> State# s -> State# swriteWord8X32Array#{-| Write a vector to specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeWord16X16Array#::MutableByteArray#s->Int#->Word16X16#->State#s->State#swriteWord16X16Array# :: forall s.MutableByteArray# s -> Int# -> Word16X16# -> State# s -> State# swriteWord16X16Array#=MutableByteArray# s -> Int# -> Word16X16# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Word16X16# -> State# s -> State# swriteWord16X16Array#{-| Write a vector to specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeWord32X8Array#::MutableByteArray#s->Int#->Word32X8#->State#s->State#swriteWord32X8Array# :: forall s.MutableByteArray# s -> Int# -> Word32X8# -> State# s -> State# swriteWord32X8Array#=MutableByteArray# s -> Int# -> Word32X8# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Word32X8# -> State# s -> State# swriteWord32X8Array#{-| Write a vector to specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeWord64X4Array#::MutableByteArray#s->Int#->Word64X4#->State#s->State#swriteWord64X4Array# :: forall s.MutableByteArray# s -> Int# -> Word64X4# -> State# s -> State# swriteWord64X4Array#=MutableByteArray# s -> Int# -> Word64X4# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Word64X4# -> State# s -> State# swriteWord64X4Array#{-| Write a vector to specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeWord8X64Array#::MutableByteArray#s->Int#->Word8X64#->State#s->State#swriteWord8X64Array# :: forall s.MutableByteArray# s -> Int# -> Word8X64# -> State# s -> State# swriteWord8X64Array#=MutableByteArray# s -> Int# -> Word8X64# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Word8X64# -> State# s -> State# swriteWord8X64Array#{-| Write a vector to specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeWord16X32Array#::MutableByteArray#s->Int#->Word16X32#->State#s->State#swriteWord16X32Array# :: forall s.MutableByteArray# s -> Int# -> Word16X32# -> State# s -> State# swriteWord16X32Array#=MutableByteArray# s -> Int# -> Word16X32# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Word16X32# -> State# s -> State# swriteWord16X32Array#{-| Write a vector to specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeWord32X16Array#::MutableByteArray#s->Int#->Word32X16#->State#s->State#swriteWord32X16Array# :: forall s.MutableByteArray# s -> Int# -> Word32X16# -> State# s -> State# swriteWord32X16Array#=MutableByteArray# s -> Int# -> Word32X16# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Word32X16# -> State# s -> State# swriteWord32X16Array#{-| Write a vector to specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeWord64X8Array#::MutableByteArray#s->Int#->Word64X8#->State#s->State#swriteWord64X8Array# :: forall s.MutableByteArray# s -> Int# -> Word64X8# -> State# s -> State# swriteWord64X8Array#=MutableByteArray# s -> Int# -> Word64X8# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Word64X8# -> State# s -> State# swriteWord64X8Array#{-| Write a vector to specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeFloatX4Array#::MutableByteArray#s->Int#->FloatX4#->State#s->State#swriteFloatX4Array# :: forall s.MutableByteArray# s -> Int# -> FloatX4# -> State# s -> State# swriteFloatX4Array#=MutableByteArray# s -> Int# -> FloatX4# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> FloatX4# -> State# s -> State# swriteFloatX4Array#{-| Write a vector to specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeDoubleX2Array#::MutableByteArray#s->Int#->DoubleX2#->State#s->State#swriteDoubleX2Array# :: forall s.MutableByteArray# s -> Int# -> DoubleX2# -> State# s -> State# swriteDoubleX2Array#=MutableByteArray# s -> Int# -> DoubleX2# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> DoubleX2# -> State# s -> State# swriteDoubleX2Array#{-| Write a vector to specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeFloatX8Array#::MutableByteArray#s->Int#->FloatX8#->State#s->State#swriteFloatX8Array# :: forall s.MutableByteArray# s -> Int# -> FloatX8# -> State# s -> State# swriteFloatX8Array#=MutableByteArray# s -> Int# -> FloatX8# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> FloatX8# -> State# s -> State# swriteFloatX8Array#{-| Write a vector to specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeDoubleX4Array#::MutableByteArray#s->Int#->DoubleX4#->State#s->State#swriteDoubleX4Array# :: forall s.MutableByteArray# s -> Int# -> DoubleX4# -> State# s -> State# swriteDoubleX4Array#=MutableByteArray# s -> Int# -> DoubleX4# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> DoubleX4# -> State# s -> State# swriteDoubleX4Array#{-| Write a vector to specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeFloatX16Array#::MutableByteArray#s->Int#->FloatX16#->State#s->State#swriteFloatX16Array# :: forall s.MutableByteArray# s -> Int# -> FloatX16# -> State# s -> State# swriteFloatX16Array#=MutableByteArray# s -> Int# -> FloatX16# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> FloatX16# -> State# s -> State# swriteFloatX16Array#{-| Write a vector to specified index of mutable array. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeDoubleX8Array#::MutableByteArray#s->Int#->DoubleX8#->State#s->State#swriteDoubleX8Array# :: forall s.MutableByteArray# s -> Int# -> DoubleX8# -> State# s -> State# swriteDoubleX8Array#=MutableByteArray# s -> Int# -> DoubleX8# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> DoubleX8# -> State# s -> State# swriteDoubleX8Array#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM.-}indexInt8X16OffAddr#::Addr#->Int#->Int8X16#indexInt8X16OffAddr# :: Addr# -> Int# -> Int8X16#indexInt8X16OffAddr#=Addr# -> Int# -> Int8X16#indexInt8X16OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM.-}indexInt16X8OffAddr#::Addr#->Int#->Int16X8#indexInt16X8OffAddr# :: Addr# -> Int# -> Int16X8#indexInt16X8OffAddr#=Addr# -> Int# -> Int16X8#indexInt16X8OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM.-}indexInt32X4OffAddr#::Addr#->Int#->Int32X4#indexInt32X4OffAddr# :: Addr# -> Int# -> Int32X4#indexInt32X4OffAddr#=Addr# -> Int# -> Int32X4#indexInt32X4OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM.-}indexInt64X2OffAddr#::Addr#->Int#->Int64X2#indexInt64X2OffAddr# :: Addr# -> Int# -> Int64X2#indexInt64X2OffAddr#=Addr# -> Int# -> Int64X2#indexInt64X2OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM.-}indexInt8X32OffAddr#::Addr#->Int#->Int8X32#indexInt8X32OffAddr# :: Addr# -> Int# -> Int8X32#indexInt8X32OffAddr#=Addr# -> Int# -> Int8X32#indexInt8X32OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM.-}indexInt16X16OffAddr#::Addr#->Int#->Int16X16#indexInt16X16OffAddr# :: Addr# -> Int# -> Int16X16#indexInt16X16OffAddr#=Addr# -> Int# -> Int16X16#indexInt16X16OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM.-}indexInt32X8OffAddr#::Addr#->Int#->Int32X8#indexInt32X8OffAddr# :: Addr# -> Int# -> Int32X8#indexInt32X8OffAddr#=Addr# -> Int# -> Int32X8#indexInt32X8OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM.-}indexInt64X4OffAddr#::Addr#->Int#->Int64X4#indexInt64X4OffAddr# :: Addr# -> Int# -> Int64X4#indexInt64X4OffAddr#=Addr# -> Int# -> Int64X4#indexInt64X4OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM.-}indexInt8X64OffAddr#::Addr#->Int#->Int8X64#indexInt8X64OffAddr# :: Addr# -> Int# -> Int8X64#indexInt8X64OffAddr#=Addr# -> Int# -> Int8X64#indexInt8X64OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM.-}indexInt16X32OffAddr#::Addr#->Int#->Int16X32#indexInt16X32OffAddr# :: Addr# -> Int# -> Int16X32#indexInt16X32OffAddr#=Addr# -> Int# -> Int16X32#indexInt16X32OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM.-}indexInt32X16OffAddr#::Addr#->Int#->Int32X16#indexInt32X16OffAddr# :: Addr# -> Int# -> Int32X16#indexInt32X16OffAddr#=Addr# -> Int# -> Int32X16#indexInt32X16OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM.-}indexInt64X8OffAddr#::Addr#->Int#->Int64X8#indexInt64X8OffAddr# :: Addr# -> Int# -> Int64X8#indexInt64X8OffAddr#=Addr# -> Int# -> Int64X8#indexInt64X8OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM.-}indexWord8X16OffAddr#::Addr#->Int#->Word8X16#indexWord8X16OffAddr# :: Addr# -> Int# -> Word8X16#indexWord8X16OffAddr#=Addr# -> Int# -> Word8X16#indexWord8X16OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM.-}indexWord16X8OffAddr#::Addr#->Int#->Word16X8#indexWord16X8OffAddr# :: Addr# -> Int# -> Word16X8#indexWord16X8OffAddr#=Addr# -> Int# -> Word16X8#indexWord16X8OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM.-}indexWord32X4OffAddr#::Addr#->Int#->Word32X4#indexWord32X4OffAddr# :: Addr# -> Int# -> Word32X4#indexWord32X4OffAddr#=Addr# -> Int# -> Word32X4#indexWord32X4OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM.-}indexWord64X2OffAddr#::Addr#->Int#->Word64X2#indexWord64X2OffAddr# :: Addr# -> Int# -> Word64X2#indexWord64X2OffAddr#=Addr# -> Int# -> Word64X2#indexWord64X2OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM.-}indexWord8X32OffAddr#::Addr#->Int#->Word8X32#indexWord8X32OffAddr# :: Addr# -> Int# -> Word8X32#indexWord8X32OffAddr#=Addr# -> Int# -> Word8X32#indexWord8X32OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM.-}indexWord16X16OffAddr#::Addr#->Int#->Word16X16#indexWord16X16OffAddr# :: Addr# -> Int# -> Word16X16#indexWord16X16OffAddr#=Addr# -> Int# -> Word16X16#indexWord16X16OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM.-}indexWord32X8OffAddr#::Addr#->Int#->Word32X8#indexWord32X8OffAddr# :: Addr# -> Int# -> Word32X8#indexWord32X8OffAddr#=Addr# -> Int# -> Word32X8#indexWord32X8OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM.-}indexWord64X4OffAddr#::Addr#->Int#->Word64X4#indexWord64X4OffAddr# :: Addr# -> Int# -> Word64X4#indexWord64X4OffAddr#=Addr# -> Int# -> Word64X4#indexWord64X4OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM.-}indexWord8X64OffAddr#::Addr#->Int#->Word8X64#indexWord8X64OffAddr# :: Addr# -> Int# -> Word8X64#indexWord8X64OffAddr#=Addr# -> Int# -> Word8X64#indexWord8X64OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM.-}indexWord16X32OffAddr#::Addr#->Int#->Word16X32#indexWord16X32OffAddr# :: Addr# -> Int# -> Word16X32#indexWord16X32OffAddr#=Addr# -> Int# -> Word16X32#indexWord16X32OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM.-}indexWord32X16OffAddr#::Addr#->Int#->Word32X16#indexWord32X16OffAddr# :: Addr# -> Int# -> Word32X16#indexWord32X16OffAddr#=Addr# -> Int# -> Word32X16#indexWord32X16OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM.-}indexWord64X8OffAddr#::Addr#->Int#->Word64X8#indexWord64X8OffAddr# :: Addr# -> Int# -> Word64X8#indexWord64X8OffAddr#=Addr# -> Int# -> Word64X8#indexWord64X8OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM.-}indexFloatX4OffAddr#::Addr#->Int#->FloatX4#indexFloatX4OffAddr# :: Addr# -> Int# -> FloatX4#indexFloatX4OffAddr#=Addr# -> Int# -> FloatX4#indexFloatX4OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM.-}indexDoubleX2OffAddr#::Addr#->Int#->DoubleX2#indexDoubleX2OffAddr# :: Addr# -> Int# -> DoubleX2#indexDoubleX2OffAddr#=Addr# -> Int# -> DoubleX2#indexDoubleX2OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM.-}indexFloatX8OffAddr#::Addr#->Int#->FloatX8#indexFloatX8OffAddr# :: Addr# -> Int# -> FloatX8#indexFloatX8OffAddr#=Addr# -> Int# -> FloatX8#indexFloatX8OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM.-}indexDoubleX4OffAddr#::Addr#->Int#->DoubleX4#indexDoubleX4OffAddr# :: Addr# -> Int# -> DoubleX4#indexDoubleX4OffAddr#=Addr# -> Int# -> DoubleX4#indexDoubleX4OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM.-}indexFloatX16OffAddr#::Addr#->Int#->FloatX16#indexFloatX16OffAddr# :: Addr# -> Int# -> FloatX16#indexFloatX16OffAddr#=Addr# -> Int# -> FloatX16#indexFloatX16OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM.-}indexDoubleX8OffAddr#::Addr#->Int#->DoubleX8#indexDoubleX8OffAddr# :: Addr# -> Int# -> DoubleX8#indexDoubleX8OffAddr#=Addr# -> Int# -> DoubleX8#indexDoubleX8OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readInt8X16OffAddr#::Addr#->Int#->State#s->(#State#s,Int8X16##)readInt8X16OffAddr# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Int8X16# #)readInt8X16OffAddr#=Addr# -> Int# -> State# s -> (# State# s, Int8X16# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Int8X16# #)readInt8X16OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readInt16X8OffAddr#::Addr#->Int#->State#s->(#State#s,Int16X8##)readInt16X8OffAddr# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Int16X8# #)readInt16X8OffAddr#=Addr# -> Int# -> State# s -> (# State# s, Int16X8# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Int16X8# #)readInt16X8OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readInt32X4OffAddr#::Addr#->Int#->State#s->(#State#s,Int32X4##)readInt32X4OffAddr# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Int32X4# #)readInt32X4OffAddr#=Addr# -> Int# -> State# s -> (# State# s, Int32X4# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Int32X4# #)readInt32X4OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readInt64X2OffAddr#::Addr#->Int#->State#s->(#State#s,Int64X2##)readInt64X2OffAddr# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Int64X2# #)readInt64X2OffAddr#=Addr# -> Int# -> State# s -> (# State# s, Int64X2# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Int64X2# #)readInt64X2OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readInt8X32OffAddr#::Addr#->Int#->State#s->(#State#s,Int8X32##)readInt8X32OffAddr# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Int8X32# #)readInt8X32OffAddr#=Addr# -> Int# -> State# s -> (# State# s, Int8X32# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Int8X32# #)readInt8X32OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readInt16X16OffAddr#::Addr#->Int#->State#s->(#State#s,Int16X16##)readInt16X16OffAddr# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Int16X16# #)readInt16X16OffAddr#=Addr# -> Int# -> State# s -> (# State# s, Int16X16# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Int16X16# #)readInt16X16OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readInt32X8OffAddr#::Addr#->Int#->State#s->(#State#s,Int32X8##)readInt32X8OffAddr# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Int32X8# #)readInt32X8OffAddr#=Addr# -> Int# -> State# s -> (# State# s, Int32X8# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Int32X8# #)readInt32X8OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readInt64X4OffAddr#::Addr#->Int#->State#s->(#State#s,Int64X4##)readInt64X4OffAddr# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Int64X4# #)readInt64X4OffAddr#=Addr# -> Int# -> State# s -> (# State# s, Int64X4# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Int64X4# #)readInt64X4OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readInt8X64OffAddr#::Addr#->Int#->State#s->(#State#s,Int8X64##)readInt8X64OffAddr# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Int8X64# #)readInt8X64OffAddr#=Addr# -> Int# -> State# s -> (# State# s, Int8X64# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Int8X64# #)readInt8X64OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readInt16X32OffAddr#::Addr#->Int#->State#s->(#State#s,Int16X32##)readInt16X32OffAddr# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Int16X32# #)readInt16X32OffAddr#=Addr# -> Int# -> State# s -> (# State# s, Int16X32# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Int16X32# #)readInt16X32OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readInt32X16OffAddr#::Addr#->Int#->State#s->(#State#s,Int32X16##)readInt32X16OffAddr# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Int32X16# #)readInt32X16OffAddr#=Addr# -> Int# -> State# s -> (# State# s, Int32X16# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Int32X16# #)readInt32X16OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readInt64X8OffAddr#::Addr#->Int#->State#s->(#State#s,Int64X8##)readInt64X8OffAddr# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Int64X8# #)readInt64X8OffAddr#=Addr# -> Int# -> State# s -> (# State# s, Int64X8# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Int64X8# #)readInt64X8OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readWord8X16OffAddr#::Addr#->Int#->State#s->(#State#s,Word8X16##)readWord8X16OffAddr# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Word8X16# #)readWord8X16OffAddr#=Addr# -> Int# -> State# s -> (# State# s, Word8X16# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Word8X16# #)readWord8X16OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readWord16X8OffAddr#::Addr#->Int#->State#s->(#State#s,Word16X8##)readWord16X8OffAddr# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Word16X8# #)readWord16X8OffAddr#=Addr# -> Int# -> State# s -> (# State# s, Word16X8# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Word16X8# #)readWord16X8OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readWord32X4OffAddr#::Addr#->Int#->State#s->(#State#s,Word32X4##)readWord32X4OffAddr# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Word32X4# #)readWord32X4OffAddr#=Addr# -> Int# -> State# s -> (# State# s, Word32X4# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Word32X4# #)readWord32X4OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readWord64X2OffAddr#::Addr#->Int#->State#s->(#State#s,Word64X2##)readWord64X2OffAddr# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Word64X2# #)readWord64X2OffAddr#=Addr# -> Int# -> State# s -> (# State# s, Word64X2# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Word64X2# #)readWord64X2OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readWord8X32OffAddr#::Addr#->Int#->State#s->(#State#s,Word8X32##)readWord8X32OffAddr# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Word8X32# #)readWord8X32OffAddr#=Addr# -> Int# -> State# s -> (# State# s, Word8X32# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Word8X32# #)readWord8X32OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readWord16X16OffAddr#::Addr#->Int#->State#s->(#State#s,Word16X16##)readWord16X16OffAddr# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Word16X16# #)readWord16X16OffAddr#=Addr# -> Int# -> State# s -> (# State# s, Word16X16# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Word16X16# #)readWord16X16OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readWord32X8OffAddr#::Addr#->Int#->State#s->(#State#s,Word32X8##)readWord32X8OffAddr# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Word32X8# #)readWord32X8OffAddr#=Addr# -> Int# -> State# s -> (# State# s, Word32X8# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Word32X8# #)readWord32X8OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readWord64X4OffAddr#::Addr#->Int#->State#s->(#State#s,Word64X4##)readWord64X4OffAddr# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Word64X4# #)readWord64X4OffAddr#=Addr# -> Int# -> State# s -> (# State# s, Word64X4# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Word64X4# #)readWord64X4OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readWord8X64OffAddr#::Addr#->Int#->State#s->(#State#s,Word8X64##)readWord8X64OffAddr# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Word8X64# #)readWord8X64OffAddr#=Addr# -> Int# -> State# s -> (# State# s, Word8X64# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Word8X64# #)readWord8X64OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readWord16X32OffAddr#::Addr#->Int#->State#s->(#State#s,Word16X32##)readWord16X32OffAddr# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Word16X32# #)readWord16X32OffAddr#=Addr# -> Int# -> State# s -> (# State# s, Word16X32# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Word16X32# #)readWord16X32OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readWord32X16OffAddr#::Addr#->Int#->State#s->(#State#s,Word32X16##)readWord32X16OffAddr# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Word32X16# #)readWord32X16OffAddr#=Addr# -> Int# -> State# s -> (# State# s, Word32X16# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Word32X16# #)readWord32X16OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readWord64X8OffAddr#::Addr#->Int#->State#s->(#State#s,Word64X8##)readWord64X8OffAddr# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Word64X8# #)readWord64X8OffAddr#=Addr# -> Int# -> State# s -> (# State# s, Word64X8# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Word64X8# #)readWord64X8OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readFloatX4OffAddr#::Addr#->Int#->State#s->(#State#s,FloatX4##)readFloatX4OffAddr# :: forall s. Addr# -> Int# -> State# s -> (# State# s, FloatX4# #)readFloatX4OffAddr#=Addr# -> Int# -> State# s -> (# State# s, FloatX4# #)forall s. Addr# -> Int# -> State# s -> (# State# s, FloatX4# #)readFloatX4OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readDoubleX2OffAddr#::Addr#->Int#->State#s->(#State#s,DoubleX2##)readDoubleX2OffAddr# :: forall s. Addr# -> Int# -> State# s -> (# State# s, DoubleX2# #)readDoubleX2OffAddr#=Addr# -> Int# -> State# s -> (# State# s, DoubleX2# #)forall s. Addr# -> Int# -> State# s -> (# State# s, DoubleX2# #)readDoubleX2OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readFloatX8OffAddr#::Addr#->Int#->State#s->(#State#s,FloatX8##)readFloatX8OffAddr# :: forall s. Addr# -> Int# -> State# s -> (# State# s, FloatX8# #)readFloatX8OffAddr#=Addr# -> Int# -> State# s -> (# State# s, FloatX8# #)forall s. Addr# -> Int# -> State# s -> (# State# s, FloatX8# #)readFloatX8OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readDoubleX4OffAddr#::Addr#->Int#->State#s->(#State#s,DoubleX4##)readDoubleX4OffAddr# :: forall s. Addr# -> Int# -> State# s -> (# State# s, DoubleX4# #)readDoubleX4OffAddr#=Addr# -> Int# -> State# s -> (# State# s, DoubleX4# #)forall s. Addr# -> Int# -> State# s -> (# State# s, DoubleX4# #)readDoubleX4OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readFloatX16OffAddr#::Addr#->Int#->State#s->(#State#s,FloatX16##)readFloatX16OffAddr# :: forall s. Addr# -> Int# -> State# s -> (# State# s, FloatX16# #)readFloatX16OffAddr#=Addr# -> Int# -> State# s -> (# State# s, FloatX16# #)forall s. Addr# -> Int# -> State# s -> (# State# s, FloatX16# #)readFloatX16OffAddr#{-| Reads vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readDoubleX8OffAddr#::Addr#->Int#->State#s->(#State#s,DoubleX8##)readDoubleX8OffAddr# :: forall s. Addr# -> Int# -> State# s -> (# State# s, DoubleX8# #)readDoubleX8OffAddr#=Addr# -> Int# -> State# s -> (# State# s, DoubleX8# #)forall s. Addr# -> Int# -> State# s -> (# State# s, DoubleX8# #)readDoubleX8OffAddr#{-| Write vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeInt8X16OffAddr#::Addr#->Int#->Int8X16#->State#s->State#swriteInt8X16OffAddr# :: forall s. Addr# -> Int# -> Int8X16# -> State# s -> State# swriteInt8X16OffAddr#=Addr# -> Int# -> Int8X16# -> State# s -> State# sforall s. Addr# -> Int# -> Int8X16# -> State# s -> State# swriteInt8X16OffAddr#{-| Write vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeInt16X8OffAddr#::Addr#->Int#->Int16X8#->State#s->State#swriteInt16X8OffAddr# :: forall s. Addr# -> Int# -> Int16X8# -> State# s -> State# swriteInt16X8OffAddr#=Addr# -> Int# -> Int16X8# -> State# s -> State# sforall s. Addr# -> Int# -> Int16X8# -> State# s -> State# swriteInt16X8OffAddr#{-| Write vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeInt32X4OffAddr#::Addr#->Int#->Int32X4#->State#s->State#swriteInt32X4OffAddr# :: forall s. Addr# -> Int# -> Int32X4# -> State# s -> State# swriteInt32X4OffAddr#=Addr# -> Int# -> Int32X4# -> State# s -> State# sforall s. Addr# -> Int# -> Int32X4# -> State# s -> State# swriteInt32X4OffAddr#{-| Write vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeInt64X2OffAddr#::Addr#->Int#->Int64X2#->State#s->State#swriteInt64X2OffAddr# :: forall s. Addr# -> Int# -> Int64X2# -> State# s -> State# swriteInt64X2OffAddr#=Addr# -> Int# -> Int64X2# -> State# s -> State# sforall s. Addr# -> Int# -> Int64X2# -> State# s -> State# swriteInt64X2OffAddr#{-| Write vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeInt8X32OffAddr#::Addr#->Int#->Int8X32#->State#s->State#swriteInt8X32OffAddr# :: forall s. Addr# -> Int# -> Int8X32# -> State# s -> State# swriteInt8X32OffAddr#=Addr# -> Int# -> Int8X32# -> State# s -> State# sforall s. Addr# -> Int# -> Int8X32# -> State# s -> State# swriteInt8X32OffAddr#{-| Write vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeInt16X16OffAddr#::Addr#->Int#->Int16X16#->State#s->State#swriteInt16X16OffAddr# :: forall s. Addr# -> Int# -> Int16X16# -> State# s -> State# swriteInt16X16OffAddr#=Addr# -> Int# -> Int16X16# -> State# s -> State# sforall s. Addr# -> Int# -> Int16X16# -> State# s -> State# swriteInt16X16OffAddr#{-| Write vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeInt32X8OffAddr#::Addr#->Int#->Int32X8#->State#s->State#swriteInt32X8OffAddr# :: forall s. Addr# -> Int# -> Int32X8# -> State# s -> State# swriteInt32X8OffAddr#=Addr# -> Int# -> Int32X8# -> State# s -> State# sforall s. Addr# -> Int# -> Int32X8# -> State# s -> State# swriteInt32X8OffAddr#{-| Write vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeInt64X4OffAddr#::Addr#->Int#->Int64X4#->State#s->State#swriteInt64X4OffAddr# :: forall s. Addr# -> Int# -> Int64X4# -> State# s -> State# swriteInt64X4OffAddr#=Addr# -> Int# -> Int64X4# -> State# s -> State# sforall s. Addr# -> Int# -> Int64X4# -> State# s -> State# swriteInt64X4OffAddr#{-| Write vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeInt8X64OffAddr#::Addr#->Int#->Int8X64#->State#s->State#swriteInt8X64OffAddr# :: forall s. Addr# -> Int# -> Int8X64# -> State# s -> State# swriteInt8X64OffAddr#=Addr# -> Int# -> Int8X64# -> State# s -> State# sforall s. Addr# -> Int# -> Int8X64# -> State# s -> State# swriteInt8X64OffAddr#{-| Write vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeInt16X32OffAddr#::Addr#->Int#->Int16X32#->State#s->State#swriteInt16X32OffAddr# :: forall s. Addr# -> Int# -> Int16X32# -> State# s -> State# swriteInt16X32OffAddr#=Addr# -> Int# -> Int16X32# -> State# s -> State# sforall s. Addr# -> Int# -> Int16X32# -> State# s -> State# swriteInt16X32OffAddr#{-| Write vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeInt32X16OffAddr#::Addr#->Int#->Int32X16#->State#s->State#swriteInt32X16OffAddr# :: forall s. Addr# -> Int# -> Int32X16# -> State# s -> State# swriteInt32X16OffAddr#=Addr# -> Int# -> Int32X16# -> State# s -> State# sforall s. Addr# -> Int# -> Int32X16# -> State# s -> State# swriteInt32X16OffAddr#{-| Write vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeInt64X8OffAddr#::Addr#->Int#->Int64X8#->State#s->State#swriteInt64X8OffAddr# :: forall s. Addr# -> Int# -> Int64X8# -> State# s -> State# swriteInt64X8OffAddr#=Addr# -> Int# -> Int64X8# -> State# s -> State# sforall s. Addr# -> Int# -> Int64X8# -> State# s -> State# swriteInt64X8OffAddr#{-| Write vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeWord8X16OffAddr#::Addr#->Int#->Word8X16#->State#s->State#swriteWord8X16OffAddr# :: forall s. Addr# -> Int# -> Word8X16# -> State# s -> State# swriteWord8X16OffAddr#=Addr# -> Int# -> Word8X16# -> State# s -> State# sforall s. Addr# -> Int# -> Word8X16# -> State# s -> State# swriteWord8X16OffAddr#{-| Write vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeWord16X8OffAddr#::Addr#->Int#->Word16X8#->State#s->State#swriteWord16X8OffAddr# :: forall s. Addr# -> Int# -> Word16X8# -> State# s -> State# swriteWord16X8OffAddr#=Addr# -> Int# -> Word16X8# -> State# s -> State# sforall s. Addr# -> Int# -> Word16X8# -> State# s -> State# swriteWord16X8OffAddr#{-| Write vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeWord32X4OffAddr#::Addr#->Int#->Word32X4#->State#s->State#swriteWord32X4OffAddr# :: forall s. Addr# -> Int# -> Word32X4# -> State# s -> State# swriteWord32X4OffAddr#=Addr# -> Int# -> Word32X4# -> State# s -> State# sforall s. Addr# -> Int# -> Word32X4# -> State# s -> State# swriteWord32X4OffAddr#{-| Write vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeWord64X2OffAddr#::Addr#->Int#->Word64X2#->State#s->State#swriteWord64X2OffAddr# :: forall s. Addr# -> Int# -> Word64X2# -> State# s -> State# swriteWord64X2OffAddr#=Addr# -> Int# -> Word64X2# -> State# s -> State# sforall s. Addr# -> Int# -> Word64X2# -> State# s -> State# swriteWord64X2OffAddr#{-| Write vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeWord8X32OffAddr#::Addr#->Int#->Word8X32#->State#s->State#swriteWord8X32OffAddr# :: forall s. Addr# -> Int# -> Word8X32# -> State# s -> State# swriteWord8X32OffAddr#=Addr# -> Int# -> Word8X32# -> State# s -> State# sforall s. Addr# -> Int# -> Word8X32# -> State# s -> State# swriteWord8X32OffAddr#{-| Write vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeWord16X16OffAddr#::Addr#->Int#->Word16X16#->State#s->State#swriteWord16X16OffAddr# :: forall s. Addr# -> Int# -> Word16X16# -> State# s -> State# swriteWord16X16OffAddr#=Addr# -> Int# -> Word16X16# -> State# s -> State# sforall s. Addr# -> Int# -> Word16X16# -> State# s -> State# swriteWord16X16OffAddr#{-| Write vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeWord32X8OffAddr#::Addr#->Int#->Word32X8#->State#s->State#swriteWord32X8OffAddr# :: forall s. Addr# -> Int# -> Word32X8# -> State# s -> State# swriteWord32X8OffAddr#=Addr# -> Int# -> Word32X8# -> State# s -> State# sforall s. Addr# -> Int# -> Word32X8# -> State# s -> State# swriteWord32X8OffAddr#{-| Write vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeWord64X4OffAddr#::Addr#->Int#->Word64X4#->State#s->State#swriteWord64X4OffAddr# :: forall s. Addr# -> Int# -> Word64X4# -> State# s -> State# swriteWord64X4OffAddr#=Addr# -> Int# -> Word64X4# -> State# s -> State# sforall s. Addr# -> Int# -> Word64X4# -> State# s -> State# swriteWord64X4OffAddr#{-| Write vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeWord8X64OffAddr#::Addr#->Int#->Word8X64#->State#s->State#swriteWord8X64OffAddr# :: forall s. Addr# -> Int# -> Word8X64# -> State# s -> State# swriteWord8X64OffAddr#=Addr# -> Int# -> Word8X64# -> State# s -> State# sforall s. Addr# -> Int# -> Word8X64# -> State# s -> State# swriteWord8X64OffAddr#{-| Write vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeWord16X32OffAddr#::Addr#->Int#->Word16X32#->State#s->State#swriteWord16X32OffAddr# :: forall s. Addr# -> Int# -> Word16X32# -> State# s -> State# swriteWord16X32OffAddr#=Addr# -> Int# -> Word16X32# -> State# s -> State# sforall s. Addr# -> Int# -> Word16X32# -> State# s -> State# swriteWord16X32OffAddr#{-| Write vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeWord32X16OffAddr#::Addr#->Int#->Word32X16#->State#s->State#swriteWord32X16OffAddr# :: forall s. Addr# -> Int# -> Word32X16# -> State# s -> State# swriteWord32X16OffAddr#=Addr# -> Int# -> Word32X16# -> State# s -> State# sforall s. Addr# -> Int# -> Word32X16# -> State# s -> State# swriteWord32X16OffAddr#{-| Write vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeWord64X8OffAddr#::Addr#->Int#->Word64X8#->State#s->State#swriteWord64X8OffAddr# :: forall s. Addr# -> Int# -> Word64X8# -> State# s -> State# swriteWord64X8OffAddr#=Addr# -> Int# -> Word64X8# -> State# s -> State# sforall s. Addr# -> Int# -> Word64X8# -> State# s -> State# swriteWord64X8OffAddr#{-| Write vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeFloatX4OffAddr#::Addr#->Int#->FloatX4#->State#s->State#swriteFloatX4OffAddr# :: forall s. Addr# -> Int# -> FloatX4# -> State# s -> State# swriteFloatX4OffAddr#=Addr# -> Int# -> FloatX4# -> State# s -> State# sforall s. Addr# -> Int# -> FloatX4# -> State# s -> State# swriteFloatX4OffAddr#{-| Write vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeDoubleX2OffAddr#::Addr#->Int#->DoubleX2#->State#s->State#swriteDoubleX2OffAddr# :: forall s. Addr# -> Int# -> DoubleX2# -> State# s -> State# swriteDoubleX2OffAddr#=Addr# -> Int# -> DoubleX2# -> State# s -> State# sforall s. Addr# -> Int# -> DoubleX2# -> State# s -> State# swriteDoubleX2OffAddr#{-| Write vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeFloatX8OffAddr#::Addr#->Int#->FloatX8#->State#s->State#swriteFloatX8OffAddr# :: forall s. Addr# -> Int# -> FloatX8# -> State# s -> State# swriteFloatX8OffAddr#=Addr# -> Int# -> FloatX8# -> State# s -> State# sforall s. Addr# -> Int# -> FloatX8# -> State# s -> State# swriteFloatX8OffAddr#{-| Write vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeDoubleX4OffAddr#::Addr#->Int#->DoubleX4#->State#s->State#swriteDoubleX4OffAddr# :: forall s. Addr# -> Int# -> DoubleX4# -> State# s -> State# swriteDoubleX4OffAddr#=Addr# -> Int# -> DoubleX4# -> State# s -> State# sforall s. Addr# -> Int# -> DoubleX4# -> State# s -> State# swriteDoubleX4OffAddr#{-| Write vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeFloatX16OffAddr#::Addr#->Int#->FloatX16#->State#s->State#swriteFloatX16OffAddr# :: forall s. Addr# -> Int# -> FloatX16# -> State# s -> State# swriteFloatX16OffAddr#=Addr# -> Int# -> FloatX16# -> State# s -> State# sforall s. Addr# -> Int# -> FloatX16# -> State# s -> State# swriteFloatX16OffAddr#{-| Write vector; offset in bytes. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeDoubleX8OffAddr#::Addr#->Int#->DoubleX8#->State#s->State#swriteDoubleX8OffAddr# :: forall s. Addr# -> Int# -> DoubleX8# -> State# s -> State# swriteDoubleX8OffAddr#=Addr# -> Int# -> DoubleX8# -> State# s -> State# sforall s. Addr# -> Int# -> DoubleX8# -> State# s -> State# swriteDoubleX8OffAddr#{-| Read a vector from specified index of immutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexInt8ArrayAsInt8X16#::ByteArray#->Int#->Int8X16#indexInt8ArrayAsInt8X16# :: ByteArray# -> Int# -> Int8X16#indexInt8ArrayAsInt8X16#=ByteArray# -> Int# -> Int8X16#indexInt8ArrayAsInt8X16#{-| Read a vector from specified index of immutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexInt16ArrayAsInt16X8#::ByteArray#->Int#->Int16X8#indexInt16ArrayAsInt16X8# :: ByteArray# -> Int# -> Int16X8#indexInt16ArrayAsInt16X8#=ByteArray# -> Int# -> Int16X8#indexInt16ArrayAsInt16X8#{-| Read a vector from specified index of immutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexInt32ArrayAsInt32X4#::ByteArray#->Int#->Int32X4#indexInt32ArrayAsInt32X4# :: ByteArray# -> Int# -> Int32X4#indexInt32ArrayAsInt32X4#=ByteArray# -> Int# -> Int32X4#indexInt32ArrayAsInt32X4#{-| Read a vector from specified index of immutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexInt64ArrayAsInt64X2#::ByteArray#->Int#->Int64X2#indexInt64ArrayAsInt64X2# :: ByteArray# -> Int# -> Int64X2#indexInt64ArrayAsInt64X2#=ByteArray# -> Int# -> Int64X2#indexInt64ArrayAsInt64X2#{-| Read a vector from specified index of immutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexInt8ArrayAsInt8X32#::ByteArray#->Int#->Int8X32#indexInt8ArrayAsInt8X32# :: ByteArray# -> Int# -> Int8X32#indexInt8ArrayAsInt8X32#=ByteArray# -> Int# -> Int8X32#indexInt8ArrayAsInt8X32#{-| Read a vector from specified index of immutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexInt16ArrayAsInt16X16#::ByteArray#->Int#->Int16X16#indexInt16ArrayAsInt16X16# :: ByteArray# -> Int# -> Int16X16#indexInt16ArrayAsInt16X16#=ByteArray# -> Int# -> Int16X16#indexInt16ArrayAsInt16X16#{-| Read a vector from specified index of immutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexInt32ArrayAsInt32X8#::ByteArray#->Int#->Int32X8#indexInt32ArrayAsInt32X8# :: ByteArray# -> Int# -> Int32X8#indexInt32ArrayAsInt32X8#=ByteArray# -> Int# -> Int32X8#indexInt32ArrayAsInt32X8#{-| Read a vector from specified index of immutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexInt64ArrayAsInt64X4#::ByteArray#->Int#->Int64X4#indexInt64ArrayAsInt64X4# :: ByteArray# -> Int# -> Int64X4#indexInt64ArrayAsInt64X4#=ByteArray# -> Int# -> Int64X4#indexInt64ArrayAsInt64X4#{-| Read a vector from specified index of immutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexInt8ArrayAsInt8X64#::ByteArray#->Int#->Int8X64#indexInt8ArrayAsInt8X64# :: ByteArray# -> Int# -> Int8X64#indexInt8ArrayAsInt8X64#=ByteArray# -> Int# -> Int8X64#indexInt8ArrayAsInt8X64#{-| Read a vector from specified index of immutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexInt16ArrayAsInt16X32#::ByteArray#->Int#->Int16X32#indexInt16ArrayAsInt16X32# :: ByteArray# -> Int# -> Int16X32#indexInt16ArrayAsInt16X32#=ByteArray# -> Int# -> Int16X32#indexInt16ArrayAsInt16X32#{-| Read a vector from specified index of immutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexInt32ArrayAsInt32X16#::ByteArray#->Int#->Int32X16#indexInt32ArrayAsInt32X16# :: ByteArray# -> Int# -> Int32X16#indexInt32ArrayAsInt32X16#=ByteArray# -> Int# -> Int32X16#indexInt32ArrayAsInt32X16#{-| Read a vector from specified index of immutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexInt64ArrayAsInt64X8#::ByteArray#->Int#->Int64X8#indexInt64ArrayAsInt64X8# :: ByteArray# -> Int# -> Int64X8#indexInt64ArrayAsInt64X8#=ByteArray# -> Int# -> Int64X8#indexInt64ArrayAsInt64X8#{-| Read a vector from specified index of immutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexWord8ArrayAsWord8X16#::ByteArray#->Int#->Word8X16#indexWord8ArrayAsWord8X16# :: ByteArray# -> Int# -> Word8X16#indexWord8ArrayAsWord8X16#=ByteArray# -> Int# -> Word8X16#indexWord8ArrayAsWord8X16#{-| Read a vector from specified index of immutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexWord16ArrayAsWord16X8#::ByteArray#->Int#->Word16X8#indexWord16ArrayAsWord16X8# :: ByteArray# -> Int# -> Word16X8#indexWord16ArrayAsWord16X8#=ByteArray# -> Int# -> Word16X8#indexWord16ArrayAsWord16X8#{-| Read a vector from specified index of immutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexWord32ArrayAsWord32X4#::ByteArray#->Int#->Word32X4#indexWord32ArrayAsWord32X4# :: ByteArray# -> Int# -> Word32X4#indexWord32ArrayAsWord32X4#=ByteArray# -> Int# -> Word32X4#indexWord32ArrayAsWord32X4#{-| Read a vector from specified index of immutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexWord64ArrayAsWord64X2#::ByteArray#->Int#->Word64X2#indexWord64ArrayAsWord64X2# :: ByteArray# -> Int# -> Word64X2#indexWord64ArrayAsWord64X2#=ByteArray# -> Int# -> Word64X2#indexWord64ArrayAsWord64X2#{-| Read a vector from specified index of immutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexWord8ArrayAsWord8X32#::ByteArray#->Int#->Word8X32#indexWord8ArrayAsWord8X32# :: ByteArray# -> Int# -> Word8X32#indexWord8ArrayAsWord8X32#=ByteArray# -> Int# -> Word8X32#indexWord8ArrayAsWord8X32#{-| Read a vector from specified index of immutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexWord16ArrayAsWord16X16#::ByteArray#->Int#->Word16X16#indexWord16ArrayAsWord16X16# :: ByteArray# -> Int# -> Word16X16#indexWord16ArrayAsWord16X16#=ByteArray# -> Int# -> Word16X16#indexWord16ArrayAsWord16X16#{-| Read a vector from specified index of immutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexWord32ArrayAsWord32X8#::ByteArray#->Int#->Word32X8#indexWord32ArrayAsWord32X8# :: ByteArray# -> Int# -> Word32X8#indexWord32ArrayAsWord32X8#=ByteArray# -> Int# -> Word32X8#indexWord32ArrayAsWord32X8#{-| Read a vector from specified index of immutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexWord64ArrayAsWord64X4#::ByteArray#->Int#->Word64X4#indexWord64ArrayAsWord64X4# :: ByteArray# -> Int# -> Word64X4#indexWord64ArrayAsWord64X4#=ByteArray# -> Int# -> Word64X4#indexWord64ArrayAsWord64X4#{-| Read a vector from specified index of immutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexWord8ArrayAsWord8X64#::ByteArray#->Int#->Word8X64#indexWord8ArrayAsWord8X64# :: ByteArray# -> Int# -> Word8X64#indexWord8ArrayAsWord8X64#=ByteArray# -> Int# -> Word8X64#indexWord8ArrayAsWord8X64#{-| Read a vector from specified index of immutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexWord16ArrayAsWord16X32#::ByteArray#->Int#->Word16X32#indexWord16ArrayAsWord16X32# :: ByteArray# -> Int# -> Word16X32#indexWord16ArrayAsWord16X32#=ByteArray# -> Int# -> Word16X32#indexWord16ArrayAsWord16X32#{-| Read a vector from specified index of immutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexWord32ArrayAsWord32X16#::ByteArray#->Int#->Word32X16#indexWord32ArrayAsWord32X16# :: ByteArray# -> Int# -> Word32X16#indexWord32ArrayAsWord32X16#=ByteArray# -> Int# -> Word32X16#indexWord32ArrayAsWord32X16#{-| Read a vector from specified index of immutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexWord64ArrayAsWord64X8#::ByteArray#->Int#->Word64X8#indexWord64ArrayAsWord64X8# :: ByteArray# -> Int# -> Word64X8#indexWord64ArrayAsWord64X8#=ByteArray# -> Int# -> Word64X8#indexWord64ArrayAsWord64X8#{-| Read a vector from specified index of immutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexFloatArrayAsFloatX4#::ByteArray#->Int#->FloatX4#indexFloatArrayAsFloatX4# :: ByteArray# -> Int# -> FloatX4#indexFloatArrayAsFloatX4#=ByteArray# -> Int# -> FloatX4#indexFloatArrayAsFloatX4#{-| Read a vector from specified index of immutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexDoubleArrayAsDoubleX2#::ByteArray#->Int#->DoubleX2#indexDoubleArrayAsDoubleX2# :: ByteArray# -> Int# -> DoubleX2#indexDoubleArrayAsDoubleX2#=ByteArray# -> Int# -> DoubleX2#indexDoubleArrayAsDoubleX2#{-| Read a vector from specified index of immutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexFloatArrayAsFloatX8#::ByteArray#->Int#->FloatX8#indexFloatArrayAsFloatX8# :: ByteArray# -> Int# -> FloatX8#indexFloatArrayAsFloatX8#=ByteArray# -> Int# -> FloatX8#indexFloatArrayAsFloatX8#{-| Read a vector from specified index of immutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexDoubleArrayAsDoubleX4#::ByteArray#->Int#->DoubleX4#indexDoubleArrayAsDoubleX4# :: ByteArray# -> Int# -> DoubleX4#indexDoubleArrayAsDoubleX4#=ByteArray# -> Int# -> DoubleX4#indexDoubleArrayAsDoubleX4#{-| Read a vector from specified index of immutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexFloatArrayAsFloatX16#::ByteArray#->Int#->FloatX16#indexFloatArrayAsFloatX16# :: ByteArray# -> Int# -> FloatX16#indexFloatArrayAsFloatX16#=ByteArray# -> Int# -> FloatX16#indexFloatArrayAsFloatX16#{-| Read a vector from specified index of immutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexDoubleArrayAsDoubleX8#::ByteArray#->Int#->DoubleX8#indexDoubleArrayAsDoubleX8# :: ByteArray# -> Int# -> DoubleX8#indexDoubleArrayAsDoubleX8#=ByteArray# -> Int# -> DoubleX8#indexDoubleArrayAsDoubleX8#{-| Read a vector from specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readInt8ArrayAsInt8X16#::MutableByteArray#s->Int#->State#s->(#State#s,Int8X16##)readInt8ArrayAsInt8X16# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int8X16# #)readInt8ArrayAsInt8X16#=MutableByteArray# s -> Int# -> State# s -> (# State# s, Int8X16# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int8X16# #)readInt8ArrayAsInt8X16#{-| Read a vector from specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readInt16ArrayAsInt16X8#::MutableByteArray#s->Int#->State#s->(#State#s,Int16X8##)readInt16ArrayAsInt16X8# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int16X8# #)readInt16ArrayAsInt16X8#=MutableByteArray# s -> Int# -> State# s -> (# State# s, Int16X8# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int16X8# #)readInt16ArrayAsInt16X8#{-| Read a vector from specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readInt32ArrayAsInt32X4#::MutableByteArray#s->Int#->State#s->(#State#s,Int32X4##)readInt32ArrayAsInt32X4# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int32X4# #)readInt32ArrayAsInt32X4#=MutableByteArray# s -> Int# -> State# s -> (# State# s, Int32X4# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int32X4# #)readInt32ArrayAsInt32X4#{-| Read a vector from specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readInt64ArrayAsInt64X2#::MutableByteArray#s->Int#->State#s->(#State#s,Int64X2##)readInt64ArrayAsInt64X2# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int64X2# #)readInt64ArrayAsInt64X2#=MutableByteArray# s -> Int# -> State# s -> (# State# s, Int64X2# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int64X2# #)readInt64ArrayAsInt64X2#{-| Read a vector from specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readInt8ArrayAsInt8X32#::MutableByteArray#s->Int#->State#s->(#State#s,Int8X32##)readInt8ArrayAsInt8X32# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int8X32# #)readInt8ArrayAsInt8X32#=MutableByteArray# s -> Int# -> State# s -> (# State# s, Int8X32# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int8X32# #)readInt8ArrayAsInt8X32#{-| Read a vector from specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readInt16ArrayAsInt16X16#::MutableByteArray#s->Int#->State#s->(#State#s,Int16X16##)readInt16ArrayAsInt16X16# :: forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Int16X16# #)readInt16ArrayAsInt16X16#=MutableByteArray# s-> Int# -> State# s -> (# State# s, Int16X16# #)forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Int16X16# #)readInt16ArrayAsInt16X16#{-| Read a vector from specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readInt32ArrayAsInt32X8#::MutableByteArray#s->Int#->State#s->(#State#s,Int32X8##)readInt32ArrayAsInt32X8# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int32X8# #)readInt32ArrayAsInt32X8#=MutableByteArray# s -> Int# -> State# s -> (# State# s, Int32X8# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int32X8# #)readInt32ArrayAsInt32X8#{-| Read a vector from specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readInt64ArrayAsInt64X4#::MutableByteArray#s->Int#->State#s->(#State#s,Int64X4##)readInt64ArrayAsInt64X4# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int64X4# #)readInt64ArrayAsInt64X4#=MutableByteArray# s -> Int# -> State# s -> (# State# s, Int64X4# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int64X4# #)readInt64ArrayAsInt64X4#{-| Read a vector from specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readInt8ArrayAsInt8X64#::MutableByteArray#s->Int#->State#s->(#State#s,Int8X64##)readInt8ArrayAsInt8X64# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int8X64# #)readInt8ArrayAsInt8X64#=MutableByteArray# s -> Int# -> State# s -> (# State# s, Int8X64# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int8X64# #)readInt8ArrayAsInt8X64#{-| Read a vector from specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readInt16ArrayAsInt16X32#::MutableByteArray#s->Int#->State#s->(#State#s,Int16X32##)readInt16ArrayAsInt16X32# :: forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Int16X32# #)readInt16ArrayAsInt16X32#=MutableByteArray# s-> Int# -> State# s -> (# State# s, Int16X32# #)forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Int16X32# #)readInt16ArrayAsInt16X32#{-| Read a vector from specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readInt32ArrayAsInt32X16#::MutableByteArray#s->Int#->State#s->(#State#s,Int32X16##)readInt32ArrayAsInt32X16# :: forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Int32X16# #)readInt32ArrayAsInt32X16#=MutableByteArray# s-> Int# -> State# s -> (# State# s, Int32X16# #)forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Int32X16# #)readInt32ArrayAsInt32X16#{-| Read a vector from specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readInt64ArrayAsInt64X8#::MutableByteArray#s->Int#->State#s->(#State#s,Int64X8##)readInt64ArrayAsInt64X8# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int64X8# #)readInt64ArrayAsInt64X8#=MutableByteArray# s -> Int# -> State# s -> (# State# s, Int64X8# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, Int64X8# #)readInt64ArrayAsInt64X8#{-| Read a vector from specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readWord8ArrayAsWord8X16#::MutableByteArray#s->Int#->State#s->(#State#s,Word8X16##)readWord8ArrayAsWord8X16# :: forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Word8X16# #)readWord8ArrayAsWord8X16#=MutableByteArray# s-> Int# -> State# s -> (# State# s, Word8X16# #)forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Word8X16# #)readWord8ArrayAsWord8X16#{-| Read a vector from specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readWord16ArrayAsWord16X8#::MutableByteArray#s->Int#->State#s->(#State#s,Word16X8##)readWord16ArrayAsWord16X8# :: forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Word16X8# #)readWord16ArrayAsWord16X8#=MutableByteArray# s-> Int# -> State# s -> (# State# s, Word16X8# #)forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Word16X8# #)readWord16ArrayAsWord16X8#{-| Read a vector from specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readWord32ArrayAsWord32X4#::MutableByteArray#s->Int#->State#s->(#State#s,Word32X4##)readWord32ArrayAsWord32X4# :: forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Word32X4# #)readWord32ArrayAsWord32X4#=MutableByteArray# s-> Int# -> State# s -> (# State# s, Word32X4# #)forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Word32X4# #)readWord32ArrayAsWord32X4#{-| Read a vector from specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readWord64ArrayAsWord64X2#::MutableByteArray#s->Int#->State#s->(#State#s,Word64X2##)readWord64ArrayAsWord64X2# :: forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Word64X2# #)readWord64ArrayAsWord64X2#=MutableByteArray# s-> Int# -> State# s -> (# State# s, Word64X2# #)forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Word64X2# #)readWord64ArrayAsWord64X2#{-| Read a vector from specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readWord8ArrayAsWord8X32#::MutableByteArray#s->Int#->State#s->(#State#s,Word8X32##)readWord8ArrayAsWord8X32# :: forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Word8X32# #)readWord8ArrayAsWord8X32#=MutableByteArray# s-> Int# -> State# s -> (# State# s, Word8X32# #)forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Word8X32# #)readWord8ArrayAsWord8X32#{-| Read a vector from specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readWord16ArrayAsWord16X16#::MutableByteArray#s->Int#->State#s->(#State#s,Word16X16##)readWord16ArrayAsWord16X16# :: forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Word16X16# #)readWord16ArrayAsWord16X16#=MutableByteArray# s-> Int# -> State# s -> (# State# s, Word16X16# #)forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Word16X16# #)readWord16ArrayAsWord16X16#{-| Read a vector from specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readWord32ArrayAsWord32X8#::MutableByteArray#s->Int#->State#s->(#State#s,Word32X8##)readWord32ArrayAsWord32X8# :: forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Word32X8# #)readWord32ArrayAsWord32X8#=MutableByteArray# s-> Int# -> State# s -> (# State# s, Word32X8# #)forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Word32X8# #)readWord32ArrayAsWord32X8#{-| Read a vector from specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readWord64ArrayAsWord64X4#::MutableByteArray#s->Int#->State#s->(#State#s,Word64X4##)readWord64ArrayAsWord64X4# :: forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Word64X4# #)readWord64ArrayAsWord64X4#=MutableByteArray# s-> Int# -> State# s -> (# State# s, Word64X4# #)forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Word64X4# #)readWord64ArrayAsWord64X4#{-| Read a vector from specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readWord8ArrayAsWord8X64#::MutableByteArray#s->Int#->State#s->(#State#s,Word8X64##)readWord8ArrayAsWord8X64# :: forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Word8X64# #)readWord8ArrayAsWord8X64#=MutableByteArray# s-> Int# -> State# s -> (# State# s, Word8X64# #)forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Word8X64# #)readWord8ArrayAsWord8X64#{-| Read a vector from specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readWord16ArrayAsWord16X32#::MutableByteArray#s->Int#->State#s->(#State#s,Word16X32##)readWord16ArrayAsWord16X32# :: forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Word16X32# #)readWord16ArrayAsWord16X32#=MutableByteArray# s-> Int# -> State# s -> (# State# s, Word16X32# #)forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Word16X32# #)readWord16ArrayAsWord16X32#{-| Read a vector from specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readWord32ArrayAsWord32X16#::MutableByteArray#s->Int#->State#s->(#State#s,Word32X16##)readWord32ArrayAsWord32X16# :: forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Word32X16# #)readWord32ArrayAsWord32X16#=MutableByteArray# s-> Int# -> State# s -> (# State# s, Word32X16# #)forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Word32X16# #)readWord32ArrayAsWord32X16#{-| Read a vector from specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readWord64ArrayAsWord64X8#::MutableByteArray#s->Int#->State#s->(#State#s,Word64X8##)readWord64ArrayAsWord64X8# :: forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Word64X8# #)readWord64ArrayAsWord64X8#=MutableByteArray# s-> Int# -> State# s -> (# State# s, Word64X8# #)forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, Word64X8# #)readWord64ArrayAsWord64X8#{-| Read a vector from specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readFloatArrayAsFloatX4#::MutableByteArray#s->Int#->State#s->(#State#s,FloatX4##)readFloatArrayAsFloatX4# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, FloatX4# #)readFloatArrayAsFloatX4#=MutableByteArray# s -> Int# -> State# s -> (# State# s, FloatX4# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, FloatX4# #)readFloatArrayAsFloatX4#{-| Read a vector from specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readDoubleArrayAsDoubleX2#::MutableByteArray#s->Int#->State#s->(#State#s,DoubleX2##)readDoubleArrayAsDoubleX2# :: forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, DoubleX2# #)readDoubleArrayAsDoubleX2#=MutableByteArray# s-> Int# -> State# s -> (# State# s, DoubleX2# #)forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, DoubleX2# #)readDoubleArrayAsDoubleX2#{-| Read a vector from specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readFloatArrayAsFloatX8#::MutableByteArray#s->Int#->State#s->(#State#s,FloatX8##)readFloatArrayAsFloatX8# :: forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, FloatX8# #)readFloatArrayAsFloatX8#=MutableByteArray# s -> Int# -> State# s -> (# State# s, FloatX8# #)forall s.MutableByteArray# s -> Int# -> State# s -> (# State# s, FloatX8# #)readFloatArrayAsFloatX8#{-| Read a vector from specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readDoubleArrayAsDoubleX4#::MutableByteArray#s->Int#->State#s->(#State#s,DoubleX4##)readDoubleArrayAsDoubleX4# :: forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, DoubleX4# #)readDoubleArrayAsDoubleX4#=MutableByteArray# s-> Int# -> State# s -> (# State# s, DoubleX4# #)forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, DoubleX4# #)readDoubleArrayAsDoubleX4#{-| Read a vector from specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readFloatArrayAsFloatX16#::MutableByteArray#s->Int#->State#s->(#State#s,FloatX16##)readFloatArrayAsFloatX16# :: forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, FloatX16# #)readFloatArrayAsFloatX16#=MutableByteArray# s-> Int# -> State# s -> (# State# s, FloatX16# #)forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, FloatX16# #)readFloatArrayAsFloatX16#{-| Read a vector from specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readDoubleArrayAsDoubleX8#::MutableByteArray#s->Int#->State#s->(#State#s,DoubleX8##)readDoubleArrayAsDoubleX8# :: forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, DoubleX8# #)readDoubleArrayAsDoubleX8#=MutableByteArray# s-> Int# -> State# s -> (# State# s, DoubleX8# #)forall s.MutableByteArray# s-> Int# -> State# s -> (# State# s, DoubleX8# #)readDoubleArrayAsDoubleX8#{-| Write a vector to specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeInt8ArrayAsInt8X16#::MutableByteArray#s->Int#->Int8X16#->State#s->State#swriteInt8ArrayAsInt8X16# :: forall s.MutableByteArray# s -> Int# -> Int8X16# -> State# s -> State# swriteInt8ArrayAsInt8X16#=MutableByteArray# s -> Int# -> Int8X16# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Int8X16# -> State# s -> State# swriteInt8ArrayAsInt8X16#{-| Write a vector to specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeInt16ArrayAsInt16X8#::MutableByteArray#s->Int#->Int16X8#->State#s->State#swriteInt16ArrayAsInt16X8# :: forall s.MutableByteArray# s -> Int# -> Int16X8# -> State# s -> State# swriteInt16ArrayAsInt16X8#=MutableByteArray# s -> Int# -> Int16X8# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Int16X8# -> State# s -> State# swriteInt16ArrayAsInt16X8#{-| Write a vector to specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeInt32ArrayAsInt32X4#::MutableByteArray#s->Int#->Int32X4#->State#s->State#swriteInt32ArrayAsInt32X4# :: forall s.MutableByteArray# s -> Int# -> Int32X4# -> State# s -> State# swriteInt32ArrayAsInt32X4#=MutableByteArray# s -> Int# -> Int32X4# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Int32X4# -> State# s -> State# swriteInt32ArrayAsInt32X4#{-| Write a vector to specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeInt64ArrayAsInt64X2#::MutableByteArray#s->Int#->Int64X2#->State#s->State#swriteInt64ArrayAsInt64X2# :: forall s.MutableByteArray# s -> Int# -> Int64X2# -> State# s -> State# swriteInt64ArrayAsInt64X2#=MutableByteArray# s -> Int# -> Int64X2# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Int64X2# -> State# s -> State# swriteInt64ArrayAsInt64X2#{-| Write a vector to specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeInt8ArrayAsInt8X32#::MutableByteArray#s->Int#->Int8X32#->State#s->State#swriteInt8ArrayAsInt8X32# :: forall s.MutableByteArray# s -> Int# -> Int8X32# -> State# s -> State# swriteInt8ArrayAsInt8X32#=MutableByteArray# s -> Int# -> Int8X32# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Int8X32# -> State# s -> State# swriteInt8ArrayAsInt8X32#{-| Write a vector to specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeInt16ArrayAsInt16X16#::MutableByteArray#s->Int#->Int16X16#->State#s->State#swriteInt16ArrayAsInt16X16# :: forall s.MutableByteArray# s -> Int# -> Int16X16# -> State# s -> State# swriteInt16ArrayAsInt16X16#=MutableByteArray# s -> Int# -> Int16X16# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Int16X16# -> State# s -> State# swriteInt16ArrayAsInt16X16#{-| Write a vector to specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeInt32ArrayAsInt32X8#::MutableByteArray#s->Int#->Int32X8#->State#s->State#swriteInt32ArrayAsInt32X8# :: forall s.MutableByteArray# s -> Int# -> Int32X8# -> State# s -> State# swriteInt32ArrayAsInt32X8#=MutableByteArray# s -> Int# -> Int32X8# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Int32X8# -> State# s -> State# swriteInt32ArrayAsInt32X8#{-| Write a vector to specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeInt64ArrayAsInt64X4#::MutableByteArray#s->Int#->Int64X4#->State#s->State#swriteInt64ArrayAsInt64X4# :: forall s.MutableByteArray# s -> Int# -> Int64X4# -> State# s -> State# swriteInt64ArrayAsInt64X4#=MutableByteArray# s -> Int# -> Int64X4# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Int64X4# -> State# s -> State# swriteInt64ArrayAsInt64X4#{-| Write a vector to specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeInt8ArrayAsInt8X64#::MutableByteArray#s->Int#->Int8X64#->State#s->State#swriteInt8ArrayAsInt8X64# :: forall s.MutableByteArray# s -> Int# -> Int8X64# -> State# s -> State# swriteInt8ArrayAsInt8X64#=MutableByteArray# s -> Int# -> Int8X64# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Int8X64# -> State# s -> State# swriteInt8ArrayAsInt8X64#{-| Write a vector to specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeInt16ArrayAsInt16X32#::MutableByteArray#s->Int#->Int16X32#->State#s->State#swriteInt16ArrayAsInt16X32# :: forall s.MutableByteArray# s -> Int# -> Int16X32# -> State# s -> State# swriteInt16ArrayAsInt16X32#=MutableByteArray# s -> Int# -> Int16X32# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Int16X32# -> State# s -> State# swriteInt16ArrayAsInt16X32#{-| Write a vector to specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeInt32ArrayAsInt32X16#::MutableByteArray#s->Int#->Int32X16#->State#s->State#swriteInt32ArrayAsInt32X16# :: forall s.MutableByteArray# s -> Int# -> Int32X16# -> State# s -> State# swriteInt32ArrayAsInt32X16#=MutableByteArray# s -> Int# -> Int32X16# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Int32X16# -> State# s -> State# swriteInt32ArrayAsInt32X16#{-| Write a vector to specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeInt64ArrayAsInt64X8#::MutableByteArray#s->Int#->Int64X8#->State#s->State#swriteInt64ArrayAsInt64X8# :: forall s.MutableByteArray# s -> Int# -> Int64X8# -> State# s -> State# swriteInt64ArrayAsInt64X8#=MutableByteArray# s -> Int# -> Int64X8# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Int64X8# -> State# s -> State# swriteInt64ArrayAsInt64X8#{-| Write a vector to specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeWord8ArrayAsWord8X16#::MutableByteArray#s->Int#->Word8X16#->State#s->State#swriteWord8ArrayAsWord8X16# :: forall s.MutableByteArray# s -> Int# -> Word8X16# -> State# s -> State# swriteWord8ArrayAsWord8X16#=MutableByteArray# s -> Int# -> Word8X16# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Word8X16# -> State# s -> State# swriteWord8ArrayAsWord8X16#{-| Write a vector to specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeWord16ArrayAsWord16X8#::MutableByteArray#s->Int#->Word16X8#->State#s->State#swriteWord16ArrayAsWord16X8# :: forall s.MutableByteArray# s -> Int# -> Word16X8# -> State# s -> State# swriteWord16ArrayAsWord16X8#=MutableByteArray# s -> Int# -> Word16X8# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Word16X8# -> State# s -> State# swriteWord16ArrayAsWord16X8#{-| Write a vector to specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeWord32ArrayAsWord32X4#::MutableByteArray#s->Int#->Word32X4#->State#s->State#swriteWord32ArrayAsWord32X4# :: forall s.MutableByteArray# s -> Int# -> Word32X4# -> State# s -> State# swriteWord32ArrayAsWord32X4#=MutableByteArray# s -> Int# -> Word32X4# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Word32X4# -> State# s -> State# swriteWord32ArrayAsWord32X4#{-| Write a vector to specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeWord64ArrayAsWord64X2#::MutableByteArray#s->Int#->Word64X2#->State#s->State#swriteWord64ArrayAsWord64X2# :: forall s.MutableByteArray# s -> Int# -> Word64X2# -> State# s -> State# swriteWord64ArrayAsWord64X2#=MutableByteArray# s -> Int# -> Word64X2# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Word64X2# -> State# s -> State# swriteWord64ArrayAsWord64X2#{-| Write a vector to specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeWord8ArrayAsWord8X32#::MutableByteArray#s->Int#->Word8X32#->State#s->State#swriteWord8ArrayAsWord8X32# :: forall s.MutableByteArray# s -> Int# -> Word8X32# -> State# s -> State# swriteWord8ArrayAsWord8X32#=MutableByteArray# s -> Int# -> Word8X32# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Word8X32# -> State# s -> State# swriteWord8ArrayAsWord8X32#{-| Write a vector to specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeWord16ArrayAsWord16X16#::MutableByteArray#s->Int#->Word16X16#->State#s->State#swriteWord16ArrayAsWord16X16# :: forall s.MutableByteArray# s -> Int# -> Word16X16# -> State# s -> State# swriteWord16ArrayAsWord16X16#=MutableByteArray# s -> Int# -> Word16X16# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Word16X16# -> State# s -> State# swriteWord16ArrayAsWord16X16#{-| Write a vector to specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeWord32ArrayAsWord32X8#::MutableByteArray#s->Int#->Word32X8#->State#s->State#swriteWord32ArrayAsWord32X8# :: forall s.MutableByteArray# s -> Int# -> Word32X8# -> State# s -> State# swriteWord32ArrayAsWord32X8#=MutableByteArray# s -> Int# -> Word32X8# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Word32X8# -> State# s -> State# swriteWord32ArrayAsWord32X8#{-| Write a vector to specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeWord64ArrayAsWord64X4#::MutableByteArray#s->Int#->Word64X4#->State#s->State#swriteWord64ArrayAsWord64X4# :: forall s.MutableByteArray# s -> Int# -> Word64X4# -> State# s -> State# swriteWord64ArrayAsWord64X4#=MutableByteArray# s -> Int# -> Word64X4# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Word64X4# -> State# s -> State# swriteWord64ArrayAsWord64X4#{-| Write a vector to specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeWord8ArrayAsWord8X64#::MutableByteArray#s->Int#->Word8X64#->State#s->State#swriteWord8ArrayAsWord8X64# :: forall s.MutableByteArray# s -> Int# -> Word8X64# -> State# s -> State# swriteWord8ArrayAsWord8X64#=MutableByteArray# s -> Int# -> Word8X64# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Word8X64# -> State# s -> State# swriteWord8ArrayAsWord8X64#{-| Write a vector to specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeWord16ArrayAsWord16X32#::MutableByteArray#s->Int#->Word16X32#->State#s->State#swriteWord16ArrayAsWord16X32# :: forall s.MutableByteArray# s -> Int# -> Word16X32# -> State# s -> State# swriteWord16ArrayAsWord16X32#=MutableByteArray# s -> Int# -> Word16X32# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Word16X32# -> State# s -> State# swriteWord16ArrayAsWord16X32#{-| Write a vector to specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeWord32ArrayAsWord32X16#::MutableByteArray#s->Int#->Word32X16#->State#s->State#swriteWord32ArrayAsWord32X16# :: forall s.MutableByteArray# s -> Int# -> Word32X16# -> State# s -> State# swriteWord32ArrayAsWord32X16#=MutableByteArray# s -> Int# -> Word32X16# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Word32X16# -> State# s -> State# swriteWord32ArrayAsWord32X16#{-| Write a vector to specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeWord64ArrayAsWord64X8#::MutableByteArray#s->Int#->Word64X8#->State#s->State#swriteWord64ArrayAsWord64X8# :: forall s.MutableByteArray# s -> Int# -> Word64X8# -> State# s -> State# swriteWord64ArrayAsWord64X8#=MutableByteArray# s -> Int# -> Word64X8# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> Word64X8# -> State# s -> State# swriteWord64ArrayAsWord64X8#{-| Write a vector to specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeFloatArrayAsFloatX4#::MutableByteArray#s->Int#->FloatX4#->State#s->State#swriteFloatArrayAsFloatX4# :: forall s.MutableByteArray# s -> Int# -> FloatX4# -> State# s -> State# swriteFloatArrayAsFloatX4#=MutableByteArray# s -> Int# -> FloatX4# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> FloatX4# -> State# s -> State# swriteFloatArrayAsFloatX4#{-| Write a vector to specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeDoubleArrayAsDoubleX2#::MutableByteArray#s->Int#->DoubleX2#->State#s->State#swriteDoubleArrayAsDoubleX2# :: forall s.MutableByteArray# s -> Int# -> DoubleX2# -> State# s -> State# swriteDoubleArrayAsDoubleX2#=MutableByteArray# s -> Int# -> DoubleX2# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> DoubleX2# -> State# s -> State# swriteDoubleArrayAsDoubleX2#{-| Write a vector to specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeFloatArrayAsFloatX8#::MutableByteArray#s->Int#->FloatX8#->State#s->State#swriteFloatArrayAsFloatX8# :: forall s.MutableByteArray# s -> Int# -> FloatX8# -> State# s -> State# swriteFloatArrayAsFloatX8#=MutableByteArray# s -> Int# -> FloatX8# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> FloatX8# -> State# s -> State# swriteFloatArrayAsFloatX8#{-| Write a vector to specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeDoubleArrayAsDoubleX4#::MutableByteArray#s->Int#->DoubleX4#->State#s->State#swriteDoubleArrayAsDoubleX4# :: forall s.MutableByteArray# s -> Int# -> DoubleX4# -> State# s -> State# swriteDoubleArrayAsDoubleX4#=MutableByteArray# s -> Int# -> DoubleX4# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> DoubleX4# -> State# s -> State# swriteDoubleArrayAsDoubleX4#{-| Write a vector to specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeFloatArrayAsFloatX16#::MutableByteArray#s->Int#->FloatX16#->State#s->State#swriteFloatArrayAsFloatX16# :: forall s.MutableByteArray# s -> Int# -> FloatX16# -> State# s -> State# swriteFloatArrayAsFloatX16#=MutableByteArray# s -> Int# -> FloatX16# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> FloatX16# -> State# s -> State# swriteFloatArrayAsFloatX16#{-| Write a vector to specified index of mutable array of scalars; offset is in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeDoubleArrayAsDoubleX8#::MutableByteArray#s->Int#->DoubleX8#->State#s->State#swriteDoubleArrayAsDoubleX8# :: forall s.MutableByteArray# s -> Int# -> DoubleX8# -> State# s -> State# swriteDoubleArrayAsDoubleX8#=MutableByteArray# s -> Int# -> DoubleX8# -> State# s -> State# sforall s.MutableByteArray# s -> Int# -> DoubleX8# -> State# s -> State# swriteDoubleArrayAsDoubleX8#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexInt8OffAddrAsInt8X16#::Addr#->Int#->Int8X16#indexInt8OffAddrAsInt8X16# :: Addr# -> Int# -> Int8X16#indexInt8OffAddrAsInt8X16#=Addr# -> Int# -> Int8X16#indexInt8OffAddrAsInt8X16#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexInt16OffAddrAsInt16X8#::Addr#->Int#->Int16X8#indexInt16OffAddrAsInt16X8# :: Addr# -> Int# -> Int16X8#indexInt16OffAddrAsInt16X8#=Addr# -> Int# -> Int16X8#indexInt16OffAddrAsInt16X8#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexInt32OffAddrAsInt32X4#::Addr#->Int#->Int32X4#indexInt32OffAddrAsInt32X4# :: Addr# -> Int# -> Int32X4#indexInt32OffAddrAsInt32X4#=Addr# -> Int# -> Int32X4#indexInt32OffAddrAsInt32X4#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexInt64OffAddrAsInt64X2#::Addr#->Int#->Int64X2#indexInt64OffAddrAsInt64X2# :: Addr# -> Int# -> Int64X2#indexInt64OffAddrAsInt64X2#=Addr# -> Int# -> Int64X2#indexInt64OffAddrAsInt64X2#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexInt8OffAddrAsInt8X32#::Addr#->Int#->Int8X32#indexInt8OffAddrAsInt8X32# :: Addr# -> Int# -> Int8X32#indexInt8OffAddrAsInt8X32#=Addr# -> Int# -> Int8X32#indexInt8OffAddrAsInt8X32#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexInt16OffAddrAsInt16X16#::Addr#->Int#->Int16X16#indexInt16OffAddrAsInt16X16# :: Addr# -> Int# -> Int16X16#indexInt16OffAddrAsInt16X16#=Addr# -> Int# -> Int16X16#indexInt16OffAddrAsInt16X16#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexInt32OffAddrAsInt32X8#::Addr#->Int#->Int32X8#indexInt32OffAddrAsInt32X8# :: Addr# -> Int# -> Int32X8#indexInt32OffAddrAsInt32X8#=Addr# -> Int# -> Int32X8#indexInt32OffAddrAsInt32X8#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexInt64OffAddrAsInt64X4#::Addr#->Int#->Int64X4#indexInt64OffAddrAsInt64X4# :: Addr# -> Int# -> Int64X4#indexInt64OffAddrAsInt64X4#=Addr# -> Int# -> Int64X4#indexInt64OffAddrAsInt64X4#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexInt8OffAddrAsInt8X64#::Addr#->Int#->Int8X64#indexInt8OffAddrAsInt8X64# :: Addr# -> Int# -> Int8X64#indexInt8OffAddrAsInt8X64#=Addr# -> Int# -> Int8X64#indexInt8OffAddrAsInt8X64#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexInt16OffAddrAsInt16X32#::Addr#->Int#->Int16X32#indexInt16OffAddrAsInt16X32# :: Addr# -> Int# -> Int16X32#indexInt16OffAddrAsInt16X32#=Addr# -> Int# -> Int16X32#indexInt16OffAddrAsInt16X32#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexInt32OffAddrAsInt32X16#::Addr#->Int#->Int32X16#indexInt32OffAddrAsInt32X16# :: Addr# -> Int# -> Int32X16#indexInt32OffAddrAsInt32X16#=Addr# -> Int# -> Int32X16#indexInt32OffAddrAsInt32X16#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexInt64OffAddrAsInt64X8#::Addr#->Int#->Int64X8#indexInt64OffAddrAsInt64X8# :: Addr# -> Int# -> Int64X8#indexInt64OffAddrAsInt64X8#=Addr# -> Int# -> Int64X8#indexInt64OffAddrAsInt64X8#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexWord8OffAddrAsWord8X16#::Addr#->Int#->Word8X16#indexWord8OffAddrAsWord8X16# :: Addr# -> Int# -> Word8X16#indexWord8OffAddrAsWord8X16#=Addr# -> Int# -> Word8X16#indexWord8OffAddrAsWord8X16#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexWord16OffAddrAsWord16X8#::Addr#->Int#->Word16X8#indexWord16OffAddrAsWord16X8# :: Addr# -> Int# -> Word16X8#indexWord16OffAddrAsWord16X8#=Addr# -> Int# -> Word16X8#indexWord16OffAddrAsWord16X8#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexWord32OffAddrAsWord32X4#::Addr#->Int#->Word32X4#indexWord32OffAddrAsWord32X4# :: Addr# -> Int# -> Word32X4#indexWord32OffAddrAsWord32X4#=Addr# -> Int# -> Word32X4#indexWord32OffAddrAsWord32X4#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexWord64OffAddrAsWord64X2#::Addr#->Int#->Word64X2#indexWord64OffAddrAsWord64X2# :: Addr# -> Int# -> Word64X2#indexWord64OffAddrAsWord64X2#=Addr# -> Int# -> Word64X2#indexWord64OffAddrAsWord64X2#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexWord8OffAddrAsWord8X32#::Addr#->Int#->Word8X32#indexWord8OffAddrAsWord8X32# :: Addr# -> Int# -> Word8X32#indexWord8OffAddrAsWord8X32#=Addr# -> Int# -> Word8X32#indexWord8OffAddrAsWord8X32#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexWord16OffAddrAsWord16X16#::Addr#->Int#->Word16X16#indexWord16OffAddrAsWord16X16# :: Addr# -> Int# -> Word16X16#indexWord16OffAddrAsWord16X16#=Addr# -> Int# -> Word16X16#indexWord16OffAddrAsWord16X16#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexWord32OffAddrAsWord32X8#::Addr#->Int#->Word32X8#indexWord32OffAddrAsWord32X8# :: Addr# -> Int# -> Word32X8#indexWord32OffAddrAsWord32X8#=Addr# -> Int# -> Word32X8#indexWord32OffAddrAsWord32X8#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexWord64OffAddrAsWord64X4#::Addr#->Int#->Word64X4#indexWord64OffAddrAsWord64X4# :: Addr# -> Int# -> Word64X4#indexWord64OffAddrAsWord64X4#=Addr# -> Int# -> Word64X4#indexWord64OffAddrAsWord64X4#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexWord8OffAddrAsWord8X64#::Addr#->Int#->Word8X64#indexWord8OffAddrAsWord8X64# :: Addr# -> Int# -> Word8X64#indexWord8OffAddrAsWord8X64#=Addr# -> Int# -> Word8X64#indexWord8OffAddrAsWord8X64#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexWord16OffAddrAsWord16X32#::Addr#->Int#->Word16X32#indexWord16OffAddrAsWord16X32# :: Addr# -> Int# -> Word16X32#indexWord16OffAddrAsWord16X32#=Addr# -> Int# -> Word16X32#indexWord16OffAddrAsWord16X32#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexWord32OffAddrAsWord32X16#::Addr#->Int#->Word32X16#indexWord32OffAddrAsWord32X16# :: Addr# -> Int# -> Word32X16#indexWord32OffAddrAsWord32X16#=Addr# -> Int# -> Word32X16#indexWord32OffAddrAsWord32X16#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexWord64OffAddrAsWord64X8#::Addr#->Int#->Word64X8#indexWord64OffAddrAsWord64X8# :: Addr# -> Int# -> Word64X8#indexWord64OffAddrAsWord64X8#=Addr# -> Int# -> Word64X8#indexWord64OffAddrAsWord64X8#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexFloatOffAddrAsFloatX4#::Addr#->Int#->FloatX4#indexFloatOffAddrAsFloatX4# :: Addr# -> Int# -> FloatX4#indexFloatOffAddrAsFloatX4#=Addr# -> Int# -> FloatX4#indexFloatOffAddrAsFloatX4#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexDoubleOffAddrAsDoubleX2#::Addr#->Int#->DoubleX2#indexDoubleOffAddrAsDoubleX2# :: Addr# -> Int# -> DoubleX2#indexDoubleOffAddrAsDoubleX2#=Addr# -> Int# -> DoubleX2#indexDoubleOffAddrAsDoubleX2#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexFloatOffAddrAsFloatX8#::Addr#->Int#->FloatX8#indexFloatOffAddrAsFloatX8# :: Addr# -> Int# -> FloatX8#indexFloatOffAddrAsFloatX8#=Addr# -> Int# -> FloatX8#indexFloatOffAddrAsFloatX8#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexDoubleOffAddrAsDoubleX4#::Addr#->Int#->DoubleX4#indexDoubleOffAddrAsDoubleX4# :: Addr# -> Int# -> DoubleX4#indexDoubleOffAddrAsDoubleX4#=Addr# -> Int# -> DoubleX4#indexDoubleOffAddrAsDoubleX4#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexFloatOffAddrAsFloatX16#::Addr#->Int#->FloatX16#indexFloatOffAddrAsFloatX16# :: Addr# -> Int# -> FloatX16#indexFloatOffAddrAsFloatX16#=Addr# -> Int# -> FloatX16#indexFloatOffAddrAsFloatX16#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM.-}indexDoubleOffAddrAsDoubleX8#::Addr#->Int#->DoubleX8#indexDoubleOffAddrAsDoubleX8# :: Addr# -> Int# -> DoubleX8#indexDoubleOffAddrAsDoubleX8#=Addr# -> Int# -> DoubleX8#indexDoubleOffAddrAsDoubleX8#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readInt8OffAddrAsInt8X16#::Addr#->Int#->State#s->(#State#s,Int8X16##)readInt8OffAddrAsInt8X16# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Int8X16# #)readInt8OffAddrAsInt8X16#=Addr# -> Int# -> State# s -> (# State# s, Int8X16# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Int8X16# #)readInt8OffAddrAsInt8X16#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readInt16OffAddrAsInt16X8#::Addr#->Int#->State#s->(#State#s,Int16X8##)readInt16OffAddrAsInt16X8# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Int16X8# #)readInt16OffAddrAsInt16X8#=Addr# -> Int# -> State# s -> (# State# s, Int16X8# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Int16X8# #)readInt16OffAddrAsInt16X8#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readInt32OffAddrAsInt32X4#::Addr#->Int#->State#s->(#State#s,Int32X4##)readInt32OffAddrAsInt32X4# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Int32X4# #)readInt32OffAddrAsInt32X4#=Addr# -> Int# -> State# s -> (# State# s, Int32X4# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Int32X4# #)readInt32OffAddrAsInt32X4#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readInt64OffAddrAsInt64X2#::Addr#->Int#->State#s->(#State#s,Int64X2##)readInt64OffAddrAsInt64X2# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Int64X2# #)readInt64OffAddrAsInt64X2#=Addr# -> Int# -> State# s -> (# State# s, Int64X2# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Int64X2# #)readInt64OffAddrAsInt64X2#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readInt8OffAddrAsInt8X32#::Addr#->Int#->State#s->(#State#s,Int8X32##)readInt8OffAddrAsInt8X32# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Int8X32# #)readInt8OffAddrAsInt8X32#=Addr# -> Int# -> State# s -> (# State# s, Int8X32# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Int8X32# #)readInt8OffAddrAsInt8X32#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readInt16OffAddrAsInt16X16#::Addr#->Int#->State#s->(#State#s,Int16X16##)readInt16OffAddrAsInt16X16# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Int16X16# #)readInt16OffAddrAsInt16X16#=Addr# -> Int# -> State# s -> (# State# s, Int16X16# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Int16X16# #)readInt16OffAddrAsInt16X16#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readInt32OffAddrAsInt32X8#::Addr#->Int#->State#s->(#State#s,Int32X8##)readInt32OffAddrAsInt32X8# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Int32X8# #)readInt32OffAddrAsInt32X8#=Addr# -> Int# -> State# s -> (# State# s, Int32X8# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Int32X8# #)readInt32OffAddrAsInt32X8#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readInt64OffAddrAsInt64X4#::Addr#->Int#->State#s->(#State#s,Int64X4##)readInt64OffAddrAsInt64X4# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Int64X4# #)readInt64OffAddrAsInt64X4#=Addr# -> Int# -> State# s -> (# State# s, Int64X4# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Int64X4# #)readInt64OffAddrAsInt64X4#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readInt8OffAddrAsInt8X64#::Addr#->Int#->State#s->(#State#s,Int8X64##)readInt8OffAddrAsInt8X64# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Int8X64# #)readInt8OffAddrAsInt8X64#=Addr# -> Int# -> State# s -> (# State# s, Int8X64# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Int8X64# #)readInt8OffAddrAsInt8X64#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readInt16OffAddrAsInt16X32#::Addr#->Int#->State#s->(#State#s,Int16X32##)readInt16OffAddrAsInt16X32# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Int16X32# #)readInt16OffAddrAsInt16X32#=Addr# -> Int# -> State# s -> (# State# s, Int16X32# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Int16X32# #)readInt16OffAddrAsInt16X32#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readInt32OffAddrAsInt32X16#::Addr#->Int#->State#s->(#State#s,Int32X16##)readInt32OffAddrAsInt32X16# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Int32X16# #)readInt32OffAddrAsInt32X16#=Addr# -> Int# -> State# s -> (# State# s, Int32X16# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Int32X16# #)readInt32OffAddrAsInt32X16#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readInt64OffAddrAsInt64X8#::Addr#->Int#->State#s->(#State#s,Int64X8##)readInt64OffAddrAsInt64X8# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Int64X8# #)readInt64OffAddrAsInt64X8#=Addr# -> Int# -> State# s -> (# State# s, Int64X8# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Int64X8# #)readInt64OffAddrAsInt64X8#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readWord8OffAddrAsWord8X16#::Addr#->Int#->State#s->(#State#s,Word8X16##)readWord8OffAddrAsWord8X16# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Word8X16# #)readWord8OffAddrAsWord8X16#=Addr# -> Int# -> State# s -> (# State# s, Word8X16# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Word8X16# #)readWord8OffAddrAsWord8X16#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readWord16OffAddrAsWord16X8#::Addr#->Int#->State#s->(#State#s,Word16X8##)readWord16OffAddrAsWord16X8# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Word16X8# #)readWord16OffAddrAsWord16X8#=Addr# -> Int# -> State# s -> (# State# s, Word16X8# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Word16X8# #)readWord16OffAddrAsWord16X8#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readWord32OffAddrAsWord32X4#::Addr#->Int#->State#s->(#State#s,Word32X4##)readWord32OffAddrAsWord32X4# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Word32X4# #)readWord32OffAddrAsWord32X4#=Addr# -> Int# -> State# s -> (# State# s, Word32X4# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Word32X4# #)readWord32OffAddrAsWord32X4#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readWord64OffAddrAsWord64X2#::Addr#->Int#->State#s->(#State#s,Word64X2##)readWord64OffAddrAsWord64X2# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Word64X2# #)readWord64OffAddrAsWord64X2#=Addr# -> Int# -> State# s -> (# State# s, Word64X2# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Word64X2# #)readWord64OffAddrAsWord64X2#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readWord8OffAddrAsWord8X32#::Addr#->Int#->State#s->(#State#s,Word8X32##)readWord8OffAddrAsWord8X32# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Word8X32# #)readWord8OffAddrAsWord8X32#=Addr# -> Int# -> State# s -> (# State# s, Word8X32# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Word8X32# #)readWord8OffAddrAsWord8X32#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readWord16OffAddrAsWord16X16#::Addr#->Int#->State#s->(#State#s,Word16X16##)readWord16OffAddrAsWord16X16# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Word16X16# #)readWord16OffAddrAsWord16X16#=Addr# -> Int# -> State# s -> (# State# s, Word16X16# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Word16X16# #)readWord16OffAddrAsWord16X16#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readWord32OffAddrAsWord32X8#::Addr#->Int#->State#s->(#State#s,Word32X8##)readWord32OffAddrAsWord32X8# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Word32X8# #)readWord32OffAddrAsWord32X8#=Addr# -> Int# -> State# s -> (# State# s, Word32X8# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Word32X8# #)readWord32OffAddrAsWord32X8#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readWord64OffAddrAsWord64X4#::Addr#->Int#->State#s->(#State#s,Word64X4##)readWord64OffAddrAsWord64X4# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Word64X4# #)readWord64OffAddrAsWord64X4#=Addr# -> Int# -> State# s -> (# State# s, Word64X4# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Word64X4# #)readWord64OffAddrAsWord64X4#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readWord8OffAddrAsWord8X64#::Addr#->Int#->State#s->(#State#s,Word8X64##)readWord8OffAddrAsWord8X64# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Word8X64# #)readWord8OffAddrAsWord8X64#=Addr# -> Int# -> State# s -> (# State# s, Word8X64# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Word8X64# #)readWord8OffAddrAsWord8X64#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readWord16OffAddrAsWord16X32#::Addr#->Int#->State#s->(#State#s,Word16X32##)readWord16OffAddrAsWord16X32# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Word16X32# #)readWord16OffAddrAsWord16X32#=Addr# -> Int# -> State# s -> (# State# s, Word16X32# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Word16X32# #)readWord16OffAddrAsWord16X32#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readWord32OffAddrAsWord32X16#::Addr#->Int#->State#s->(#State#s,Word32X16##)readWord32OffAddrAsWord32X16# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Word32X16# #)readWord32OffAddrAsWord32X16#=Addr# -> Int# -> State# s -> (# State# s, Word32X16# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Word32X16# #)readWord32OffAddrAsWord32X16#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readWord64OffAddrAsWord64X8#::Addr#->Int#->State#s->(#State#s,Word64X8##)readWord64OffAddrAsWord64X8# :: forall s. Addr# -> Int# -> State# s -> (# State# s, Word64X8# #)readWord64OffAddrAsWord64X8#=Addr# -> Int# -> State# s -> (# State# s, Word64X8# #)forall s. Addr# -> Int# -> State# s -> (# State# s, Word64X8# #)readWord64OffAddrAsWord64X8#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readFloatOffAddrAsFloatX4#::Addr#->Int#->State#s->(#State#s,FloatX4##)readFloatOffAddrAsFloatX4# :: forall s. Addr# -> Int# -> State# s -> (# State# s, FloatX4# #)readFloatOffAddrAsFloatX4#=Addr# -> Int# -> State# s -> (# State# s, FloatX4# #)forall s. Addr# -> Int# -> State# s -> (# State# s, FloatX4# #)readFloatOffAddrAsFloatX4#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readDoubleOffAddrAsDoubleX2#::Addr#->Int#->State#s->(#State#s,DoubleX2##)readDoubleOffAddrAsDoubleX2# :: forall s. Addr# -> Int# -> State# s -> (# State# s, DoubleX2# #)readDoubleOffAddrAsDoubleX2#=Addr# -> Int# -> State# s -> (# State# s, DoubleX2# #)forall s. Addr# -> Int# -> State# s -> (# State# s, DoubleX2# #)readDoubleOffAddrAsDoubleX2#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readFloatOffAddrAsFloatX8#::Addr#->Int#->State#s->(#State#s,FloatX8##)readFloatOffAddrAsFloatX8# :: forall s. Addr# -> Int# -> State# s -> (# State# s, FloatX8# #)readFloatOffAddrAsFloatX8#=Addr# -> Int# -> State# s -> (# State# s, FloatX8# #)forall s. Addr# -> Int# -> State# s -> (# State# s, FloatX8# #)readFloatOffAddrAsFloatX8#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readDoubleOffAddrAsDoubleX4#::Addr#->Int#->State#s->(#State#s,DoubleX4##)readDoubleOffAddrAsDoubleX4# :: forall s. Addr# -> Int# -> State# s -> (# State# s, DoubleX4# #)readDoubleOffAddrAsDoubleX4#=Addr# -> Int# -> State# s -> (# State# s, DoubleX4# #)forall s. Addr# -> Int# -> State# s -> (# State# s, DoubleX4# #)readDoubleOffAddrAsDoubleX4#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readFloatOffAddrAsFloatX16#::Addr#->Int#->State#s->(#State#s,FloatX16##)readFloatOffAddrAsFloatX16# :: forall s. Addr# -> Int# -> State# s -> (# State# s, FloatX16# #)readFloatOffAddrAsFloatX16#=Addr# -> Int# -> State# s -> (# State# s, FloatX16# #)forall s. Addr# -> Int# -> State# s -> (# State# s, FloatX16# #)readFloatOffAddrAsFloatX16#{-| Reads vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}readDoubleOffAddrAsDoubleX8#::Addr#->Int#->State#s->(#State#s,DoubleX8##)readDoubleOffAddrAsDoubleX8# :: forall s. Addr# -> Int# -> State# s -> (# State# s, DoubleX8# #)readDoubleOffAddrAsDoubleX8#=Addr# -> Int# -> State# s -> (# State# s, DoubleX8# #)forall s. Addr# -> Int# -> State# s -> (# State# s, DoubleX8# #)readDoubleOffAddrAsDoubleX8#{-| Write vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeInt8OffAddrAsInt8X16#::Addr#->Int#->Int8X16#->State#s->State#swriteInt8OffAddrAsInt8X16# :: forall s. Addr# -> Int# -> Int8X16# -> State# s -> State# swriteInt8OffAddrAsInt8X16#=Addr# -> Int# -> Int8X16# -> State# s -> State# sforall s. Addr# -> Int# -> Int8X16# -> State# s -> State# swriteInt8OffAddrAsInt8X16#{-| Write vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeInt16OffAddrAsInt16X8#::Addr#->Int#->Int16X8#->State#s->State#swriteInt16OffAddrAsInt16X8# :: forall s. Addr# -> Int# -> Int16X8# -> State# s -> State# swriteInt16OffAddrAsInt16X8#=Addr# -> Int# -> Int16X8# -> State# s -> State# sforall s. Addr# -> Int# -> Int16X8# -> State# s -> State# swriteInt16OffAddrAsInt16X8#{-| Write vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeInt32OffAddrAsInt32X4#::Addr#->Int#->Int32X4#->State#s->State#swriteInt32OffAddrAsInt32X4# :: forall s. Addr# -> Int# -> Int32X4# -> State# s -> State# swriteInt32OffAddrAsInt32X4#=Addr# -> Int# -> Int32X4# -> State# s -> State# sforall s. Addr# -> Int# -> Int32X4# -> State# s -> State# swriteInt32OffAddrAsInt32X4#{-| Write vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeInt64OffAddrAsInt64X2#::Addr#->Int#->Int64X2#->State#s->State#swriteInt64OffAddrAsInt64X2# :: forall s. Addr# -> Int# -> Int64X2# -> State# s -> State# swriteInt64OffAddrAsInt64X2#=Addr# -> Int# -> Int64X2# -> State# s -> State# sforall s. Addr# -> Int# -> Int64X2# -> State# s -> State# swriteInt64OffAddrAsInt64X2#{-| Write vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeInt8OffAddrAsInt8X32#::Addr#->Int#->Int8X32#->State#s->State#swriteInt8OffAddrAsInt8X32# :: forall s. Addr# -> Int# -> Int8X32# -> State# s -> State# swriteInt8OffAddrAsInt8X32#=Addr# -> Int# -> Int8X32# -> State# s -> State# sforall s. Addr# -> Int# -> Int8X32# -> State# s -> State# swriteInt8OffAddrAsInt8X32#{-| Write vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeInt16OffAddrAsInt16X16#::Addr#->Int#->Int16X16#->State#s->State#swriteInt16OffAddrAsInt16X16# :: forall s. Addr# -> Int# -> Int16X16# -> State# s -> State# swriteInt16OffAddrAsInt16X16#=Addr# -> Int# -> Int16X16# -> State# s -> State# sforall s. Addr# -> Int# -> Int16X16# -> State# s -> State# swriteInt16OffAddrAsInt16X16#{-| Write vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeInt32OffAddrAsInt32X8#::Addr#->Int#->Int32X8#->State#s->State#swriteInt32OffAddrAsInt32X8# :: forall s. Addr# -> Int# -> Int32X8# -> State# s -> State# swriteInt32OffAddrAsInt32X8#=Addr# -> Int# -> Int32X8# -> State# s -> State# sforall s. Addr# -> Int# -> Int32X8# -> State# s -> State# swriteInt32OffAddrAsInt32X8#{-| Write vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeInt64OffAddrAsInt64X4#::Addr#->Int#->Int64X4#->State#s->State#swriteInt64OffAddrAsInt64X4# :: forall s. Addr# -> Int# -> Int64X4# -> State# s -> State# swriteInt64OffAddrAsInt64X4#=Addr# -> Int# -> Int64X4# -> State# s -> State# sforall s. Addr# -> Int# -> Int64X4# -> State# s -> State# swriteInt64OffAddrAsInt64X4#{-| Write vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeInt8OffAddrAsInt8X64#::Addr#->Int#->Int8X64#->State#s->State#swriteInt8OffAddrAsInt8X64# :: forall s. Addr# -> Int# -> Int8X64# -> State# s -> State# swriteInt8OffAddrAsInt8X64#=Addr# -> Int# -> Int8X64# -> State# s -> State# sforall s. Addr# -> Int# -> Int8X64# -> State# s -> State# swriteInt8OffAddrAsInt8X64#{-| Write vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeInt16OffAddrAsInt16X32#::Addr#->Int#->Int16X32#->State#s->State#swriteInt16OffAddrAsInt16X32# :: forall s. Addr# -> Int# -> Int16X32# -> State# s -> State# swriteInt16OffAddrAsInt16X32#=Addr# -> Int# -> Int16X32# -> State# s -> State# sforall s. Addr# -> Int# -> Int16X32# -> State# s -> State# swriteInt16OffAddrAsInt16X32#{-| Write vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeInt32OffAddrAsInt32X16#::Addr#->Int#->Int32X16#->State#s->State#swriteInt32OffAddrAsInt32X16# :: forall s. Addr# -> Int# -> Int32X16# -> State# s -> State# swriteInt32OffAddrAsInt32X16#=Addr# -> Int# -> Int32X16# -> State# s -> State# sforall s. Addr# -> Int# -> Int32X16# -> State# s -> State# swriteInt32OffAddrAsInt32X16#{-| Write vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeInt64OffAddrAsInt64X8#::Addr#->Int#->Int64X8#->State#s->State#swriteInt64OffAddrAsInt64X8# :: forall s. Addr# -> Int# -> Int64X8# -> State# s -> State# swriteInt64OffAddrAsInt64X8#=Addr# -> Int# -> Int64X8# -> State# s -> State# sforall s. Addr# -> Int# -> Int64X8# -> State# s -> State# swriteInt64OffAddrAsInt64X8#{-| Write vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeWord8OffAddrAsWord8X16#::Addr#->Int#->Word8X16#->State#s->State#swriteWord8OffAddrAsWord8X16# :: forall s. Addr# -> Int# -> Word8X16# -> State# s -> State# swriteWord8OffAddrAsWord8X16#=Addr# -> Int# -> Word8X16# -> State# s -> State# sforall s. Addr# -> Int# -> Word8X16# -> State# s -> State# swriteWord8OffAddrAsWord8X16#{-| Write vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeWord16OffAddrAsWord16X8#::Addr#->Int#->Word16X8#->State#s->State#swriteWord16OffAddrAsWord16X8# :: forall s. Addr# -> Int# -> Word16X8# -> State# s -> State# swriteWord16OffAddrAsWord16X8#=Addr# -> Int# -> Word16X8# -> State# s -> State# sforall s. Addr# -> Int# -> Word16X8# -> State# s -> State# swriteWord16OffAddrAsWord16X8#{-| Write vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeWord32OffAddrAsWord32X4#::Addr#->Int#->Word32X4#->State#s->State#swriteWord32OffAddrAsWord32X4# :: forall s. Addr# -> Int# -> Word32X4# -> State# s -> State# swriteWord32OffAddrAsWord32X4#=Addr# -> Int# -> Word32X4# -> State# s -> State# sforall s. Addr# -> Int# -> Word32X4# -> State# s -> State# swriteWord32OffAddrAsWord32X4#{-| Write vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeWord64OffAddrAsWord64X2#::Addr#->Int#->Word64X2#->State#s->State#swriteWord64OffAddrAsWord64X2# :: forall s. Addr# -> Int# -> Word64X2# -> State# s -> State# swriteWord64OffAddrAsWord64X2#=Addr# -> Int# -> Word64X2# -> State# s -> State# sforall s. Addr# -> Int# -> Word64X2# -> State# s -> State# swriteWord64OffAddrAsWord64X2#{-| Write vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeWord8OffAddrAsWord8X32#::Addr#->Int#->Word8X32#->State#s->State#swriteWord8OffAddrAsWord8X32# :: forall s. Addr# -> Int# -> Word8X32# -> State# s -> State# swriteWord8OffAddrAsWord8X32#=Addr# -> Int# -> Word8X32# -> State# s -> State# sforall s. Addr# -> Int# -> Word8X32# -> State# s -> State# swriteWord8OffAddrAsWord8X32#{-| Write vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeWord16OffAddrAsWord16X16#::Addr#->Int#->Word16X16#->State#s->State#swriteWord16OffAddrAsWord16X16# :: forall s. Addr# -> Int# -> Word16X16# -> State# s -> State# swriteWord16OffAddrAsWord16X16#=Addr# -> Int# -> Word16X16# -> State# s -> State# sforall s. Addr# -> Int# -> Word16X16# -> State# s -> State# swriteWord16OffAddrAsWord16X16#{-| Write vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeWord32OffAddrAsWord32X8#::Addr#->Int#->Word32X8#->State#s->State#swriteWord32OffAddrAsWord32X8# :: forall s. Addr# -> Int# -> Word32X8# -> State# s -> State# swriteWord32OffAddrAsWord32X8#=Addr# -> Int# -> Word32X8# -> State# s -> State# sforall s. Addr# -> Int# -> Word32X8# -> State# s -> State# swriteWord32OffAddrAsWord32X8#{-| Write vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeWord64OffAddrAsWord64X4#::Addr#->Int#->Word64X4#->State#s->State#swriteWord64OffAddrAsWord64X4# :: forall s. Addr# -> Int# -> Word64X4# -> State# s -> State# swriteWord64OffAddrAsWord64X4#=Addr# -> Int# -> Word64X4# -> State# s -> State# sforall s. Addr# -> Int# -> Word64X4# -> State# s -> State# swriteWord64OffAddrAsWord64X4#{-| Write vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeWord8OffAddrAsWord8X64#::Addr#->Int#->Word8X64#->State#s->State#swriteWord8OffAddrAsWord8X64# :: forall s. Addr# -> Int# -> Word8X64# -> State# s -> State# swriteWord8OffAddrAsWord8X64#=Addr# -> Int# -> Word8X64# -> State# s -> State# sforall s. Addr# -> Int# -> Word8X64# -> State# s -> State# swriteWord8OffAddrAsWord8X64#{-| Write vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeWord16OffAddrAsWord16X32#::Addr#->Int#->Word16X32#->State#s->State#swriteWord16OffAddrAsWord16X32# :: forall s. Addr# -> Int# -> Word16X32# -> State# s -> State# swriteWord16OffAddrAsWord16X32#=Addr# -> Int# -> Word16X32# -> State# s -> State# sforall s. Addr# -> Int# -> Word16X32# -> State# s -> State# swriteWord16OffAddrAsWord16X32#{-| Write vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeWord32OffAddrAsWord32X16#::Addr#->Int#->Word32X16#->State#s->State#swriteWord32OffAddrAsWord32X16# :: forall s. Addr# -> Int# -> Word32X16# -> State# s -> State# swriteWord32OffAddrAsWord32X16#=Addr# -> Int# -> Word32X16# -> State# s -> State# sforall s. Addr# -> Int# -> Word32X16# -> State# s -> State# swriteWord32OffAddrAsWord32X16#{-| Write vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeWord64OffAddrAsWord64X8#::Addr#->Int#->Word64X8#->State#s->State#swriteWord64OffAddrAsWord64X8# :: forall s. Addr# -> Int# -> Word64X8# -> State# s -> State# swriteWord64OffAddrAsWord64X8#=Addr# -> Int# -> Word64X8# -> State# s -> State# sforall s. Addr# -> Int# -> Word64X8# -> State# s -> State# swriteWord64OffAddrAsWord64X8#{-| Write vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeFloatOffAddrAsFloatX4#::Addr#->Int#->FloatX4#->State#s->State#swriteFloatOffAddrAsFloatX4# :: forall s. Addr# -> Int# -> FloatX4# -> State# s -> State# swriteFloatOffAddrAsFloatX4#=Addr# -> Int# -> FloatX4# -> State# s -> State# sforall s. Addr# -> Int# -> FloatX4# -> State# s -> State# swriteFloatOffAddrAsFloatX4#{-| Write vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeDoubleOffAddrAsDoubleX2#::Addr#->Int#->DoubleX2#->State#s->State#swriteDoubleOffAddrAsDoubleX2# :: forall s. Addr# -> Int# -> DoubleX2# -> State# s -> State# swriteDoubleOffAddrAsDoubleX2#=Addr# -> Int# -> DoubleX2# -> State# s -> State# sforall s. Addr# -> Int# -> DoubleX2# -> State# s -> State# swriteDoubleOffAddrAsDoubleX2#{-| Write vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeFloatOffAddrAsFloatX8#::Addr#->Int#->FloatX8#->State#s->State#swriteFloatOffAddrAsFloatX8# :: forall s. Addr# -> Int# -> FloatX8# -> State# s -> State# swriteFloatOffAddrAsFloatX8#=Addr# -> Int# -> FloatX8# -> State# s -> State# sforall s. Addr# -> Int# -> FloatX8# -> State# s -> State# swriteFloatOffAddrAsFloatX8#{-| Write vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeDoubleOffAddrAsDoubleX4#::Addr#->Int#->DoubleX4#->State#s->State#swriteDoubleOffAddrAsDoubleX4# :: forall s. Addr# -> Int# -> DoubleX4# -> State# s -> State# swriteDoubleOffAddrAsDoubleX4#=Addr# -> Int# -> DoubleX4# -> State# s -> State# sforall s. Addr# -> Int# -> DoubleX4# -> State# s -> State# swriteDoubleOffAddrAsDoubleX4#{-| Write vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeFloatOffAddrAsFloatX16#::Addr#->Int#->FloatX16#->State#s->State#swriteFloatOffAddrAsFloatX16# :: forall s. Addr# -> Int# -> FloatX16# -> State# s -> State# swriteFloatOffAddrAsFloatX16#=Addr# -> Int# -> FloatX16# -> State# s -> State# sforall s. Addr# -> Int# -> FloatX16# -> State# s -> State# swriteFloatOffAddrAsFloatX16#{-| Write vector; offset in scalar elements. __/Warning:/__ this is only available on LLVM and can fail with an unchecked exception.-}writeDoubleOffAddrAsDoubleX8#::Addr#->Int#->DoubleX8#->State#s->State#swriteDoubleOffAddrAsDoubleX8# :: forall s. Addr# -> Int# -> DoubleX8# -> State# s -> State# swriteDoubleOffAddrAsDoubleX8#=Addr# -> Int# -> DoubleX8# -> State# s -> State# sforall s. Addr# -> Int# -> DoubleX8# -> State# s -> State# swriteDoubleOffAddrAsDoubleX8#prefetchByteArray3#::ByteArray#->Int#->State#s->State#sprefetchByteArray3# :: forall s. ByteArray# -> Int# -> State# s -> State# sprefetchByteArray3#=ByteArray# -> Int# -> State# s -> State# sforall s. ByteArray# -> Int# -> State# s -> State# sprefetchByteArray3#prefetchMutableByteArray3#::MutableByteArray#s->Int#->State#s->State#sprefetchMutableByteArray3# :: forall s. MutableByteArray# s -> Int# -> State# s -> State# sprefetchMutableByteArray3#=MutableByteArray# s -> Int# -> State# s -> State# sforall s. MutableByteArray# s -> Int# -> State# s -> State# sprefetchMutableByteArray3#prefetchAddr3#::Addr#->Int#->State#s->State#sprefetchAddr3# :: forall s. Addr# -> Int# -> State# s -> State# sprefetchAddr3#=Addr# -> Int# -> State# s -> State# sforall s. Addr# -> Int# -> State# s -> State# sprefetchAddr3#prefetchValue3#::a->State#s->State#sprefetchValue3# :: forall a_levpoly s. a_levpoly -> State# s -> State# sprefetchValue3#=a -> State# s -> State# sforall a_levpoly s. a_levpoly -> State# s -> State# sprefetchValue3#prefetchByteArray2#::ByteArray#->Int#->State#s->State#sprefetchByteArray2# :: forall s. ByteArray# -> Int# -> State# s -> State# sprefetchByteArray2#=ByteArray# -> Int# -> State# s -> State# sforall s. ByteArray# -> Int# -> State# s -> State# sprefetchByteArray2#prefetchMutableByteArray2#::MutableByteArray#s->Int#->State#s->State#sprefetchMutableByteArray2# :: forall s. MutableByteArray# s -> Int# -> State# s -> State# sprefetchMutableByteArray2#=MutableByteArray# s -> Int# -> State# s -> State# sforall s. MutableByteArray# s -> Int# -> State# s -> State# sprefetchMutableByteArray2#prefetchAddr2#::Addr#->Int#->State#s->State#sprefetchAddr2# :: forall s. Addr# -> Int# -> State# s -> State# sprefetchAddr2#=Addr# -> Int# -> State# s -> State# sforall s. Addr# -> Int# -> State# s -> State# sprefetchAddr2#prefetchValue2#::a->State#s->State#sprefetchValue2# :: forall a_levpoly s. a_levpoly -> State# s -> State# sprefetchValue2#=a -> State# s -> State# sforall a_levpoly s. a_levpoly -> State# s -> State# sprefetchValue2#prefetchByteArray1#::ByteArray#->Int#->State#s->State#sprefetchByteArray1# :: forall s. ByteArray# -> Int# -> State# s -> State# sprefetchByteArray1#=ByteArray# -> Int# -> State# s -> State# sforall s. ByteArray# -> Int# -> State# s -> State# sprefetchByteArray1#prefetchMutableByteArray1#::MutableByteArray#s->Int#->State#s->State#sprefetchMutableByteArray1# :: forall s. MutableByteArray# s -> Int# -> State# s -> State# sprefetchMutableByteArray1#=MutableByteArray# s -> Int# -> State# s -> State# sforall s. MutableByteArray# s -> Int# -> State# s -> State# sprefetchMutableByteArray1#prefetchAddr1#::Addr#->Int#->State#s->State#sprefetchAddr1# :: forall s. Addr# -> Int# -> State# s -> State# sprefetchAddr1#=Addr# -> Int# -> State# s -> State# sforall s. Addr# -> Int# -> State# s -> State# sprefetchAddr1#prefetchValue1#::a->State#s->State#sprefetchValue1# :: forall a_levpoly s. a_levpoly -> State# s -> State# sprefetchValue1#=a -> State# s -> State# sforall a_levpoly s. a_levpoly -> State# s -> State# sprefetchValue1#prefetchByteArray0#::ByteArray#->Int#->State#s->State#sprefetchByteArray0# :: forall s. ByteArray# -> Int# -> State# s -> State# sprefetchByteArray0#=ByteArray# -> Int# -> State# s -> State# sforall s. ByteArray# -> Int# -> State# s -> State# sprefetchByteArray0#prefetchMutableByteArray0#::MutableByteArray#s->Int#->State#s->State#sprefetchMutableByteArray0# :: forall s. MutableByteArray# s -> Int# -> State# s -> State# sprefetchMutableByteArray0#=MutableByteArray# s -> Int# -> State# s -> State# sforall s. MutableByteArray# s -> Int# -> State# s -> State# sprefetchMutableByteArray0#prefetchAddr0#::Addr#->Int#->State#s->State#sprefetchAddr0# :: forall s. Addr# -> Int# -> State# s -> State# sprefetchAddr0#=Addr# -> Int# -> State# s -> State# sforall s. Addr# -> Int# -> State# s -> State# sprefetchAddr0#prefetchValue0#::a->State#s->State#sprefetchValue0# :: forall a_levpoly s. a_levpoly -> State# s -> State# sprefetchValue0#=a -> State# s -> State# sforall a_levpoly s. a_levpoly -> State# s -> State# sprefetchValue0#

[8]ページ先頭

©2009-2025 Movatter.jp