summaryrefslogtreecommitdiff
path: root/compiler/GHC/Data
diff options
context:
space:
mode:
authorSylvain Henry <sylvain@haskus.fr>2021-12-20 14:56:41 +0100
committerMarge Bot <ben+marge-bot@smart-cactus.org>2022-01-06 02:24:54 -0500
commitc080b44314248545c6ddea0c0eff02f8c9edbca4 (patch)
tree57eedf35d743c95e720f8ac6fe003b7f716d1fc8 /compiler/GHC/Data
parente59bd46a6915c79e89d376aa22b0ae6def440e0a (diff)
downloadhaskell-c080b44314248545c6ddea0c0eff02f8c9edbca4.tar.gz
Perf: use SmallArray for primops' Ids cache (#20857)
SmallArray doesn't perform bounds check (faster). Make primop tags start at 0 to avoid index arithmetic.
Diffstat (limited to 'compiler/GHC/Data')
-rw-r--r--compiler/GHC/Data/SmallArray.hs92
1 files changed, 92 insertions, 0 deletions
diff --git a/compiler/GHC/Data/SmallArray.hs b/compiler/GHC/Data/SmallArray.hs
new file mode 100644
index 0000000000..2697c8380b
--- /dev/null
+++ b/compiler/GHC/Data/SmallArray.hs
@@ -0,0 +1,92 @@
+{-# LANGUAGE MagicHash #-}
+{-# LANGUAGE UnboxedTuples #-}
+{-# LANGUAGE BlockArguments #-}
+
+-- | Small-array
+module GHC.Data.SmallArray
+ ( SmallMutableArray (..)
+ , SmallArray (..)
+ , newSmallArray
+ , writeSmallArray
+ , freezeSmallArray
+ , unsafeFreezeSmallArray
+ , indexSmallArray
+ , listToArray
+ )
+where
+
+import GHC.Exts
+import GHC.Prelude
+import GHC.ST
+
+data SmallArray a = SmallArray (SmallArray# a)
+
+data SmallMutableArray s a = SmallMutableArray (SmallMutableArray# s a)
+
+newSmallArray
+ :: Int -- ^ size
+ -> a -- ^ initial contents
+ -> State# s
+ -> (# State# s, SmallMutableArray s a #)
+{-# INLINE newSmallArray #-}
+newSmallArray (I# sz) x s = case newSmallArray# sz x s of
+ (# s', a #) -> (# s', SmallMutableArray a #)
+
+writeSmallArray
+ :: SmallMutableArray s a -- ^ array
+ -> Int -- ^ index
+ -> a -- ^ new element
+ -> State# s
+ -> State# s
+{-# INLINE writeSmallArray #-}
+writeSmallArray (SmallMutableArray a) (I# i) x = writeSmallArray# a i x
+
+
+-- | Copy and freeze a slice of a mutable array.
+freezeSmallArray
+ :: SmallMutableArray s a -- ^ source
+ -> Int -- ^ offset
+ -> Int -- ^ length
+ -> State# s
+ -> (# State# s, SmallArray a #)
+{-# INLINE freezeSmallArray #-}
+freezeSmallArray (SmallMutableArray ma) (I# offset) (I# len) s =
+ case freezeSmallArray# ma offset len s of
+ (# s', a #) -> (# s', SmallArray a #)
+
+-- | Freeze a mutable array (no copy!)
+unsafeFreezeSmallArray
+ :: SmallMutableArray s a
+ -> State# s
+ -> (# State# s, SmallArray a #)
+{-# INLINE unsafeFreezeSmallArray #-}
+unsafeFreezeSmallArray (SmallMutableArray ma) s =
+ case unsafeFreezeSmallArray# ma s of
+ (# s', a #) -> (# s', SmallArray a #)
+
+
+-- | Index a small-array (no bounds checking!)
+indexSmallArray
+ :: SmallArray a -- ^ array
+ -> Int -- ^ index
+ -> a
+{-# INLINE indexSmallArray #-}
+indexSmallArray (SmallArray sa#) (I# i) = case indexSmallArray# sa# i of
+ (# v #) -> v
+
+
+-- | Convert a list into an array.
+listToArray :: Int -> (e -> Int) -> (e -> a) -> [e] -> SmallArray a
+{-# INLINE listToArray #-}
+listToArray (I# size) index_of value_of xs = runST $ ST \s ->
+ let
+ index_of' e = case index_of e of I# i -> i
+ write_elems ma es s = case es of
+ [] -> s
+ e:es' -> case writeSmallArray# ma (index_of' e) (value_of e) s of
+ s' -> write_elems ma es' s'
+ in
+ case newSmallArray# size undefined s of
+ (# s', ma #) -> case write_elems ma xs s' of
+ s'' -> case unsafeFreezeSmallArray# ma s'' of
+ (# s''', a #) -> (# s''', SmallArray a #)