- html - 出于某种原因,IE8 对我的 Sass 文件中继承的 html5 CSS 不友好?
- JMeter 在响应断言中使用 span 标签的问题
- html - 在 :hover and :active? 上具有不同效果的 CSS 动画
- html - 相对于居中的 html 内容固定的 CSS 重复背景?
我正在寻找一种方法来拥有 Enum a => UArray a
(这对我来说很有意义,因为我们可以简单地将枚举映射到 Int
并通过 toEnum
和 fromEnum
)
到目前为止,我试图从 Data.Array.Base 窃取 UArray Int
的代码并在各处走私一些 toEnum
和 fromEnum
:
{-# LANGUAGE MagicHash, UnboxedTuples #-}
{-# LANGUAGE MultiParamTypeClasses #-}
{-# LANGUAGE FlexibleInstances #-}
module UArrays where
import Data.Array.Base
import Data.Array.ST
import Data.Array.Unboxed
import GHC.Base -- (Int(I#), Int#(..))
import GHC.Prim -- (indexIntArray#, readIntArray#, writeIntArray#)
import GHC.ST (ST(..), runST)
import Unsafe.Coerce
instance (Enum a, Bounded a) => IArray UArray a where
{-# INLINE bounds #-}
bounds (UArray l u _ _) = (l, u)
{-# INLINE numElements #-}
numElements (UArray _ _ n _) = n
{-# INLINE unsafeArray #-}
unsafeArray lu ies = runST (unsafeArrayUArray lu ies minBound)
{-# INLINE unsafeAt #-}
unsafeAt (UArray _ _ _ arr#) (I# i#) =
I# $ fromEnum (indexIntArray# arr# i#)
{-# INLINE unsafeReplace #-}
unsafeReplace arr ies = runST (unsafeReplaceUArray arr ies)
{-# INLINE unsafeAccum #-}
unsafeAccum f arr ies = runST (unsafeAccumUArray f arr ies)
{-# INLINE unsafeAccumArray #-}
unsafeAccumArray f initialValue lu ies =
runST (unsafeAccumArrayUArray f initialValue lu ies)
-- data STUArray s i e = STUArray !i !i !Int (GHC.Prim.MutableByteArray# s)
instance (Enum a, Bounded a) => MArray (STUArray s) a (ST s) where
{-# INLINE getBounds #-}
getBounds (STUArray l u _ _) = return (l, u)
{-# INLINE getNumElements #-}
getNumElements (STUArray _ _ n _) = return n
{-# INLINE unsafeNewArray_ #-}
unsafeNewArray_ (l, u) = unsafeNewArraySTUArray_ (l, u) wORD_SCALE
{-# INLINE newArray_ #-}
newArray_ arrBounds = newArray arrBounds minBound
{-# INLINE unsafeRead #-}
-- unsafeRead :: GHC.Arr.Ix i => a i e -> Int -> m e
unsafeRead (STUArray _ _ _ marr#) (I# i#) =
ST $ \ s1# ->
case readIntArray# marr# i# s1# of
(# s2#, e# #) -> (# s2#, I# (toEnum e#) #)
{-# INLINE unsafeWrite #-}
-- unsafeWrite :: GHC.Arr.Ix i => a i e -> Int -> e -> m ()
unsafeWrite (STUArray _ _ _ marr#) (I# i#) (I# e#) =
ST $ \ s1# ->
case writeIntArray# marr# (unsafeCoerce i#) (I# $ fromEnum e#) s1# of
s2# -> (# s2#, () #)
当然它不能编译:
[2 of 4] Compiling UArrays ( UArrays.hs, interpreted )
UArrays.hs:27:14:
Couldn't match expected type `Int#' with actual type `Int'
In the return type of a call of `fromEnum'
In the second argument of `($)', namely
`fromEnum (indexIntArray# arr# i#)'
In the expression: I# $ fromEnum (indexIntArray# arr# i#)
UArrays.hs:52:45:
Couldn't match expected type `Int' with actual type `Int#'
In the first argument of `toEnum', namely `e#'
In the first argument of `I#', namely `(toEnum e#)'
In the expression: I# (toEnum e#)
UArrays.hs:57:57:
Couldn't match expected type `Int#' with actual type `Int'
In the return type of a call of `fromEnum'
In the second argument of `($)', namely `fromEnum e#'
In the third argument of `writeIntArray#', namely
`(I# $ fromEnum e#)'
Failed, modules loaded: Utils.
GHC.*
中也没有神奇的unboxInt::Int -> Int#
,I#
上的模式匹配也没有't yield Int
而是一个 Int#
,但不知何故 UArray Int
存在并在 Int#
上工作。
我还找到了一篇关于 making an UArray for newtypes 的帖子,但它似乎并不适用,因为它依赖于 unsafeCoerce
。我试过了,但它产生了一个有趣的 listArray (0, 54) $ cycle [Red, Yellow, Green]
,其中所有构造函数都是 Blue
。
我走错路了吗?
更新:
现在可以使用了,这是源代码:
最佳答案
您需要意识到 Int
是一个装箱整数,它是通过构造函数 I#
从未装箱的整数 Int#
构造的。所以:
-- These functions aren't practical; they just demonstrate the types.
unboxInt :: Int -> Int#
unboxInt (I# unboxed) = unboxed
boxInt :: Int# -> Int
boxInt = I#
因为 fromEnum
已经返回了一个装箱的整数,你不必通过再次应用 I#
来重新装箱它,所以在这个代码片段中,例如:
{-I# $-} fromEnum (indexIntArray# arr# i#)
...您可以简单地省略 I#
构造函数。同样,当使用 toEnum
时,您应该应用 I#
构造函数从未装箱的整数中获取装箱的整数。
正如@leftaroundabout 提到的,这种装箱和拆箱加上 fromEnum
和 toEnum
可能具有的复杂性(特别是对于元组等)可能会导致性能下降到使用简单的盒装 Array
。
关于haskell - 寻找 «instance (Enum a, Bounded a) => IArray UArray a»,我们在Stack Overflow上找到一个类似的问题: https://stackoverflow.com/questions/8941386/
假设我有一个简单的数据类型,例如: data Cell = Open | Blocked 我想使用 UArray Int Cell .是否有捷径可寻?我可以以某种方式重用 UArray Int Boo
我正在尝试为我的数据类型实现 Show 类型类 data Heap a = Heap {invariant :: a -> a -> Ordering ,arr
我正在寻找一种方法来拥有 Enum a => UArray a(这对我来说很有意义,因为我们可以简单地将枚举映射到 Int 并通过 toEnum 和 fromEnum) 到目前为止,我试图从 Data
我正在尝试使用 UArray Int (Complex Double)。此签名很好,但是当我尝试使用 (!) 访问特定索引时,我收到错误消息。这是我尝试使用的代码: test :: UArray In
我正在尝试使用 UArray Int (Complex Double)。此签名很好,但是当我尝试使用 (!) 访问特定索引时,我收到错误消息。这是我尝试使用的代码: test :: UArray In
我正在使用 Network.Pcap 进行一些网络捕获( pcap ) 并计划使用 Net.PacketParsing 进行一些检查( network-house )。为此,看起来我必须将我的数据包解
我是一名优秀的程序员,十分优秀!