Newer
Older
type Handle__ :: *
data Handle__
= forall dev enc_state dec_state.
(GHC.Internal.IO.Device.RawIO dev, GHC.Internal.IO.Device.IODevice dev, GHC.Internal.IO.BufferedIO.BufferedIO dev, ghc-internal-9.1001.0:GHC.Internal.Data.Typeable.Internal.Typeable dev) =>
Handle__ {haDevice :: !dev,
haType :: HandleType,
haByteBuffer :: ! {-# UNPACK #-}(GHC.Internal.IORef.N:IORef[0] <GHC.Internal.IO.Buffer.Buffer GHC.Internal.Word.Word8>_N)(GHC.Internal.IORef.IORef (GHC.Internal.IO.Buffer.Buffer GHC.Internal.Word.Word8)),
haBufferMode :: BufferMode,
haLastDecode :: ! {-# UNPACK #-}(GHC.Internal.IORef.N:IORef[0] <(dec_state, GHC.Internal.IO.Buffer.Buffer GHC.Internal.Word.Word8)>_N)(GHC.Internal.IORef.IORef (dec_state, GHC.Internal.IO.Buffer.Buffer GHC.Internal.Word.Word8)),
haCharBuffer :: ! {-# UNPACK #-}(GHC.Internal.IORef.N:IORef[0] <GHC.Internal.IO.Buffer.Buffer GHC.Internal.IO.Buffer.CharBufElem>_N)(GHC.Internal.IORef.IORef (GHC.Internal.IO.Buffer.Buffer GHC.Internal.IO.Buffer.CharBufElem)),
haBuffers :: ! {-# UNPACK #-}(GHC.Internal.IORef.N:IORef[0] <BufferList GHC.Internal.IO.Buffer.CharBufElem>_N)(GHC.Internal.IORef.IORef (BufferList GHC.Internal.IO.Buffer.CharBufElem)),
haEncoder :: GHC.Internal.Maybe.Maybe (GHC.Internal.IO.Encoding.Types.TextEncoder enc_state),
haDecoder :: GHC.Internal.Maybe.Maybe (GHC.Internal.IO.Encoding.Types.TextDecoder dec_state),
haCodec :: GHC.Internal.Maybe.Maybe GHC.Internal.IO.Encoding.Types.TextEncoding,
haInputNL :: Newline,
haOutputNL :: Newline,
haOtherSide :: GHC.Internal.Maybe.Maybe (GHC.Internal.MVar.MVar Handle__)}
type Newline :: *
data Newline = LF | CRLF
type NewlineMode :: *
data NewlineMode = NewlineMode {inputNL :: Newline, outputNL :: Newline}
checkHandleInvariants :: Handle__ -> GHC.Types.IO ()
isAppendHandleType :: HandleType -> GHC.Types.Bool
isReadWriteHandleType :: HandleType -> GHC.Types.Bool
isReadableHandleType :: HandleType -> GHC.Types.Bool
isWritableHandleType :: HandleType -> GHC.Types.Bool
nativeNewline :: Newline
nativeNewlineMode :: NewlineMode
noNewlineTranslation :: NewlineMode
showHandle :: GHC.Internal.IO.FilePath -> GHC.Internal.Base.String -> GHC.Internal.Base.String
universalNewlineMode :: NewlineMode
module GHC.IO.IOMode where
type IOMode :: *
data IOMode = ReadMode | WriteMode | AppendMode | ReadWriteMode
module GHC.IO.StdHandles where
-- Safety: Safe
openBinaryFile :: GHC.Internal.IO.FilePath -> GHC.Internal.IO.IOMode.IOMode -> GHC.Types.IO GHC.Internal.IO.Handle.Types.Handle
openFile :: GHC.Internal.IO.FilePath -> GHC.Internal.IO.IOMode.IOMode -> GHC.Types.IO GHC.Internal.IO.Handle.Types.Handle
openFileBlocking :: GHC.Internal.IO.FilePath -> GHC.Internal.IO.IOMode.IOMode -> GHC.Types.IO GHC.Internal.IO.Handle.Types.Handle
stderr :: GHC.Internal.IO.Handle.Types.Handle
stdin :: GHC.Internal.IO.Handle.Types.Handle
stdout :: GHC.Internal.IO.Handle.Types.Handle
withBinaryFile :: forall r. GHC.Internal.IO.FilePath -> GHC.Internal.IO.IOMode.IOMode -> (GHC.Internal.IO.Handle.Types.Handle -> GHC.Types.IO r) -> GHC.Types.IO r
withFile :: forall r. GHC.Internal.IO.FilePath -> GHC.Internal.IO.IOMode.IOMode -> (GHC.Internal.IO.Handle.Types.Handle -> GHC.Types.IO r) -> GHC.Types.IO r
withFileBlocking :: forall r. GHC.Internal.IO.FilePath -> GHC.Internal.IO.IOMode.IOMode -> (GHC.Internal.IO.Handle.Types.Handle -> GHC.Types.IO r) -> GHC.Types.IO r
module GHC.IO.SubSystem where
(<!>) :: forall a. a -> a -> a
type IoSubSystem :: *
data IoSubSystem = IoPOSIX | IoNative
conditional :: forall a. a -> a -> a
ioSubSystem :: IoSubSystem
isWindowsNativeIO :: GHC.Types.Bool
whenIoSubSystem :: IoSubSystem -> GHC.Types.IO () -> GHC.Types.IO ()
withIoSubSystem :: forall a. (IoSubSystem -> GHC.Types.IO a) -> GHC.Types.IO a
withIoSubSystem' :: forall a. (IoSubSystem -> a) -> a
module GHC.IO.Unsafe where
noDuplicate :: GHC.Types.IO ()
unsafeDupableInterleaveIO :: forall a. GHC.Types.IO a -> GHC.Types.IO a
unsafeDupablePerformIO :: forall a. GHC.Types.IO a -> a
unsafeInterleaveIO :: forall a. GHC.Types.IO a -> GHC.Types.IO a
unsafePerformIO :: forall a. GHC.Types.IO a -> a
module GHC.IOArray where
type role IOArray nominal representational
type IOArray :: * -> * -> *
newtype IOArray i e = IOArray (GHC.Internal.Arr.STArray GHC.Prim.RealWorld i e)
boundsIOArray :: forall i e. IOArray i e -> (i, i)
newIOArray :: forall i e. GHC.Internal.Ix.Ix i => (i, i) -> e -> GHC.Types.IO (IOArray i e)
readIOArray :: forall i e. GHC.Internal.Ix.Ix i => IOArray i e -> i -> GHC.Types.IO e
unsafeReadIOArray :: forall i e. IOArray i e -> GHC.Types.Int -> GHC.Types.IO e
unsafeWriteIOArray :: forall i e. IOArray i e -> GHC.Types.Int -> e -> GHC.Types.IO ()
writeIOArray :: forall i e. GHC.Internal.Ix.Ix i => IOArray i e -> i -> e -> GHC.Types.IO ()
module GHC.IOPort where
type IOPort :: * -> *
data IOPort a = IOPort (GHC.Prim.IOPort# GHC.Prim.RealWorld a)
doubleReadException :: GHC.Internal.Exception.Type.SomeException
newEmptyIOPort :: forall a. GHC.Types.IO (IOPort a)
newIOPort :: forall a. a -> GHC.Types.IO (IOPort a)
readIOPort :: forall a. IOPort a -> GHC.Types.IO a
writeIOPort :: forall a. IOPort a -> a -> GHC.Types.IO GHC.Types.Bool
module GHC.IORef where
type IORef :: * -> *
newtype IORef a = IORef (GHC.Internal.STRef.STRef GHC.Prim.RealWorld a)
atomicModifyIORef' :: forall a b. IORef a -> (a -> (a, b)) -> GHC.Types.IO b
atomicModifyIORef'_ :: forall a. IORef a -> (a -> a) -> GHC.Types.IO (a, a)
atomicModifyIORef2 :: forall a b. IORef a -> (a -> (a, b)) -> GHC.Types.IO (a, (a, b))
atomicModifyIORef2Lazy :: forall a b. IORef a -> (a -> (a, b)) -> GHC.Types.IO (a, (a, b))
atomicModifyIORefLazy_ :: forall a. IORef a -> (a -> a) -> GHC.Types.IO (a, a)
atomicModifyIORefP :: forall a b. IORef a -> (a -> (a, b)) -> GHC.Types.IO b
atomicSwapIORef :: forall a. IORef a -> a -> GHC.Types.IO a
newIORef :: forall a. a -> GHC.Types.IO (IORef a)
readIORef :: forall a. IORef a -> GHC.Types.IO a
writeIORef :: forall a. IORef a -> a -> GHC.Types.IO ()
module GHC.InfoProv where
data InfoProv = InfoProv {ipName :: GHC.Internal.Base.String, ipDesc :: GHC.Internal.ClosureTypes.ClosureType, ipTyDesc :: GHC.Internal.Base.String, ipLabel :: GHC.Internal.Base.String, ipUnitId :: GHC.Internal.Base.String, ipMod :: GHC.Internal.Base.String, ipSrcFile :: GHC.Internal.Base.String, ipSrcSpan :: GHC.Internal.Base.String}
type InfoProvEnt :: *
data InfoProvEnt
ipLoc :: InfoProv -> GHC.Internal.Base.String
ipeProv :: GHC.Internal.Ptr.Ptr InfoProvEnt -> GHC.Internal.Ptr.Ptr InfoProv
peekInfoProv :: GHC.Internal.Ptr.Ptr InfoProv -> GHC.Types.IO InfoProv
whereFrom :: forall a. a -> GHC.Types.IO (GHC.Internal.Maybe.Maybe InfoProv)
module GHC.Int where
8120
8121
8122
8123
8124
8125
8126
8127
8128
8129
8130
8131
8132
8133
8134
8135
8136
8137
8138
8139
8140
8141
8142
8143
8144
8145
8146
8147
8148
8149
8150
8151
8152
8153
8154
8155
8156
8157
8158
8159
8160
8161
8162
8163
8164
8165
8166
8167
8168
8169
8170
8171
8172
8173
8174
8175
8176
8177
8178
8179
8180
8181
8182
8183
8184
8185
8186
8187
8188
8189
8190
8191
8192
8193
8194
8195
8196
8197
8198
8199
8200
8201
8202
8203
8204
8205
8206
8207
8208
8209
8210
8211
8212
8213
8214
8215
8216
8217
8218
8219
type Int :: *
data Int = I# GHC.Prim.Int#
type Int16 :: *
data Int16 = I16# GHC.Prim.Int16#
type Int32 :: *
data Int32 = I32# GHC.Prim.Int32#
type Int64 :: *
data Int64 = I64# GHC.Prim.Int64#
type Int8 :: *
data Int8 = I8# GHC.Prim.Int8#
eqInt :: Int -> Int -> GHC.Types.Bool
eqInt16 :: Int16 -> Int16 -> GHC.Types.Bool
eqInt32 :: Int32 -> Int32 -> GHC.Types.Bool
eqInt64 :: Int64 -> Int64 -> GHC.Types.Bool
eqInt8 :: Int8 -> Int8 -> GHC.Types.Bool
geInt :: Int -> Int -> GHC.Types.Bool
geInt16 :: Int16 -> Int16 -> GHC.Types.Bool
geInt32 :: Int32 -> Int32 -> GHC.Types.Bool
geInt64 :: Int64 -> Int64 -> GHC.Types.Bool
geInt8 :: Int8 -> Int8 -> GHC.Types.Bool
gtInt :: Int -> Int -> GHC.Types.Bool
gtInt16 :: Int16 -> Int16 -> GHC.Types.Bool
gtInt32 :: Int32 -> Int32 -> GHC.Types.Bool
gtInt64 :: Int64 -> Int64 -> GHC.Types.Bool
gtInt8 :: Int8 -> Int8 -> GHC.Types.Bool
leInt :: Int -> Int -> GHC.Types.Bool
leInt16 :: Int16 -> Int16 -> GHC.Types.Bool
leInt32 :: Int32 -> Int32 -> GHC.Types.Bool
leInt64 :: Int64 -> Int64 -> GHC.Types.Bool
leInt8 :: Int8 -> Int8 -> GHC.Types.Bool
ltInt :: Int -> Int -> GHC.Types.Bool
ltInt16 :: Int16 -> Int16 -> GHC.Types.Bool
ltInt32 :: Int32 -> Int32 -> GHC.Types.Bool
ltInt64 :: Int64 -> Int64 -> GHC.Types.Bool
ltInt8 :: Int8 -> Int8 -> GHC.Types.Bool
neInt :: Int -> Int -> GHC.Types.Bool
neInt16 :: Int16 -> Int16 -> GHC.Types.Bool
neInt32 :: Int32 -> Int32 -> GHC.Types.Bool
neInt64 :: Int64 -> Int64 -> GHC.Types.Bool
neInt8 :: Int8 -> Int8 -> GHC.Types.Bool
shiftRLInt16# :: GHC.Prim.Int16# -> GHC.Prim.Int# -> GHC.Prim.Int16#
shiftRLInt32# :: GHC.Prim.Int32# -> GHC.Prim.Int# -> GHC.Prim.Int32#
shiftRLInt8# :: GHC.Prim.Int8# -> GHC.Prim.Int# -> GHC.Prim.Int8#
uncheckedIShiftL64# :: GHC.Prim.Int64# -> GHC.Prim.Int# -> GHC.Prim.Int64#
uncheckedIShiftRA64# :: GHC.Prim.Int64# -> GHC.Prim.Int# -> GHC.Prim.Int64#
module GHC.Integer where
-- Safety: None
type Integer :: *
data Integer = ...
absInteger :: Integer -> Integer
andInteger :: Integer -> Integer -> Integer
bitInteger :: GHC.Prim.Int# -> Integer
compareInteger :: Integer -> Integer -> GHC.Types.Ordering
complementInteger :: Integer -> Integer
decodeDoubleInteger :: GHC.Prim.Double# -> (# Integer, GHC.Prim.Int# #)
divInteger :: Integer -> Integer -> Integer
divModInteger :: Integer -> Integer -> (# Integer, Integer #)
encodeDoubleInteger :: Integer -> GHC.Prim.Int# -> GHC.Prim.Double#
encodeFloatInteger :: Integer -> GHC.Prim.Int# -> GHC.Prim.Float#
eqInteger :: Integer -> Integer -> GHC.Types.Bool
eqInteger# :: Integer -> Integer -> GHC.Prim.Int#
geInteger :: Integer -> Integer -> GHC.Types.Bool
geInteger# :: Integer -> Integer -> GHC.Prim.Int#
gtInteger :: Integer -> Integer -> GHC.Types.Bool
gtInteger# :: Integer -> Integer -> GHC.Prim.Int#
hashInteger :: Integer -> GHC.Prim.Int#
integerToInt :: Integer -> GHC.Prim.Int#
integerToWord :: Integer -> GHC.Prim.Word#
leInteger :: Integer -> Integer -> GHC.Types.Bool
leInteger# :: Integer -> Integer -> GHC.Prim.Int#
ltInteger :: Integer -> Integer -> GHC.Types.Bool
ltInteger# :: Integer -> Integer -> GHC.Prim.Int#
minusInteger :: Integer -> Integer -> Integer
modInteger :: Integer -> Integer -> Integer
negateInteger :: Integer -> Integer
neqInteger :: Integer -> Integer -> GHC.Types.Bool
neqInteger# :: Integer -> Integer -> GHC.Prim.Int#
orInteger :: Integer -> Integer -> Integer
plusInteger :: Integer -> Integer -> Integer
popCountInteger :: Integer -> GHC.Prim.Int#
quotInteger :: Integer -> Integer -> Integer
quotRemInteger :: Integer -> Integer -> (# Integer, Integer #)
remInteger :: Integer -> Integer -> Integer
shiftLInteger :: Integer -> GHC.Prim.Int# -> Integer
shiftRInteger :: Integer -> GHC.Prim.Int# -> Integer
signumInteger :: Integer -> Integer
smallInteger :: GHC.Prim.Int# -> Integer
testBitInteger :: Integer -> GHC.Prim.Int# -> GHC.Types.Bool
timesInteger :: Integer -> Integer -> Integer
wordToInteger :: GHC.Prim.Word# -> Integer
xorInteger :: Integer -> Integer -> Integer
module GHC.Integer.Logarithms where
-- Safety: None
integerLog2# :: GHC.Num.Integer.Integer -> GHC.Prim.Int#
integerLogBase# :: GHC.Num.Integer.Integer -> GHC.Num.Integer.Integer -> GHC.Prim.Int#
wordLog2# :: GHC.Prim.Word# -> GHC.Prim.Int#
module GHC.IsList where
type IsList :: * -> Constraint
class IsList l where
type Item :: * -> *
type family Item l
fromList :: [Item l] -> l
fromListN :: GHC.Types.Int -> [Item l] -> l
toList :: l -> [Item l]
{-# MINIMAL fromList, toList #-}
module GHC.Ix where
-- Safety: None
type Ix :: * -> Constraint
class GHC.Classes.Ord a => Ix a where
range :: (a, a) -> [a]
index :: (a, a) -> a -> GHC.Types.Int
unsafeIndex :: (a, a) -> a -> GHC.Types.Int
inRange :: (a, a) -> a -> GHC.Types.Bool
rangeSize :: (a, a) -> GHC.Types.Int
unsafeRangeSize :: (a, a) -> GHC.Types.Int
{-# MINIMAL range, (index | unsafeIndex), inRange #-}
indexError :: forall a b. GHC.Internal.Show.Show a => (a, a) -> a -> GHC.Internal.Base.String -> b
module GHC.List where
-- Safety: Safe
(!!) :: forall a. GHC.Internal.Stack.Types.HasCallStack => [a] -> GHC.Types.Int -> a
(!?) :: forall a. [a] -> GHC.Types.Int -> GHC.Internal.Maybe.Maybe a
(++) :: forall a. [a] -> [a] -> [a]
type List :: * -> *
data List a = ...
all :: forall a. (a -> GHC.Types.Bool) -> [a] -> GHC.Types.Bool
and :: [GHC.Types.Bool] -> GHC.Types.Bool
any :: forall a. (a -> GHC.Types.Bool) -> [a] -> GHC.Types.Bool
augment :: forall a. (forall b. (a -> b -> b) -> b -> b) -> [a] -> [a]
break :: forall a. (a -> GHC.Types.Bool) -> [a] -> ([a], [a])
build :: forall a. (forall b. (a -> b -> b) -> b -> b) -> [a]
concat :: forall a. [[a]] -> [a]
concatMap :: forall a b. (a -> [b]) -> [a] -> [b]
cycle :: forall a. GHC.Internal.Stack.Types.HasCallStack => [a] -> [a]
drop :: forall a. GHC.Types.Int -> [a] -> [a]
dropWhile :: forall a. (a -> GHC.Types.Bool) -> [a] -> [a]
elem :: forall a. GHC.Classes.Eq a => a -> [a] -> GHC.Types.Bool
errorEmptyList :: forall a. GHC.Internal.Stack.Types.HasCallStack => GHC.Internal.Base.String -> a
filter :: forall a. (a -> GHC.Types.Bool) -> [a] -> [a]
foldl :: forall a b. (b -> a -> b) -> b -> [a] -> b
foldl' :: forall a b. (b -> a -> b) -> b -> [a] -> b
foldl1 :: forall a. GHC.Internal.Stack.Types.HasCallStack => (a -> a -> a) -> [a] -> a
foldl1' :: forall a. GHC.Internal.Stack.Types.HasCallStack => (a -> a -> a) -> [a] -> a
foldr :: forall a b. (a -> b -> b) -> b -> [a] -> b
foldr' :: forall a b. (a -> b -> b) -> b -> [a] -> b
foldr1 :: forall a. GHC.Internal.Stack.Types.HasCallStack => (a -> a -> a) -> [a] -> a
head :: forall a. GHC.Internal.Stack.Types.HasCallStack => [a] -> a
init :: forall a. GHC.Internal.Stack.Types.HasCallStack => [a] -> [a]
iterate :: forall a. (a -> a) -> a -> [a]
iterate' :: forall a. (a -> a) -> a -> [a]
last :: forall a. GHC.Internal.Stack.Types.HasCallStack => [a] -> a
length :: forall a. [a] -> GHC.Types.Int
lookup :: forall a b. GHC.Classes.Eq a => a -> [(a, b)] -> GHC.Internal.Maybe.Maybe b
map :: forall a b. (a -> b) -> [a] -> [b]
maximum :: forall a. (GHC.Classes.Ord a, GHC.Internal.Stack.Types.HasCallStack) => [a] -> a
minimum :: forall a. (GHC.Classes.Ord a, GHC.Internal.Stack.Types.HasCallStack) => [a] -> a
notElem :: forall a. GHC.Classes.Eq a => a -> [a] -> GHC.Types.Bool
null :: forall a. [a] -> GHC.Types.Bool
or :: [GHC.Types.Bool] -> GHC.Types.Bool
product :: forall a. GHC.Internal.Num.Num a => [a] -> a
repeat :: forall a. a -> [a]
replicate :: forall a. GHC.Types.Int -> a -> [a]
reverse :: forall a. [a] -> [a]
scanl :: forall b a. (b -> a -> b) -> b -> [a] -> [b]
scanl' :: forall b a. (b -> a -> b) -> b -> [a] -> [b]
scanl1 :: forall a. (a -> a -> a) -> [a] -> [a]
scanr :: forall a b. (a -> b -> b) -> b -> [a] -> [b]
scanr1 :: forall a. (a -> a -> a) -> [a] -> [a]
span :: forall a. (a -> GHC.Types.Bool) -> [a] -> ([a], [a])
splitAt :: forall a. GHC.Types.Int -> [a] -> ([a], [a])
sum :: forall a. GHC.Internal.Num.Num a => [a] -> a
tail :: forall a. GHC.Internal.Stack.Types.HasCallStack => [a] -> [a]
take :: forall a. GHC.Types.Int -> [a] -> [a]
takeWhile :: forall a. (a -> GHC.Types.Bool) -> [a] -> [a]
uncons :: forall a. [a] -> GHC.Internal.Maybe.Maybe (a, [a])
unsnoc :: forall a. [a] -> GHC.Internal.Maybe.Maybe ([a], a)
unzip :: forall a b. [(a, b)] -> ([a], [b])
unzip3 :: forall a b c. [(a, b, c)] -> ([a], [b], [c])
zip :: forall a b. [a] -> [b] -> [(a, b)]
zip3 :: forall a b c. [a] -> [b] -> [c] -> [(a, b, c)]
zipWith :: forall a b c. (a -> b -> c) -> [a] -> [b] -> [c]
zipWith3 :: forall a b c d. (a -> b -> c -> d) -> [a] -> [b] -> [c] -> [d]
module GHC.MVar where
type MVar :: * -> *
data MVar a = MVar (GHC.Prim.MVar# GHC.Prim.RealWorld a)
addMVarFinalizer :: forall a. MVar a -> GHC.Types.IO () -> GHC.Types.IO ()
isEmptyMVar :: forall a. MVar a -> GHC.Types.IO GHC.Types.Bool
newEmptyMVar :: forall a. GHC.Types.IO (MVar a)
newMVar :: forall a. a -> GHC.Types.IO (MVar a)
putMVar :: forall a. MVar a -> a -> GHC.Types.IO ()
readMVar :: forall a. MVar a -> GHC.Types.IO a
takeMVar :: forall a. MVar a -> GHC.Types.IO a
tryPutMVar :: forall a. MVar a -> a -> GHC.Types.IO GHC.Types.Bool
tryReadMVar :: forall a. MVar a -> GHC.Types.IO (GHC.Internal.Maybe.Maybe a)
tryTakeMVar :: forall a. MVar a -> GHC.Types.IO (GHC.Internal.Maybe.Maybe a)
module GHC.Maybe where
-- Safety: Safe-Inferred
type Maybe :: * -> *
data Maybe a = Nothing | Just a
module GHC.Natural where
type BigNat :: *
data BigNat = BN# {unBigNat :: GHC.Num.BigNat.BigNat#}
pattern NatJ# :: BigNat -> Natural
pattern NatS# :: GHC.Prim.Word# -> Natural
type Natural :: *
data Natural = ...
andNatural :: Natural -> Natural -> Natural
bitNatural :: GHC.Prim.Int# -> Natural
gcdNatural :: Natural -> Natural -> Natural
isValidNatural :: Natural -> GHC.Types.Bool
lcmNatural :: Natural -> Natural -> Natural
minusNatural :: Natural -> Natural -> Natural
minusNaturalMaybe :: Natural -> Natural -> GHC.Internal.Maybe.Maybe Natural
mkNatural :: [GHC.Types.Word] -> Natural
naturalFromInteger :: GHC.Num.Integer.Integer -> Natural
naturalToInteger :: Natural -> GHC.Num.Integer.Integer
naturalToWord :: Natural -> GHC.Types.Word
naturalToWordMaybe :: Natural -> GHC.Internal.Maybe.Maybe GHC.Types.Word
negateNatural :: Natural -> Natural
orNatural :: Natural -> Natural -> Natural
plusNatural :: Natural -> Natural -> Natural
popCountNatural :: Natural -> GHC.Types.Int
powModNatural :: Natural -> Natural -> Natural -> Natural
quotNatural :: Natural -> Natural -> Natural
quotRemNatural :: Natural -> Natural -> (Natural, Natural)
remNatural :: Natural -> Natural -> Natural
shiftLNatural :: Natural -> GHC.Types.Int -> Natural
shiftRNatural :: Natural -> GHC.Types.Int -> Natural
signumNatural :: Natural -> Natural
testBitNatural :: Natural -> GHC.Types.Int -> GHC.Types.Bool
timesNatural :: Natural -> Natural -> Natural
wordToNatural :: GHC.Types.Word -> Natural
wordToNatural# :: GHC.Types.Word -> Natural
xorNatural :: Natural -> Natural -> Natural
module GHC.Num where
8367
8368
8369
8370
8371
8372
8373
8374
8375
8376
8377
8378
8379
8380
8381
8382
8383
8384
8385
8386
8387
8388
8389
8390
8391
8392
8393
8394
8395
8396
8397
8398
8399
8400
8401
8402
8403
8404
8405
8406
8407
8408
8409
8410
8411
8412
8413
8414
8415
8416
8417
8418
8419
8420
8421
8422
8423
8424
8425
8426
8427
8428
8429
8430
8431
8432
8433
8434
8435
8436
8437
8438
8439
8440
8441
8442
8443
8444
8445
8446
8447
8448
8449
8450
8451
8452
8453
8454
8455
8456
8457
8458
8459
8460
8461
8462
8463
8464
8465
8466
8467
8468
8469
8470
8471
8472
8473
8474
8475
8476
8477
8478
8479
8480
8481
8482
8483
8484
8485
8486
8487
8488
8489
8490
8491
8492
8493
8494
8495
8496
8497
8498
8499
8500
8501
8502
8503
8504
8505
8506
8507
8508
8509
8510
8511
8512
8513
8514
8515
8516
8517
8518
8519
8520
8521
8522
8523
8524
8525
8526
8527
8528
8529
8530
8531
8532
8533
8534
8535
8536
8537
8538
8539
8540
8541
8542
8543
8544
8545
8546
8547
8548
8549
8550
8551
8552
8553
8554
8555
8556
8557
8558
8559
8560
8561
8562
8563
8564
8565
8566
8567
8568
8569
8570
8571
8572
8573
8574
8575
8576
8577
8578
8579
8580
8581
8582
8583
8584
8585
8586
8587
8588
8589
8590
8591
8592
8593
8594
8595
8596
8597
8598
8599
8600
8601
8602
8603
8604
8605
8606
8607
8608
8609
8610
8611
8612
8613
8614
8615
8616
8617
8618
8619
8620
8621
8622
8623
8624
8625
8626
8627
8628
8629
8630
8631
8632
8633
8634
8635
8636
8637
8638
8639
8640
8641
8642
8643
8644
8645
8646
8647
8648
8649
8650
8651
8652
8653
8654
8655
8656
8657
8658
8659
8660
8661
8662
8663
8664
8665
8666
8667
8668
8669
8670
8671
8672
8673
8674
8675
8676
8677
8678
8679
8680
8681
8682
8683
8684
8685
8686
8687
8688
8689
8690
8691
8692
8693
8694
8695
8696
8697
8698
8699
8700
8701
8702
8703
8704
8705
8706
8707
8708
8709
8710
8711
8712
8713
8714
8715
8716
8717
8718
8719
8720
8721
8722
8723
8724
8725
8726
8727
8728
8729
8730
8731
8732
8733
8734
8735
8736
8737
8738
8739
8740
8741
8742
8743
8744
8745
8746
8747
8748
8749
8750
8751
8752
8753
8754
8755
8756
8757
8758
8759
8760
8761
8762
8763
8764
8765
8766
8767
8768
8769
8770
8771
8772
8773
8774
8775
8776
8777
8778
8779
8780
8781
8782
8783
8784
8785
8786
8787
8788
8789
8790
8791
8792
8793
8794
8795
8796
8797
8798
8799
8800
8801
8802
8803
8804
8805
8806
8807
8808
8809
8810
8811
8812
8813
8814
8815
8816
8817
8818
8819
8820
8821
8822
8823
8824
8825
8826
8827
8828
8829
8830
8831
8832
8833
8834
8835
8836
8837
8838
8839
8840
8841
8842
8843
8844
8845
8846
8847
8848
8849
8850
8851
8852
8853
8854
8855
8856
8857
8858
8859
8860
8861
8862
8863
8864
8865
8866
8867
8868
8869
8870
8871
8872
8873
8874
8875
8876
8877
8878
8879
8880
8881
8882
8883
8884
8885
8886
8887
8888
8889
8890
8891
8892
8893
8894
8895
8896
8897
8898
8899
8900
type Integer :: *
data Integer = IS GHC.Prim.Int# | IP GHC.Prim.ByteArray# | IN GHC.Prim.ByteArray#
type Natural :: *
data Natural = NS GHC.Prim.Word# | NB GHC.Prim.ByteArray#
type Num :: * -> Constraint
class Num a where
(+) :: a -> a -> a
(-) :: a -> a -> a
(*) :: a -> a -> a
negate :: a -> a
abs :: a -> a
signum :: a -> a
fromInteger :: Integer -> a
{-# MINIMAL (+), (*), abs, signum, fromInteger, (negate | (-)) #-}
integerAbs :: Integer -> Integer
integerAdd :: Integer -> Integer -> Integer
integerAnd :: Integer -> Integer -> Integer
integerBit :: GHC.Types.Word -> Integer
integerBit# :: GHC.Prim.Word# -> Integer
integerCheck :: Integer -> GHC.Types.Bool
integerCheck# :: Integer -> GHC.Num.Primitives.Bool#
integerCompare :: Integer -> Integer -> GHC.Types.Ordering
integerComplement :: Integer -> Integer
integerDecodeDouble# :: GHC.Prim.Double# -> (# Integer, GHC.Prim.Int# #)
integerDiv :: Integer -> Integer -> Integer
integerDivMod :: Integer -> Integer -> (Integer, Integer)
integerDivMod# :: Integer -> Integer -> (# Integer, Integer #)
integerEncodeDouble :: Integer -> GHC.Types.Int -> GHC.Types.Double
integerEncodeDouble# :: Integer -> GHC.Prim.Int# -> GHC.Prim.Double#
integerEncodeFloat# :: Integer -> GHC.Prim.Int# -> GHC.Prim.Float#
integerEq :: Integer -> Integer -> GHC.Types.Bool
integerEq# :: Integer -> Integer -> GHC.Num.Primitives.Bool#
integerFromAddr :: GHC.Prim.Word# -> GHC.Prim.Addr# -> GHC.Num.Primitives.Bool# -> GHC.Types.IO Integer
integerFromAddr# :: forall s. GHC.Prim.Word# -> GHC.Prim.Addr# -> GHC.Num.Primitives.Bool# -> GHC.Prim.State# s -> (# GHC.Prim.State# s, Integer #)
integerFromBigNat# :: GHC.Num.BigNat.BigNat# -> Integer
integerFromBigNatNeg# :: GHC.Num.BigNat.BigNat# -> Integer
integerFromBigNatSign# :: GHC.Prim.Int# -> GHC.Num.BigNat.BigNat# -> Integer
integerFromByteArray :: GHC.Prim.Word# -> GHC.Prim.ByteArray# -> GHC.Prim.Word# -> GHC.Num.Primitives.Bool# -> Integer
integerFromByteArray# :: forall s. GHC.Prim.Word# -> GHC.Prim.ByteArray# -> GHC.Prim.Word# -> GHC.Num.Primitives.Bool# -> GHC.Prim.State# s -> (# GHC.Prim.State# s, Integer #)
integerFromInt :: GHC.Types.Int -> Integer
integerFromInt# :: GHC.Prim.Int# -> Integer
integerFromInt64# :: GHC.Prim.Int64# -> Integer
integerFromNatural :: Natural -> Integer
integerFromWord :: GHC.Types.Word -> Integer
integerFromWord# :: GHC.Prim.Word# -> Integer
integerFromWord64# :: GHC.Prim.Word64# -> Integer
integerFromWordList :: GHC.Types.Bool -> [GHC.Types.Word] -> Integer
integerFromWordNeg# :: GHC.Prim.Word# -> Integer
integerFromWordSign# :: GHC.Prim.Int# -> GHC.Prim.Word# -> Integer
integerGcd :: Integer -> Integer -> Integer
integerGcde :: Integer -> Integer -> (Integer, Integer, Integer)
integerGcde# :: Integer -> Integer -> (# Integer, Integer, Integer #)
integerGe :: Integer -> Integer -> GHC.Types.Bool
integerGe# :: Integer -> Integer -> GHC.Num.Primitives.Bool#
integerGt :: Integer -> Integer -> GHC.Types.Bool
integerGt# :: Integer -> Integer -> GHC.Num.Primitives.Bool#
integerIsNegative :: Integer -> GHC.Types.Bool
integerIsNegative# :: Integer -> GHC.Num.Primitives.Bool#
integerIsOne :: Integer -> GHC.Types.Bool
integerIsPowerOf2# :: Integer -> (# (# #) | GHC.Prim.Word# #)
integerIsZero :: Integer -> GHC.Types.Bool
integerLcm :: Integer -> Integer -> Integer
integerLe :: Integer -> Integer -> GHC.Types.Bool
integerLe# :: Integer -> Integer -> GHC.Num.Primitives.Bool#
integerLog2 :: Integer -> GHC.Types.Word
integerLog2# :: Integer -> GHC.Prim.Word#
integerLogBase :: Integer -> Integer -> GHC.Types.Word
integerLogBase# :: Integer -> Integer -> GHC.Prim.Word#
integerLogBaseWord :: GHC.Types.Word -> Integer -> GHC.Types.Word
integerLogBaseWord# :: GHC.Prim.Word# -> Integer -> GHC.Prim.Word#
integerLt :: Integer -> Integer -> GHC.Types.Bool
integerLt# :: Integer -> Integer -> GHC.Num.Primitives.Bool#
integerMod :: Integer -> Integer -> Integer
integerMul :: Integer -> Integer -> Integer
integerNe :: Integer -> Integer -> GHC.Types.Bool
integerNe# :: Integer -> Integer -> GHC.Num.Primitives.Bool#
integerNegate :: Integer -> Integer
integerOne :: Integer
integerOr :: Integer -> Integer -> Integer
integerPopCount# :: Integer -> GHC.Prim.Int#
integerPowMod# :: Integer -> Integer -> Natural -> (# Natural | () #)
integerQuot :: Integer -> Integer -> Integer
integerQuotRem :: Integer -> Integer -> (Integer, Integer)
integerQuotRem# :: Integer -> Integer -> (# Integer, Integer #)
integerRecipMod# :: Integer -> Natural -> (# Natural | () #)
integerRem :: Integer -> Integer -> Integer
integerShiftL :: Integer -> GHC.Types.Word -> Integer
integerShiftL# :: Integer -> GHC.Prim.Word# -> Integer
integerShiftR :: Integer -> GHC.Types.Word -> Integer
integerShiftR# :: Integer -> GHC.Prim.Word# -> Integer
integerSignum :: Integer -> Integer
integerSignum# :: Integer -> GHC.Prim.Int#
integerSizeInBase# :: GHC.Prim.Word# -> Integer -> GHC.Prim.Word#
integerSqr :: Integer -> Integer
integerSub :: Integer -> Integer -> Integer
integerTestBit :: Integer -> GHC.Types.Word -> GHC.Types.Bool
integerTestBit# :: Integer -> GHC.Prim.Word# -> GHC.Num.Primitives.Bool#
integerToAddr :: Integer -> GHC.Prim.Addr# -> GHC.Num.Primitives.Bool# -> GHC.Types.IO GHC.Types.Word
integerToAddr# :: forall s. Integer -> GHC.Prim.Addr# -> GHC.Num.Primitives.Bool# -> GHC.Prim.State# s -> (# GHC.Prim.State# s, GHC.Prim.Word# #)
integerToBigNatClamp# :: Integer -> GHC.Num.BigNat.BigNat#
integerToBigNatSign# :: Integer -> (# GHC.Prim.Int#, GHC.Num.BigNat.BigNat# #)
integerToInt :: Integer -> GHC.Types.Int
integerToInt# :: Integer -> GHC.Prim.Int#
integerToInt64# :: Integer -> GHC.Prim.Int64#
integerToMutableByteArray :: Integer -> GHC.Prim.MutableByteArray# GHC.Prim.RealWorld -> GHC.Prim.Word# -> GHC.Num.Primitives.Bool# -> GHC.Types.IO GHC.Types.Word
integerToMutableByteArray# :: forall s. Integer -> GHC.Prim.MutableByteArray# s -> GHC.Prim.Word# -> GHC.Num.Primitives.Bool# -> GHC.Prim.State# s -> (# GHC.Prim.State# s, GHC.Prim.Word# #)
integerToNatural :: Integer -> Natural
integerToNaturalClamp :: Integer -> Natural
integerToNaturalThrow :: Integer -> Natural
integerToWord :: Integer -> GHC.Types.Word
integerToWord# :: Integer -> GHC.Prim.Word#
integerToWord64# :: Integer -> GHC.Prim.Word64#
integerXor :: Integer -> Integer -> Integer
integerZero :: Integer
naturalAdd :: Natural -> Natural -> Natural
naturalAnd :: Natural -> Natural -> Natural
naturalAndNot :: Natural -> Natural -> Natural
naturalBit :: GHC.Types.Word -> Natural
naturalBit# :: GHC.Prim.Word# -> Natural
naturalCheck :: Natural -> GHC.Types.Bool
naturalCheck# :: Natural -> GHC.Num.Primitives.Bool#
naturalClearBit :: Natural -> GHC.Types.Word -> Natural
naturalClearBit# :: Natural -> GHC.Prim.Word# -> Natural
naturalCompare :: Natural -> Natural -> GHC.Types.Ordering
naturalComplementBit :: Natural -> GHC.Types.Word -> Natural
naturalComplementBit# :: Natural -> GHC.Prim.Word# -> Natural
naturalEncodeDouble# :: Natural -> GHC.Prim.Int# -> GHC.Prim.Double#
naturalEncodeFloat# :: Natural -> GHC.Prim.Int# -> GHC.Prim.Float#
naturalEq :: Natural -> Natural -> GHC.Types.Bool
naturalEq# :: Natural -> Natural -> GHC.Num.Primitives.Bool#
naturalFromAddr :: GHC.Prim.Word# -> GHC.Prim.Addr# -> GHC.Num.Primitives.Bool# -> GHC.Types.IO Natural
naturalFromAddr# :: forall s. GHC.Prim.Word# -> GHC.Prim.Addr# -> GHC.Num.Primitives.Bool# -> GHC.Prim.State# s -> (# GHC.Prim.State# s, Natural #)
naturalFromBigNat# :: GHC.Num.BigNat.BigNat# -> Natural
naturalFromByteArray# :: forall s. GHC.Prim.Word# -> GHC.Prim.ByteArray# -> GHC.Prim.Word# -> GHC.Num.Primitives.Bool# -> GHC.Prim.State# s -> (# GHC.Prim.State# s, Natural #)
naturalFromWord :: GHC.Types.Word -> Natural
naturalFromWord# :: GHC.Prim.Word# -> Natural
naturalFromWord2# :: GHC.Prim.Word# -> GHC.Prim.Word# -> Natural
naturalFromWordList :: [GHC.Types.Word] -> Natural
naturalGcd :: Natural -> Natural -> Natural
naturalGe :: Natural -> Natural -> GHC.Types.Bool
naturalGe# :: Natural -> Natural -> GHC.Num.Primitives.Bool#
naturalGt :: Natural -> Natural -> GHC.Types.Bool
naturalGt# :: Natural -> Natural -> GHC.Num.Primitives.Bool#
naturalIsOne :: Natural -> GHC.Types.Bool
naturalIsPowerOf2# :: Natural -> (# (# #) | GHC.Prim.Word# #)
naturalIsZero :: Natural -> GHC.Types.Bool
naturalLcm :: Natural -> Natural -> Natural
naturalLe :: Natural -> Natural -> GHC.Types.Bool
naturalLe# :: Natural -> Natural -> GHC.Num.Primitives.Bool#
naturalLog2 :: Natural -> GHC.Types.Word
naturalLog2# :: Natural -> GHC.Prim.Word#
naturalLogBase :: Natural -> Natural -> GHC.Types.Word
naturalLogBase# :: Natural -> Natural -> GHC.Prim.Word#
naturalLogBaseWord :: GHC.Types.Word -> Natural -> GHC.Types.Word
naturalLogBaseWord# :: GHC.Prim.Word# -> Natural -> GHC.Prim.Word#
naturalLt :: Natural -> Natural -> GHC.Types.Bool
naturalLt# :: Natural -> Natural -> GHC.Num.Primitives.Bool#
naturalMul :: Natural -> Natural -> Natural
naturalNe :: Natural -> Natural -> GHC.Types.Bool
naturalNe# :: Natural -> Natural -> GHC.Num.Primitives.Bool#
naturalNegate :: Natural -> Natural
naturalOne :: Natural
naturalOr :: Natural -> Natural -> Natural
naturalPopCount :: Natural -> GHC.Types.Word
naturalPopCount# :: Natural -> GHC.Prim.Word#
naturalPowMod :: Natural -> Natural -> Natural -> Natural
naturalQuot :: Natural -> Natural -> Natural
naturalQuotRem :: Natural -> Natural -> (Natural, Natural)
naturalQuotRem# :: Natural -> Natural -> (# Natural, Natural #)
naturalRem :: Natural -> Natural -> Natural
naturalSetBit :: Natural -> GHC.Types.Word -> Natural
naturalSetBit# :: Natural -> GHC.Prim.Word# -> Natural
naturalShiftL :: Natural -> GHC.Types.Word -> Natural
naturalShiftL# :: Natural -> GHC.Prim.Word# -> Natural
naturalShiftR :: Natural -> GHC.Types.Word -> Natural
naturalShiftR# :: Natural -> GHC.Prim.Word# -> Natural
naturalSignum :: Natural -> Natural
naturalSizeInBase# :: GHC.Prim.Word# -> Natural -> GHC.Prim.Word#
naturalSqr :: Natural -> Natural
naturalSub :: Natural -> Natural -> (# (# #) | Natural #)
naturalSubThrow :: Natural -> Natural -> Natural
naturalSubUnsafe :: Natural -> Natural -> Natural
naturalTestBit :: Natural -> GHC.Types.Word -> GHC.Types.Bool
naturalTestBit# :: Natural -> GHC.Prim.Word# -> GHC.Num.Primitives.Bool#
naturalToAddr :: Natural -> GHC.Prim.Addr# -> GHC.Num.Primitives.Bool# -> GHC.Types.IO GHC.Types.Word
naturalToAddr# :: forall s. Natural -> GHC.Prim.Addr# -> GHC.Num.Primitives.Bool# -> GHC.Prim.State# s -> (# GHC.Prim.State# s, GHC.Prim.Word# #)
naturalToBigNat# :: Natural -> GHC.Num.BigNat.BigNat#
naturalToMutableByteArray# :: forall s. Natural -> GHC.Prim.MutableByteArray# s -> GHC.Prim.Word# -> GHC.Num.Primitives.Bool# -> GHC.Prim.State# s -> (# GHC.Prim.State# s, GHC.Prim.Word# #)
naturalToWord :: Natural -> GHC.Types.Word
naturalToWord# :: Natural -> GHC.Prim.Word#
naturalToWordClamp :: Natural -> GHC.Types.Word
naturalToWordClamp# :: Natural -> GHC.Prim.Word#
naturalToWordMaybe# :: Natural -> (# (# #) | GHC.Prim.Word# #)
naturalXor :: Natural -> Natural -> Natural
naturalZero :: Natural
quotRemInteger :: Integer -> Integer -> (# Integer, Integer #)
subtract :: forall a. Num a => a -> a -> a
module GHC.Num.BigNat where
-- Safety: None
type BigNat :: *
data BigNat = BN# {unBigNat :: BigNat#}
type BigNat# :: GHC.Types.UnliftedType
type BigNat# = GHC.Num.WordArray.WordArray# :: GHC.Types.UnliftedType
bigNatAdd :: BigNat# -> BigNat# -> BigNat#
bigNatAddWord :: BigNat# -> GHC.Types.Word -> BigNat#
bigNatAddWord# :: BigNat# -> GHC.Prim.Word# -> BigNat#
bigNatAnd :: BigNat# -> BigNat# -> BigNat#
bigNatAndInt# :: BigNat# -> GHC.Prim.Int# -> BigNat#
bigNatAndNot :: BigNat# -> BigNat# -> BigNat#
bigNatAndNotWord# :: BigNat# -> GHC.Prim.Word# -> BigNat#
bigNatAndWord# :: BigNat# -> GHC.Prim.Word# -> BigNat#
bigNatBit :: GHC.Types.Word -> BigNat#
bigNatBit# :: GHC.Prim.Word# -> BigNat#
bigNatCheck :: BigNat# -> GHC.Types.Bool
bigNatCheck# :: BigNat# -> GHC.Num.Primitives.Bool#
bigNatClearBit# :: BigNat# -> GHC.Prim.Word# -> BigNat#
bigNatCompare :: BigNat# -> BigNat# -> GHC.Types.Ordering
bigNatCompareWord :: BigNat# -> GHC.Types.Word -> GHC.Types.Ordering
bigNatCompareWord# :: BigNat# -> GHC.Prim.Word# -> GHC.Types.Ordering
bigNatComplementBit# :: BigNat# -> GHC.Prim.Word# -> BigNat#
bigNatCtz :: BigNat# -> GHC.Types.Word
bigNatCtz# :: BigNat# -> GHC.Prim.Word#
bigNatCtzWord :: BigNat# -> GHC.Types.Word
bigNatCtzWord# :: BigNat# -> GHC.Prim.Word#
bigNatEncodeDouble# :: BigNat# -> GHC.Prim.Int# -> GHC.Prim.Double#
bigNatEq :: BigNat# -> BigNat# -> GHC.Types.Bool
bigNatEq# :: BigNat# -> BigNat# -> GHC.Num.Primitives.Bool#
bigNatEqWord# :: BigNat# -> GHC.Prim.Word# -> GHC.Num.Primitives.Bool#
bigNatFromAbsInt# :: GHC.Prim.Int# -> BigNat#
bigNatFromAddr# :: forall s. GHC.Prim.Word# -> GHC.Prim.Addr# -> GHC.Num.Primitives.Bool# -> GHC.Prim.State# s -> (# GHC.Prim.State# s, BigNat# #)
bigNatFromAddrBE# :: forall s. GHC.Prim.Word# -> GHC.Prim.Addr# -> GHC.Prim.State# s -> (# GHC.Prim.State# s, BigNat# #)
bigNatFromAddrLE# :: forall s. GHC.Prim.Word# -> GHC.Prim.Addr# -> GHC.Prim.State# s -> (# GHC.Prim.State# s, BigNat# #)
bigNatFromByteArray# :: forall s. GHC.Prim.Word# -> GHC.Prim.ByteArray# -> GHC.Prim.Word# -> GHC.Num.Primitives.Bool# -> GHC.Prim.State# s -> (# GHC.Prim.State# s, BigNat# #)
bigNatFromByteArrayBE# :: forall s. GHC.Prim.Word# -> GHC.Prim.ByteArray# -> GHC.Prim.Word# -> GHC.Prim.State# s -> (# GHC.Prim.State# s, BigNat# #)
bigNatFromByteArrayLE# :: forall s. GHC.Prim.Word# -> GHC.Prim.ByteArray# -> GHC.Prim.Word# -> GHC.Prim.State# s -> (# GHC.Prim.State# s, BigNat# #)
bigNatFromWord :: GHC.Types.Word -> BigNat#
bigNatFromWord# :: GHC.Prim.Word# -> BigNat#
bigNatFromWord2# :: GHC.Prim.Word# -> GHC.Prim.Word# -> BigNat#
bigNatFromWord64# :: GHC.Prim.Word64# -> BigNat#
bigNatFromWordArray :: GHC.Num.WordArray.WordArray# -> GHC.Prim.Word# -> BigNat
bigNatFromWordArray# :: GHC.Num.WordArray.WordArray# -> GHC.Prim.Word# -> BigNat#
bigNatFromWordList :: [GHC.Types.Word] -> BigNat#
bigNatFromWordList# :: [GHC.Types.Word] -> GHC.Num.WordArray.WordArray#
bigNatFromWordListUnsafe :: [GHC.Types.Word] -> BigNat#
bigNatGcd :: BigNat# -> BigNat# -> BigNat#
bigNatGcdWord# :: BigNat# -> GHC.Prim.Word# -> GHC.Prim.Word#
bigNatGe :: BigNat# -> BigNat# -> GHC.Types.Bool
bigNatGe# :: BigNat# -> BigNat# -> GHC.Num.Primitives.Bool#
bigNatGt :: BigNat# -> BigNat# -> GHC.Types.Bool
bigNatGt# :: BigNat# -> BigNat# -> GHC.Num.Primitives.Bool#
bigNatGtWord :: BigNat# -> GHC.Types.Word -> GHC.Types.Bool
bigNatGtWord# :: BigNat# -> GHC.Prim.Word# -> GHC.Num.Primitives.Bool#
bigNatIndex :: BigNat# -> GHC.Prim.Int# -> GHC.Types.Word
bigNatIndex# :: BigNat# -> GHC.Prim.Int# -> GHC.Prim.Word#
bigNatIsOne :: BigNat# -> GHC.Types.Bool
bigNatIsOne# :: BigNat# -> GHC.Num.Primitives.Bool#
bigNatIsPowerOf2# :: BigNat# -> (# (# #) | GHC.Prim.Word# #)
bigNatIsTwo :: BigNat# -> GHC.Types.Bool
bigNatIsTwo# :: BigNat# -> GHC.Num.Primitives.Bool#
bigNatIsZero :: BigNat# -> GHC.Types.Bool
bigNatIsZero# :: BigNat# -> GHC.Num.Primitives.Bool#
bigNatLcm :: BigNat# -> BigNat# -> BigNat#
bigNatLcmWord# :: BigNat# -> GHC.Prim.Word# -> BigNat#
bigNatLcmWordWord# :: GHC.Prim.Word# -> GHC.Prim.Word# -> BigNat#
bigNatLe :: BigNat# -> BigNat# -> GHC.Types.Bool
bigNatLe# :: BigNat# -> BigNat# -> GHC.Num.Primitives.Bool#
bigNatLeWord :: BigNat# -> GHC.Types.Word -> GHC.Types.Bool
bigNatLeWord# :: BigNat# -> GHC.Prim.Word# -> GHC.Num.Primitives.Bool#
bigNatLog2 :: BigNat# -> GHC.Types.Word
bigNatLog2# :: BigNat# -> GHC.Prim.Word#
bigNatLogBase :: BigNat# -> BigNat# -> GHC.Types.Word
bigNatLogBase# :: BigNat# -> BigNat# -> GHC.Prim.Word#
bigNatLogBaseWord :: GHC.Types.Word -> BigNat# -> GHC.Types.Word
bigNatLogBaseWord# :: GHC.Prim.Word# -> BigNat# -> GHC.Prim.Word#
bigNatLt :: BigNat# -> BigNat# -> GHC.Types.Bool
bigNatLt# :: BigNat# -> BigNat# -> GHC.Num.Primitives.Bool#
bigNatMul :: BigNat# -> BigNat# -> BigNat#
bigNatMulWord :: BigNat# -> GHC.Types.Word -> BigNat#
bigNatMulWord# :: BigNat# -> GHC.Prim.Word# -> BigNat#
bigNatNe :: BigNat# -> BigNat# -> GHC.Types.Bool
bigNatNe# :: BigNat# -> BigNat# -> GHC.Num.Primitives.Bool#
bigNatOne :: BigNat
bigNatOne# :: (# #) -> BigNat#
bigNatOr :: BigNat# -> BigNat# -> BigNat#
bigNatOrWord# :: BigNat# -> GHC.Prim.Word# -> BigNat#
bigNatPopCount :: BigNat# -> GHC.Types.Word
bigNatPopCount# :: BigNat# -> GHC.Prim.Word#
bigNatPowMod :: BigNat# -> BigNat# -> BigNat# -> BigNat#
bigNatPowModWord# :: BigNat# -> BigNat# -> GHC.Prim.Word# -> GHC.Prim.Word#
bigNatQuot :: BigNat# -> BigNat# -> BigNat#
bigNatQuotRem# :: BigNat# -> BigNat# -> (# BigNat#, BigNat# #)
bigNatQuotRemWord# :: BigNat# -> GHC.Prim.Word# -> (# BigNat#, GHC.Prim.Word# #)
bigNatQuotWord :: BigNat# -> GHC.Types.Word -> BigNat#
bigNatQuotWord# :: BigNat# -> GHC.Prim.Word# -> BigNat#
bigNatRem :: BigNat# -> BigNat# -> BigNat#
bigNatRemWord :: BigNat# -> GHC.Types.Word -> GHC.Types.Word
bigNatRemWord# :: BigNat# -> GHC.Prim.Word# -> GHC.Prim.Word#
bigNatSetBit# :: BigNat# -> GHC.Prim.Word# -> BigNat#
bigNatShiftL :: BigNat# -> GHC.Types.Word -> BigNat#
bigNatShiftL# :: BigNat# -> GHC.Prim.Word# -> BigNat#
bigNatShiftR :: BigNat# -> GHC.Types.Word -> BigNat#
bigNatShiftR# :: BigNat# -> GHC.Prim.Word# -> BigNat#
bigNatShiftRNeg# :: BigNat# -> GHC.Prim.Word# -> BigNat#
bigNatSize :: BigNat# -> GHC.Types.Word
bigNatSize# :: BigNat# -> GHC.Prim.Int#
bigNatSizeInBase :: GHC.Types.Word -> BigNat# -> GHC.Types.Word
bigNatSizeInBase# :: GHC.Prim.Word# -> BigNat# -> GHC.Prim.Word#
bigNatSqr :: BigNat# -> BigNat#
bigNatSub :: BigNat# -> BigNat# -> (# (# #) | BigNat# #)
bigNatSubUnsafe :: BigNat# -> BigNat# -> BigNat#
bigNatSubWord# :: BigNat# -> GHC.Prim.Word# -> (# (# #) | BigNat# #)
bigNatSubWordUnsafe :: BigNat# -> GHC.Types.Word -> BigNat#
bigNatSubWordUnsafe# :: BigNat# -> GHC.Prim.Word# -> BigNat#
bigNatTestBit :: BigNat# -> GHC.Types.Word -> GHC.Types.Bool
bigNatTestBit# :: BigNat# -> GHC.Prim.Word# -> GHC.Num.Primitives.Bool#
bigNatToAddr :: BigNat# -> GHC.Prim.Addr# -> GHC.Num.Primitives.Bool# -> GHC.Types.IO GHC.Types.Word
bigNatToAddr# :: forall s. BigNat# -> GHC.Prim.Addr# -> GHC.Num.Primitives.Bool# -> GHC.Prim.State# s -> (# GHC.Prim.State# s, GHC.Prim.Word# #)
bigNatToAddrBE# :: forall s. BigNat# -> GHC.Prim.Addr# -> GHC.Prim.State# s -> (# GHC.Prim.State# s, GHC.Prim.Word# #)
bigNatToAddrLE# :: forall s. BigNat# -> GHC.Prim.Addr# -> GHC.Prim.State# s -> (# GHC.Prim.State# s, GHC.Prim.Word# #)
bigNatToInt :: BigNat# -> GHC.Types.Int
bigNatToInt# :: BigNat# -> GHC.Prim.Int#
bigNatToMutableByteArray# :: forall s. BigNat# -> GHC.Prim.MutableByteArray# s -> GHC.Prim.Word# -> GHC.Num.Primitives.Bool# -> GHC.Prim.State# s -> (# GHC.Prim.State# s, GHC.Prim.Word# #)
bigNatToMutableByteArrayBE# :: forall s. BigNat# -> GHC.Prim.MutableByteArray# s -> GHC.Prim.Word# -> GHC.Prim.State# s -> (# GHC.Prim.State# s, GHC.Prim.Word# #)
bigNatToMutableByteArrayLE# :: forall s. BigNat# -> GHC.Prim.MutableByteArray# s -> GHC.Prim.Word# -> GHC.Prim.State# s -> (# GHC.Prim.State# s, GHC.Prim.Word# #)
bigNatToWord :: BigNat# -> GHC.Types.Word
bigNatToWord# :: BigNat# -> GHC.Prim.Word#
bigNatToWord64# :: BigNat# -> GHC.Prim.Word64#
bigNatToWordList :: BigNat# -> [GHC.Types.Word]
bigNatToWordMaybe# :: BigNat# -> (# (# #) | GHC.Prim.Word# #)
bigNatXor :: BigNat# -> BigNat# -> BigNat#
bigNatXorWord# :: BigNat# -> GHC.Prim.Word# -> BigNat#
bigNatZero :: BigNat
bigNatZero# :: (# #) -> BigNat#
gcdInt :: GHC.Types.Int -> GHC.Types.Int -> GHC.Types.Int
gcdInt# :: GHC.Prim.Int# -> GHC.Prim.Int# -> GHC.Prim.Int#
gcdWord :: GHC.Types.Word -> GHC.Types.Word -> GHC.Types.Word
gcdWord# :: GHC.Prim.Word# -> GHC.Prim.Word# -> GHC.Prim.Word#
powModWord# :: GHC.Prim.Word# -> GHC.Prim.Word# -> GHC.Prim.Word# -> GHC.Prim.Word#
raiseDivZero_BigNat :: (# #) -> BigNat#
module GHC.Num.Integer where
-- Safety: None
type Integer :: *
data Integer = IS GHC.Prim.Int# | IP GHC.Prim.ByteArray# | IN GHC.Prim.ByteArray#
integerAbs :: Integer -> Integer
integerAdd :: Integer -> Integer -> Integer
integerAnd :: Integer -> Integer -> Integer
integerBit :: GHC.Types.Word -> Integer
integerBit# :: GHC.Prim.Word# -> Integer
integerCheck :: Integer -> GHC.Types.Bool
integerCheck# :: Integer -> GHC.Num.Primitives.Bool#
integerCompare :: Integer -> Integer -> GHC.Types.Ordering
integerComplement :: Integer -> Integer
integerDecodeDouble# :: GHC.Prim.Double# -> (# Integer, GHC.Prim.Int# #)
integerDiv :: Integer -> Integer -> Integer
integerDivMod :: Integer -> Integer -> (Integer, Integer)
integerDivMod# :: Integer -> Integer -> (# Integer, Integer #)
integerEncodeDouble :: Integer -> GHC.Types.Int -> GHC.Types.Double
integerEncodeDouble# :: Integer -> GHC.Prim.Int# -> GHC.Prim.Double#
integerEncodeFloat# :: Integer -> GHC.Prim.Int# -> GHC.Prim.Float#
integerEq :: Integer -> Integer -> GHC.Types.Bool
integerEq# :: Integer -> Integer -> GHC.Num.Primitives.Bool#
integerFromAddr :: GHC.Prim.Word# -> GHC.Prim.Addr# -> GHC.Num.Primitives.Bool# -> GHC.Types.IO Integer
integerFromAddr# :: forall s. GHC.Prim.Word# -> GHC.Prim.Addr# -> GHC.Num.Primitives.Bool# -> GHC.Prim.State# s -> (# GHC.Prim.State# s, Integer #)
integerFromBigNat# :: GHC.Num.BigNat.BigNat# -> Integer
integerFromBigNatNeg# :: GHC.Num.BigNat.BigNat# -> Integer
integerFromBigNatSign# :: GHC.Prim.Int# -> GHC.Num.BigNat.BigNat# -> Integer
integerFromByteArray :: GHC.Prim.Word# -> GHC.Prim.ByteArray# -> GHC.Prim.Word# -> GHC.Num.Primitives.Bool# -> Integer
integerFromByteArray# :: forall s. GHC.Prim.Word# -> GHC.Prim.ByteArray# -> GHC.Prim.Word# -> GHC.Num.Primitives.Bool# -> GHC.Prim.State# s -> (# GHC.Prim.State# s, Integer #)
integerFromInt :: GHC.Types.Int -> Integer
integerFromInt# :: GHC.Prim.Int# -> Integer
integerFromInt64# :: GHC.Prim.Int64# -> Integer
integerFromNatural :: GHC.Num.Natural.Natural -> Integer
integerFromWord :: GHC.Types.Word -> Integer
integerFromWord# :: GHC.Prim.Word# -> Integer
integerFromWord64# :: GHC.Prim.Word64# -> Integer
integerFromWordList :: GHC.Types.Bool -> [GHC.Types.Word] -> Integer
integerFromWordNeg# :: GHC.Prim.Word# -> Integer
integerFromWordSign# :: GHC.Prim.Int# -> GHC.Prim.Word# -> Integer
integerGcd :: Integer -> Integer -> Integer
integerGcde :: Integer -> Integer -> (Integer, Integer, Integer)
integerGcde# :: Integer -> Integer -> (# Integer, Integer, Integer #)
integerGe :: Integer -> Integer -> GHC.Types.Bool
integerGe# :: Integer -> Integer -> GHC.Num.Primitives.Bool#
integerGt :: Integer -> Integer -> GHC.Types.Bool
integerGt# :: Integer -> Integer -> GHC.Num.Primitives.Bool#
integerIsNegative :: Integer -> GHC.Types.Bool
integerIsNegative# :: Integer -> GHC.Num.Primitives.Bool#
integerIsOne :: Integer -> GHC.Types.Bool
integerIsPowerOf2# :: Integer -> (# (# #) | GHC.Prim.Word# #)
integerIsZero :: Integer -> GHC.Types.Bool
integerLcm :: Integer -> Integer -> Integer
integerLe :: Integer -> Integer -> GHC.Types.Bool
integerLe# :: Integer -> Integer -> GHC.Num.Primitives.Bool#
integerLog2 :: Integer -> GHC.Types.Word
integerLog2# :: Integer -> GHC.Prim.Word#
integerLogBase :: Integer -> Integer -> GHC.Types.Word
integerLogBase# :: Integer -> Integer -> GHC.Prim.Word#
integerLogBaseWord :: GHC.Types.Word -> Integer -> GHC.Types.Word
integerLogBaseWord# :: GHC.Prim.Word# -> Integer -> GHC.Prim.Word#
integerLt :: Integer -> Integer -> GHC.Types.Bool
integerLt# :: Integer -> Integer -> GHC.Num.Primitives.Bool#
integerMod :: Integer -> Integer -> Integer
integerMul :: Integer -> Integer -> Integer
integerNe :: Integer -> Integer -> GHC.Types.Bool
integerNe# :: Integer -> Integer -> GHC.Num.Primitives.Bool#
integerNegate :: Integer -> Integer
integerOne :: Integer
integerOr :: Integer -> Integer -> Integer
integerPopCount# :: Integer -> GHC.Prim.Int#
integerPowMod# :: Integer -> Integer -> GHC.Num.Natural.Natural -> (# GHC.Num.Natural.Natural | () #)
integerQuot :: Integer -> Integer -> Integer
integerQuotRem :: Integer -> Integer -> (Integer, Integer)
integerQuotRem# :: Integer -> Integer -> (# Integer, Integer #)
integerRecipMod# :: Integer -> GHC.Num.Natural.Natural -> (# GHC.Num.Natural.Natural | () #)
integerRem :: Integer -> Integer -> Integer
integerShiftL :: Integer -> GHC.Types.Word -> Integer
integerShiftL# :: Integer -> GHC.Prim.Word# -> Integer
integerShiftR :: Integer -> GHC.Types.Word -> Integer
integerShiftR# :: Integer -> GHC.Prim.Word# -> Integer
integerSignum :: Integer -> Integer
integerSignum# :: Integer -> GHC.Prim.Int#
integerSizeInBase# :: GHC.Prim.Word# -> Integer -> GHC.Prim.Word#
integerSqr :: Integer -> Integer
integerSub :: Integer -> Integer -> Integer
integerTestBit :: Integer -> GHC.Types.Word -> GHC.Types.Bool
integerTestBit# :: Integer -> GHC.Prim.Word# -> GHC.Num.Primitives.Bool#
integerToAddr :: Integer -> GHC.Prim.Addr# -> GHC.Num.Primitives.Bool# -> GHC.Types.IO GHC.Types.Word
integerToAddr# :: forall s. Integer -> GHC.Prim.Addr# -> GHC.Num.Primitives.Bool# -> GHC.Prim.State# s -> (# GHC.Prim.State# s, GHC.Prim.Word# #)
integerToBigNatClamp# :: Integer -> GHC.Num.BigNat.BigNat#
integerToBigNatSign# :: Integer -> (# GHC.Prim.Int#, GHC.Num.BigNat.BigNat# #)
integerToInt :: Integer -> GHC.Types.Int
integerToInt# :: Integer -> GHC.Prim.Int#
integerToInt64# :: Integer -> GHC.Prim.Int64#
integerToMutableByteArray :: Integer -> GHC.Prim.MutableByteArray# GHC.Prim.RealWorld -> GHC.Prim.Word# -> GHC.Num.Primitives.Bool# -> GHC.Types.IO GHC.Types.Word
integerToMutableByteArray# :: forall s. Integer -> GHC.Prim.MutableByteArray# s -> GHC.Prim.Word# -> GHC.Num.Primitives.Bool# -> GHC.Prim.State# s -> (# GHC.Prim.State# s, GHC.Prim.Word# #)
integerToNatural :: Integer -> GHC.Num.Natural.Natural
integerToNaturalClamp :: Integer -> GHC.Num.Natural.Natural
integerToNaturalThrow :: Integer -> GHC.Num.Natural.Natural
integerToWord :: Integer -> GHC.Types.Word
integerToWord# :: Integer -> GHC.Prim.Word#
integerToWord64# :: Integer -> GHC.Prim.Word64#
integerXor :: Integer -> Integer -> Integer
integerZero :: Integer
module GHC.Num.Natural where
-- Safety: None
type Natural :: *
data Natural = NS GHC.Prim.Word# | NB GHC.Prim.ByteArray#
naturalAdd :: Natural -> Natural -> Natural
naturalAnd :: Natural -> Natural -> Natural
naturalAndNot :: Natural -> Natural -> Natural
naturalBit :: GHC.Types.Word -> Natural
naturalBit# :: GHC.Prim.Word# -> Natural
naturalCheck :: Natural -> GHC.Types.Bool
naturalCheck# :: Natural -> GHC.Num.Primitives.Bool#
naturalClearBit :: Natural -> GHC.Types.Word -> Natural
naturalClearBit# :: Natural -> GHC.Prim.Word# -> Natural
naturalCompare :: Natural -> Natural -> GHC.Types.Ordering
naturalComplementBit :: Natural -> GHC.Types.Word -> Natural
naturalComplementBit# :: Natural -> GHC.Prim.Word# -> Natural
naturalEncodeDouble# :: Natural -> GHC.Prim.Int# -> GHC.Prim.Double#
naturalEncodeFloat# :: Natural -> GHC.Prim.Int# -> GHC.Prim.Float#
naturalEq :: Natural -> Natural -> GHC.Types.Bool
naturalEq# :: Natural -> Natural -> GHC.Num.Primitives.Bool#
naturalFromAddr :: GHC.Prim.Word# -> GHC.Prim.Addr# -> GHC.Num.Primitives.Bool# -> GHC.Types.IO Natural
naturalFromAddr# :: forall s. GHC.Prim.Word# -> GHC.Prim.Addr# -> GHC.Num.Primitives.Bool# -> GHC.Prim.State# s -> (# GHC.Prim.State# s, Natural #)
naturalFromBigNat# :: GHC.Num.BigNat.BigNat# -> Natural
naturalFromByteArray# :: forall s. GHC.Prim.Word# -> GHC.Prim.ByteArray# -> GHC.Prim.Word# -> GHC.Num.Primitives.Bool# -> GHC.Prim.State# s -> (# GHC.Prim.State# s, Natural #)
naturalFromWord :: GHC.Types.Word -> Natural
naturalFromWord# :: GHC.Prim.Word# -> Natural
naturalFromWord2# :: GHC.Prim.Word# -> GHC.Prim.Word# -> Natural
naturalFromWordList :: [GHC.Types.Word] -> Natural
naturalGcd :: Natural -> Natural -> Natural
naturalGe :: Natural -> Natural -> GHC.Types.Bool
naturalGe# :: Natural -> Natural -> GHC.Num.Primitives.Bool#
naturalGt :: Natural -> Natural -> GHC.Types.Bool
naturalGt# :: Natural -> Natural -> GHC.Num.Primitives.Bool#
naturalIsOne :: Natural -> GHC.Types.Bool
naturalIsPowerOf2# :: Natural -> (# (# #) | GHC.Prim.Word# #)
naturalIsZero :: Natural -> GHC.Types.Bool
naturalLcm :: Natural -> Natural -> Natural
naturalLe :: Natural -> Natural -> GHC.Types.Bool
naturalLe# :: Natural -> Natural -> GHC.Num.Primitives.Bool#
naturalLog2 :: Natural -> GHC.Types.Word
naturalLog2# :: Natural -> GHC.Prim.Word#
naturalLogBase :: Natural -> Natural -> GHC.Types.Word
naturalLogBase# :: Natural -> Natural -> GHC.Prim.Word#
naturalLogBaseWord :: GHC.Types.Word -> Natural -> GHC.Types.Word
naturalLogBaseWord# :: GHC.Prim.Word# -> Natural -> GHC.Prim.Word#
naturalLt :: Natural -> Natural -> GHC.Types.Bool
naturalLt# :: Natural -> Natural -> GHC.Num.Primitives.Bool#
naturalMul :: Natural -> Natural -> Natural
naturalNe :: Natural -> Natural -> GHC.Types.Bool
naturalNe# :: Natural -> Natural -> GHC.Num.Primitives.Bool#
naturalNegate :: Natural -> Natural
naturalOne :: Natural
naturalOr :: Natural -> Natural -> Natural
naturalPopCount :: Natural -> GHC.Types.Word
naturalPopCount# :: Natural -> GHC.Prim.Word#
naturalPowMod :: Natural -> Natural -> Natural -> Natural
naturalQuot :: Natural -> Natural -> Natural
naturalQuotRem :: Natural -> Natural -> (Natural, Natural)
naturalQuotRem# :: Natural -> Natural -> (# Natural, Natural #)
naturalRem :: Natural -> Natural -> Natural
naturalSetBit :: Natural -> GHC.Types.Word -> Natural
naturalSetBit# :: Natural -> GHC.Prim.Word# -> Natural
naturalShiftL :: Natural -> GHC.Types.Word -> Natural
naturalShiftL# :: Natural -> GHC.Prim.Word# -> Natural
naturalShiftR :: Natural -> GHC.Types.Word -> Natural
naturalShiftR# :: Natural -> GHC.Prim.Word# -> Natural
naturalSignum :: Natural -> Natural
naturalSizeInBase# :: GHC.Prim.Word# -> Natural -> GHC.Prim.Word#
naturalSqr :: Natural -> Natural
naturalSub :: Natural -> Natural -> (# (# #) | Natural #)
naturalSubThrow :: Natural -> Natural -> Natural
naturalSubUnsafe :: Natural -> Natural -> Natural
naturalTestBit :: Natural -> GHC.Types.Word -> GHC.Types.Bool
naturalTestBit# :: Natural -> GHC.Prim.Word# -> GHC.Num.Primitives.Bool#
naturalToAddr :: Natural -> GHC.Prim.Addr# -> GHC.Num.Primitives.Bool# -> GHC.Types.IO GHC.Types.Word
naturalToAddr# :: forall s. Natural -> GHC.Prim.Addr# -> GHC.Num.Primitives.Bool# -> GHC.Prim.State# s -> (# GHC.Prim.State# s, GHC.Prim.Word# #)
naturalToBigNat# :: Natural -> GHC.Num.BigNat.BigNat#
naturalToMutableByteArray# :: forall s. Natural -> GHC.Prim.MutableByteArray# s -> GHC.Prim.Word# -> GHC.Num.Primitives.Bool# -> GHC.Prim.State# s -> (# GHC.Prim.State# s, GHC.Prim.Word# #)
naturalToWord :: Natural -> GHC.Types.Word
naturalToWord# :: Natural -> GHC.Prim.Word#
naturalToWordClamp :: Natural -> GHC.Types.Word
naturalToWordClamp# :: Natural -> GHC.Prim.Word#
naturalToWordMaybe# :: Natural -> (# (# #) | GHC.Prim.Word# #)
naturalXor :: Natural -> Natural -> Natural
naturalZero :: Natural
module GHC.OldList where
-- Safety: Safe
(!!) :: forall a. GHC.Internal.Stack.Types.HasCallStack => [a] -> GHC.Types.Int -> a
(!?) :: forall a. [a] -> GHC.Types.Int -> GHC.Internal.Maybe.Maybe a
(++) :: forall a. [a] -> [a] -> [a]
(\\) :: forall a. GHC.Classes.Eq a => [a] -> [a] -> [a]
all :: forall a. (a -> GHC.Types.Bool) -> [a] -> GHC.Types.Bool
and :: [GHC.Types.Bool] -> GHC.Types.Bool
any :: forall a. (a -> GHC.Types.Bool) -> [a] -> GHC.Types.Bool
break :: forall a. (a -> GHC.Types.Bool) -> [a] -> ([a], [a])
concat :: forall a. [[a]] -> [a]
concatMap :: forall a b. (a -> [b]) -> [a] -> [b]
cycle :: forall a. GHC.Internal.Stack.Types.HasCallStack => [a] -> [a]
delete :: forall a. GHC.Classes.Eq a => a -> [a] -> [a]
deleteBy :: forall a. (a -> a -> GHC.Types.Bool) -> a -> [a] -> [a]
deleteFirstsBy :: forall a. (a -> a -> GHC.Types.Bool) -> [a] -> [a] -> [a]
drop :: forall a. GHC.Types.Int -> [a] -> [a]
dropWhile :: forall a. (a -> GHC.Types.Bool) -> [a] -> [a]
dropWhileEnd :: forall a. (a -> GHC.Types.Bool) -> [a] -> [a]
elem :: forall a. GHC.Classes.Eq a => a -> [a] -> GHC.Types.Bool
elemIndex :: forall a. GHC.Classes.Eq a => a -> [a] -> GHC.Internal.Maybe.Maybe GHC.Types.Int
elemIndices :: forall a. GHC.Classes.Eq a => a -> [a] -> [GHC.Types.Int]
filter :: forall a. (a -> GHC.Types.Bool) -> [a] -> [a]
find :: forall a. (a -> GHC.Types.Bool) -> [a] -> GHC.Internal.Maybe.Maybe a
findIndex :: forall a. (a -> GHC.Types.Bool) -> [a] -> GHC.Internal.Maybe.Maybe GHC.Types.Int
findIndices :: forall a. (a -> GHC.Types.Bool) -> [a] -> [GHC.Types.Int]
foldl :: forall a b. (b -> a -> b) -> b -> [a] -> b
foldl' :: forall a b. (b -> a -> b) -> b -> [a] -> b
foldl1 :: forall a. GHC.Internal.Stack.Types.HasCallStack => (a -> a -> a) -> [a] -> a
foldl1' :: forall a. GHC.Internal.Stack.Types.HasCallStack => (a -> a -> a) -> [a] -> a
foldr :: forall a b. (a -> b -> b) -> b -> [a] -> b
foldr1 :: forall a. GHC.Internal.Stack.Types.HasCallStack => (a -> a -> a) -> [a] -> a
genericDrop :: forall i a. GHC.Internal.Real.Integral i => i -> [a] -> [a]
genericIndex :: forall i a. GHC.Internal.Real.Integral i => [a] -> i -> a
genericLength :: forall i a. GHC.Internal.Num.Num i => [a] -> i
genericReplicate :: forall i a. GHC.Internal.Real.Integral i => i -> a -> [a]
genericSplitAt :: forall i a. GHC.Internal.Real.Integral i => i -> [a] -> ([a], [a])
genericTake :: forall i a. GHC.Internal.Real.Integral i => i -> [a] -> [a]
group :: forall a. GHC.Classes.Eq a => [a] -> [[a]]
groupBy :: forall a. (a -> a -> GHC.Types.Bool) -> [a] -> [[a]]
head :: forall a. GHC.Internal.Stack.Types.HasCallStack => [a] -> a
init :: forall a. GHC.Internal.Stack.Types.HasCallStack => [a] -> [a]
inits :: forall a. [a] -> [[a]]
insert :: forall a. GHC.Classes.Ord a => a -> [a] -> [a]
insertBy :: forall a. (a -> a -> GHC.Types.Ordering) -> a -> [a] -> [a]
intercalate :: forall a. [a] -> [[a]] -> [a]
intersect :: forall a. GHC.Classes.Eq a => [a] -> [a] -> [a]
intersectBy :: forall a. (a -> a -> GHC.Types.Bool) -> [a] -> [a] -> [a]
intersperse :: forall a. a -> [a] -> [a]
isInfixOf :: forall a. GHC.Classes.Eq a => [a] -> [a] -> GHC.Types.Bool
isPrefixOf :: forall a. GHC.Classes.Eq a => [a] -> [a] -> GHC.Types.Bool
isSuffixOf :: forall a. GHC.Classes.Eq a => [a] -> [a] -> GHC.Types.Bool
iterate :: forall a. (a -> a) -> a -> [a]
iterate' :: forall a. (a -> a) -> a -> [a]
last :: forall a. GHC.Internal.Stack.Types.HasCallStack => [a] -> a
length :: forall a. [a] -> GHC.Types.Int
lines :: GHC.Internal.Base.String -> [GHC.Internal.Base.String]
lookup :: forall a b. GHC.Classes.Eq a => a -> [(a, b)] -> GHC.Internal.Maybe.Maybe b
map :: forall a b. (a -> b) -> [a] -> [b]
mapAccumL :: forall acc x y. (acc -> x -> (acc, y)) -> acc -> [x] -> (acc, [y])
mapAccumR :: forall acc x y. (acc -> x -> (acc, y)) -> acc -> [x] -> (acc, [y])
maximum :: forall a. (GHC.Classes.Ord a, GHC.Internal.Stack.Types.HasCallStack) => [a] -> a
maximumBy :: forall a. (a -> a -> GHC.Types.Ordering) -> [a] -> a
minimum :: forall a. (GHC.Classes.Ord a, GHC.Internal.Stack.Types.HasCallStack) => [a] -> a
minimumBy :: forall a. (a -> a -> GHC.Types.Ordering) -> [a] -> a
notElem :: forall a. GHC.Classes.Eq a => a -> [a] -> GHC.Types.Bool
nub :: forall a. GHC.Classes.Eq a => [a] -> [a]
nubBy :: forall a. (a -> a -> GHC.Types.Bool) -> [a] -> [a]
null :: forall a. [a] -> GHC.Types.Bool
or :: [GHC.Types.Bool] -> GHC.Types.Bool
partition :: forall a. (a -> GHC.Types.Bool) -> [a] -> ([a], [a])
permutations :: forall a. [a] -> [[a]]
product :: forall a. GHC.Internal.Num.Num a => [a] -> a
repeat :: forall a. a -> [a]
replicate :: forall a. GHC.Types.Int -> a -> [a]
reverse :: forall a. [a] -> [a]
scanl :: forall b a. (b -> a -> b) -> b -> [a] -> [b]
scanl' :: forall b a. (b -> a -> b) -> b -> [a] -> [b]
scanl1 :: forall a. (a -> a -> a) -> [a] -> [a]
scanr :: forall a b. (a -> b -> b) -> b -> [a] -> [b]
scanr1 :: forall a. (a -> a -> a) -> [a] -> [a]
singleton :: forall a. a -> [a]
sort :: forall a. GHC.Classes.Ord a => [a] -> [a]
sortBy :: forall a. (a -> a -> GHC.Types.Ordering) -> [a] -> [a]
sortOn :: forall b a. GHC.Classes.Ord b => (a -> b) -> [a] -> [a]
span :: forall a. (a -> GHC.Types.Bool) -> [a] -> ([a], [a])
splitAt :: forall a. GHC.Types.Int -> [a] -> ([a], [a])
stripPrefix :: forall a. GHC.Classes.Eq a => [a] -> [a] -> GHC.Internal.Maybe.Maybe [a]
subsequences :: forall a. [a] -> [[a]]
sum :: forall a. GHC.Internal.Num.Num a => [a] -> a
tail :: forall a. GHC.Internal.Stack.Types.HasCallStack => [a] -> [a]
tails :: forall a. [a] -> [[a]]
take :: forall a. GHC.Types.Int -> [a] -> [a]
takeWhile :: forall a. (a -> GHC.Types.Bool) -> [a] -> [a]
transpose :: forall a. [[a]] -> [[a]]
uncons :: forall a. [a] -> GHC.Internal.Maybe.Maybe (a, [a])
unfoldr :: forall b a. (b -> GHC.Internal.Maybe.Maybe (a, b)) -> b -> [a]
union :: forall a. GHC.Classes.Eq a => [a] -> [a] -> [a]
unionBy :: forall a. (a -> a -> GHC.Types.Bool) -> [a] -> [a] -> [a]
unlines :: [GHC.Internal.Base.String] -> GHC.Internal.Base.String
unsnoc :: forall a. [a] -> GHC.Internal.Maybe.Maybe ([a], a)
unwords :: [GHC.Internal.Base.String] -> GHC.Internal.Base.String