ghc-prim-0.11.0: GHC primitives
Safe HaskellNone
LanguageHaskell2010

GHC.PrimopWrappers

Description

Users should not import this module. It is GHC internal only. Use GHC.Exts instead.

Documentation

addIntC# :: Int# -> Int# -> (# Int#, Int# #) Source #

subIntC# :: Int# -> Int# -> (# Int#, Int# #) Source #

newArray# :: Int# -> a_levpoly -> State# s -> (# State# s, MutableArray# s a_levpoly #) Source #

readArray# :: MutableArray# s a_levpoly -> Int# -> State# s -> (# State# s, a_levpoly #) Source #

writeArray# :: MutableArray# s a_levpoly -> Int# -> a_levpoly -> State# s -> State# s Source #

sizeofArray# :: Array# a_levpoly -> Int# Source #

indexArray# :: Array# a_levpoly -> Int# -> (# a_levpoly #) Source #

unsafeFreezeArray# :: MutableArray# s a_levpoly -> State# s -> (# State# s, Array# a_levpoly #) Source #

unsafeThawArray# :: Array# a_levpoly -> State# s -> (# State# s, MutableArray# s a_levpoly #) Source #

copyArray# :: Array# a_levpoly -> Int# -> MutableArray# s a_levpoly -> Int# -> Int# -> State# s -> State# s Source #

copyMutableArray# :: MutableArray# s a_levpoly -> Int# -> MutableArray# s a_levpoly -> Int# -> Int# -> State# s -> State# s Source #

cloneArray# :: Array# a_levpoly -> Int# -> Int# -> Array# a_levpoly Source #

cloneMutableArray# :: MutableArray# s a_levpoly -> Int# -> Int# -> State# s -> (# State# s, MutableArray# s a_levpoly #) Source #

freezeArray# :: MutableArray# s a_levpoly -> Int# -> Int# -> State# s -> (# State# s, Array# a_levpoly #) Source #

thawArray# :: Array# a_levpoly -> Int# -> Int# -> State# s -> (# State# s, MutableArray# s a_levpoly #) Source #

casArray# :: MutableArray# s a_levpoly -> Int# -> a_levpoly -> a_levpoly -> State# s -> (# State# s, Int#, a_levpoly #) Source #

newSmallArray# :: Int# -> a_levpoly -> State# s -> (# State# s, SmallMutableArray# s a_levpoly #) Source #

readSmallArray# :: SmallMutableArray# s a_levpoly -> Int# -> State# s -> (# State# s, a_levpoly #) Source #

writeSmallArray# :: SmallMutableArray# s a_levpoly -> Int# -> a_levpoly -> State# s -> State# s Source #

indexSmallArray# :: SmallArray# a_levpoly -> Int# -> (# a_levpoly #) Source #

unsafeFreezeSmallArray# :: SmallMutableArray# s a_levpoly -> State# s -> (# State# s, SmallArray# a_levpoly #) Source #

unsafeThawSmallArray# :: SmallArray# a_levpoly -> State# s -> (# State# s, SmallMutableArray# s a_levpoly #) Source #

copySmallArray# :: SmallArray# a_levpoly -> Int# -> SmallMutableArray# s a_levpoly -> Int# -> Int# -> State# s -> State# s Source #

cloneSmallArray# :: SmallArray# a_levpoly -> Int# -> Int# -> SmallArray# a_levpoly Source #

cloneSmallMutableArray# :: SmallMutableArray# s a_levpoly -> Int# -> Int# -> State# s -> (# State# s, SmallMutableArray# s a_levpoly #) Source #

freezeSmallArray# :: SmallMutableArray# s a_levpoly -> Int# -> Int# -> State# s -> (# State# s, SmallArray# a_levpoly #) Source #

thawSmallArray# :: SmallArray# a_levpoly -> Int# -> Int# -> State# s -> (# State# s, SmallMutableArray# s a_levpoly #) Source #

casSmallArray# :: SmallMutableArray# s a_levpoly -> Int# -> a_levpoly -> a_levpoly -> State# s -> (# State# s, Int#, a_levpoly #) Source #

newMutVar# :: a_levpoly -> State# s -> (# State# s, MutVar# s a_levpoly #) Source #

readMutVar# :: MutVar# s a_levpoly -> State# s -> (# State# s, a_levpoly #) Source #

writeMutVar# :: MutVar# s a_levpoly -> a_levpoly -> State# s -> State# s Source #

atomicSwapMutVar# :: MutVar# s a_levpoly -> a_levpoly -> State# s -> (# State# s, a_levpoly #) Source #

atomicModifyMutVar2# :: MutVar# s a -> (a -> c) -> State# s -> (# State# s, a, c #) Source #

atomicModifyMutVar_# :: MutVar# s a -> (a -> a) -> State# s -> (# State# s, a, a #) Source #

casMutVar# :: MutVar# s a_levpoly -> a_levpoly -> a_levpoly -> State# s -> (# State# s, Int#, a_levpoly #) Source #

catch# :: (State# RealWorld -> (# State# RealWorld, a_reppoly #)) -> (b_levpoly -> State# RealWorld -> (# State# RealWorld, a_reppoly #)) -> State# RealWorld -> (# State# RealWorld, a_reppoly #) Source #

raise# :: a_levpoly -> b_reppoly Source #

raiseUnderflow# :: (# #) -> b_reppoly Source #

raiseOverflow# :: (# #) -> b_reppoly Source #

raiseDivZero# :: (# #) -> b_reppoly Source #

raiseIO# :: a_levpoly -> State# RealWorld -> (# State# RealWorld, b_reppoly #) Source #

maskAsyncExceptions# :: (State# RealWorld -> (# State# RealWorld, a_reppoly #)) -> State# RealWorld -> (# State# RealWorld, a_reppoly #) Source #

maskUninterruptible# :: (State# RealWorld -> (# State# RealWorld, a_reppoly #)) -> State# RealWorld -> (# State# RealWorld, a_reppoly #) Source #

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 #) Source #

atomically# :: (State# RealWorld -> (# State# RealWorld, a_levpoly #)) -> State# RealWorld -> (# State# RealWorld, a_levpoly #) Source #

retry# :: State# RealWorld -> (# State# RealWorld, a_levpoly #) Source #

catchRetry# :: (State# RealWorld -> (# State# RealWorld, a_levpoly #)) -> (State# RealWorld -> (# State# RealWorld, a_levpoly #)) -> State# RealWorld -> (# State# RealWorld, a_levpoly #) Source #

catchSTM# :: (State# RealWorld -> (# State# RealWorld, a_levpoly #)) -> (b -> State# RealWorld -> (# State# RealWorld, a_levpoly #)) -> State# RealWorld -> (# State# RealWorld, a_levpoly #) Source #

newTVar# :: a_levpoly -> State# s -> (# State# s, TVar# s a_levpoly #) Source #

readTVar# :: TVar# s a_levpoly -> State# s -> (# State# s, a_levpoly #) Source #

readTVarIO# :: TVar# s a_levpoly -> State# s -> (# State# s, a_levpoly #) Source #

writeTVar# :: TVar# s a_levpoly -> a_levpoly -> State# s -> State# s Source #

newMVar# :: State# s -> (# State# s, MVar# s a_levpoly #) Source #

takeMVar# :: MVar# s a_levpoly -> State# s -> (# State# s, a_levpoly #) Source #

tryTakeMVar# :: MVar# s a_levpoly -> State# s -> (# State# s, Int#, a_levpoly #) Source #

putMVar# :: MVar# s a_levpoly -> a_levpoly -> State# s -> State# s Source #

tryPutMVar# :: MVar# s a_levpoly -> a_levpoly -> State# s -> (# State# s, Int# #) Source #

readMVar# :: MVar# s a_levpoly -> State# s -> (# State# s, a_levpoly #) Source #

tryReadMVar# :: MVar# s a_levpoly -> State# s -> (# State# s, Int#, a_levpoly #) Source #

isEmptyMVar# :: MVar# s a_levpoly -> State# s -> (# State# s, Int# #) Source #

newIOPort# :: State# s -> (# State# s, IOPort# s a_levpoly #) Source #

readIOPort# :: IOPort# s a_levpoly -> State# s -> (# State# s, a_levpoly #) Source #

writeIOPort# :: IOPort# s a_levpoly -> a_levpoly -> State# s -> (# State# s, Int# #) Source #

mkWeak# :: a_levpoly -> b_levpoly -> (State# RealWorld -> (# State# RealWorld, c #)) -> State# RealWorld -> (# State# RealWorld, Weak# b_levpoly #) Source #

mkWeakNoFinalizer# :: a_levpoly -> b_levpoly -> State# RealWorld -> (# State# RealWorld, Weak# b_levpoly #) Source #

deRefWeak# :: Weak# a_levpoly -> State# RealWorld -> (# State# RealWorld, Int#, a_levpoly #) Source #

touch# :: a_levpoly -> State# s -> State# s Source #

makeStablePtr# :: a_levpoly -> State# RealWorld -> (# State# RealWorld, StablePtr# a_levpoly #) Source #

deRefStablePtr# :: StablePtr# a_levpoly -> State# RealWorld -> (# State# RealWorld, a_levpoly #) Source #

eqStablePtr# :: StablePtr# a_levpoly -> StablePtr# a_levpoly -> Int# Source #

makeStableName# :: a_levpoly -> State# RealWorld -> (# State# RealWorld, StableName# a_levpoly #) Source #

reallyUnsafePtrEquality# :: a_levpoly -> b_levpoly -> Int# Source #

par# :: a -> Int# Source #

spark# :: a -> State# s -> (# State# s, a #) Source #

seq# :: a -> State# s -> (# State# s, a #) Source #

getSpark# :: State# s -> (# State# s, Int#, a #) Source #

numSparks# :: State# s -> (# State# s, Int# #) Source #

keepAlive# :: a_levpoly -> State# s -> (State# s -> b_reppoly) -> b_reppoly Source #

dataToTagSmall# :: a_levpoly -> Int# Source #

dataToTagLarge# :: a_levpoly -> Int# Source #

addrToAny# :: Addr# -> (# a_levpoly #) Source #

mkApUpd0# :: BCO -> (# a #) Source #

getApStackVal# :: a -> Int# -> (# Int#, b #) Source #

getCCSOf# :: a -> State# s -> (# State# s, Addr# #) Source #

getCurrentCCS# :: a -> State# s -> (# State# s, Addr# #) Source #

clearCCS# :: (State# s -> (# State# s, a #)) -> State# s -> (# State# s, a #) Source #

whereFrom# :: a -> Addr# -> State# s -> (# State# s, Int# #) Source #