Difference between revisions of "Library/ArrayRef"

From HaskellWiki
Jump to navigation Jump to search
m
m
Line 45: Line 45:
 
==Monad-independent references==
 
==Monad-independent references==
   
Sometimes you need to write code that will be compatible both with IO
+
Sometimes you need to write code that will be compatible with both IO
 
and ST monads, and even better with any monad that is lifted from
 
and ST monads, and even better with any monad that is lifted from
 
one of these two. This is especially useful for writing library code that
 
one of these two. This is especially useful for writing library code that
 
should be as generic as possible. Operations for arrays, for example,
 
should be as generic as possible. Operations for arrays, for example,
 
are ready for such a kind of usage - readArray and writeArray can work
 
are ready for such a kind of usage - readArray and writeArray can work
in any monad. But it's not true for references - you need to use
+
in any monad. But this is not true for references - you need to use
 
readIORef for IO monad, but readSTRef for ST monad, so if you need to
 
readIORef for IO monad, but readSTRef for ST monad, so if you need to
 
implement a monad-independent algorithm that uses references, you will
 
implement a monad-independent algorithm that uses references, you will
Line 63: Line 63:
 
</haskell>
 
</haskell>
   
can be executed both in IO and ST monads:
+
can be executed in both the IO and the ST monads:
   
 
<haskell>
 
<haskell>
Line 72: Line 72:
 
</haskell>
 
</haskell>
   
This example uses the boxed references, unboxed references can be used
+
This example uses the boxed references; unboxed references can be used
 
in a similar way with operations newURef, readURef, writeURef.
 
in a similar way with operations newURef, readURef, writeURef.
   
Line 103: Line 103:
 
</haskell>
 
</haskell>
   
Basically, the module supports syntax sugar for using the following
+
Basically, the module supports syntactic sugar for using the following
 
data types: all types of references, arrays and hash tables. Also, it
 
data types: all types of references, arrays and hash tables. Also, it
 
includes two operations to creating references - ref (=newRef) and
 
includes two operations to creating references - ref (=newRef) and
Line 126: Line 126:
 
(arr,(0,1)) =: 1
 
(arr,(0,1)) =: 1
   
Let's pay attention that this module supports arrays implementation
+
Let's pay attention that this module supports array implementations
 
included in the library, not standard Data.Array.* modules. Module
 
included in the library, not standard Data.Array.* modules. Module
 
"Examples/SyntaxSugar.hs" should contain further examples.
 
"Examples/SyntaxSugar.hs" should contain further examples.
Line 146: Line 146:
   
 
- MArray class now supports arrays with dynamic bounds. It includes
 
- MArray class now supports arrays with dynamic bounds. It includes
monadic operation getBounds, and if you will change your code to use
+
monadic operation getBounds, and if you change your code to use
this operation with mutable arrays instead of `bounds`, your code also
+
this operation with mutable arrays instead of `bounds`, your code will also
will be ready to work with dynamic (resizable) arrays
+
be ready to work with dynamic (resizable) arrays
   
- Support for dynamic (resizable) arrays included. Their bounds can be
+
- Support for dynamic (resizable) arrays is included. Their bounds can be
 
changed either explicitly (by `resizeDynamicArray`) or implicitly (by
 
changed either explicitly (by `resizeDynamicArray`) or implicitly (by
 
writing to non-existing position). Policy of automatic array expansion
 
writing to non-existing position). Policy of automatic array expansion
Line 159: Line 159:
   
 
- castUArray/castIOUArray/castSTUArray operations are non-monadic,
 
- castUArray/castIOUArray/castSTUArray operations are non-monadic,
require "Enum ix" and recalculates upper bound of array according to
+
require "Enum ix" and recalculate upper bounds of arrays according to the
size of elements: UArray (1,2) Word32 -> UArray (1,8) Word8
+
size of their elements: UArray (1,2) Word32 -> UArray (1,8) Word8
   
 
- Some operations may be slower in the new implementation, because I'm
 
- Some operations may be slower in the new implementation, because I'm
not sure that I discovered all the clever tricks used in original lib.
+
not sure that I discovered all the clever tricks used in the original library.
 
Please test speed and report me about any problems
 
Please test speed and report me about any problems
   
In other aspects, using of new arrays are equivalent to the old ones.
+
In other aspects, the new arrays are equivalent to the old ones.
 
Just change "Array" to the "ArrayBZ" in your import statements and
 
Just change "Array" to the "ArrayBZ" in your import statements and
 
enjoy! :) Directory "Examples/Array" contains demonstrations of using
 
enjoy! :) Directory "Examples/Array" contains demonstrations of using
Line 174: Line 174:
 
===Changes in MArray usage===
 
===Changes in MArray usage===
   
Old Arrays library contained the following definitions:
+
The old Arrays library contained the following definitions:
   
 
<haskell>
 
<haskell>
Line 183: Line 183:
 
</haskell>
 
</haskell>
   
In new library, MArray class defined as:
+
In the new library, MArray class defined as:
   
 
<haskell>
 
<haskell>
Line 200: Line 200:
 
</haskell>
 
</haskell>
   
because the `bounds` operation is part of HasBounds class that is no longer a
+
because the `bounds` operation is part of HasBounds class, that is no longer a
 
base class for MArray. What can you do to fix this problem? Either:
 
base class for MArray. What can you do to fix this problem? Either:
   
Line 214: Line 214:
   
 
- Replace calls to the `bounds` operation with calls to `getBounds`. This
 
- Replace calls to the `bounds` operation with calls to `getBounds`. This
way, your function will become compatible with any instance of MArray
+
way, your function will become compatible with any instance of the MArray
 
class, including dynamic arrays:
 
class, including dynamic arrays:
   
Line 222: Line 222:
 
</haskell>
 
</haskell>
   
I should mention that despite MArray now isn't based on the HasBounds
+
I should mention that despite the fact that MArray isn't based on the HasBounds
class, all the old mutable array types (IOArray..StorableArray) still
+
class anymore, all the old mutable array types (IOArray..StorableArray) still
 
implement this interface. Only the new dynamic arrays don't implement
 
implement this interface. Only the new dynamic arrays don't implement
 
it because this is impossible. So, you can use the `bounds` operation
 
it because this is impossible. So, you can use the `bounds` operation
Line 240: Line 240:
 
very trivial: it just saves reference (IORef or STRef) to the mutable
 
very trivial: it just saves reference (IORef or STRef) to the mutable
 
array. When a dynamic array is resized, a new mutable array is allocated and the
 
array. When a dynamic array is resized, a new mutable array is allocated and the
contents is copied. New elements are filled with the value that was
+
contents is copied. New elements are filled with the same default value as when the array was created with the newArray
supported as default if array was created with the newArray
 
 
or newDynamicArray operation. If a dynamic array is created with
 
or newDynamicArray operation. If a dynamic array is created with
 
newArray_ or newDynamicArray_, then new elements will be left
 
newArray_ or newDynamicArray_, then new elements will be left
Line 264: Line 263:
   
 
To create an array that will be automatically resized on attempt to write
 
To create an array that will be automatically resized on attempt to write
beyond current bounds, you should use newDynamicArray or
+
beyond current bounds, you should use a newDynamicArray or
 
newDynamicArray_ operation (the former initializes an array with a given value, while the latter leaves the array uninitialized). Their first argument
 
newDynamicArray_ operation (the former initializes an array with a given value, while the latter leaves the array uninitialized). Their first argument
 
determines the array expansion policy:
 
determines the array expansion policy:
Line 272: Line 271:
 
</haskell>
 
</haskell>
   
This array will grow at least two times each time automatic
+
This array will grow to at least two times its current size, each time automatic
 
expansion occurs, which is determined by using the `growTwoTimes`
 
expansion occurs, which is determined by using the `growTwoTimes`
 
parameter. This parameter is just the ordinary function that has the
 
parameter. This parameter is just the ordinary function that has the
Line 285: Line 284:
 
policies yourself, or use one of premastered ones:
 
policies yourself, or use one of premastered ones:
   
growTwoTimes - expand array at least two times
+
growTwoTimes - expand array to at least two times its current size
 
growMinimally - minimal growth that ensures inclusion of new index
 
growMinimally - minimal growth that ensures inclusion of new index
 
noGrow - disable automatic growth. This policy is used for arrays created by newArray or newArray_
 
noGrow - disable automatic growth. This policy is used for arrays created by newArray or newArray_
Line 294: Line 293:
 
policy by it's type is compatible with any index, but it will not work
 
policy by it's type is compatible with any index, but it will not work
 
for partially ordered indexes, in particular for multi-dimensional
 
for partially ordered indexes, in particular for multi-dimensional
arrays. Imagine, for example, array with bounds (0,0)..(9,9). When you
+
arrays. Imagine, for example, an array with the bounds (0,0)..(9,9). When you
 
try to write to index (15,5), this expansion policy function will
 
try to write to index (15,5), this expansion policy function will
 
be unable to determine what the new bounds should be (0,0)..(15,9). So you
 
be unable to determine what the new bounds should be (0,0)..(15,9). So you
anyway should provide a custom expansion policy function for partially
+
should always provide a custom expansion policy function for partially
ordered indexes. At last, growTwoTimes policy is compatible only with
+
ordered indexes. At last, the growTwoTimes policy is compatible only with
 
indexes belonging to class Num, but it is the most useful policy of all, because it ensures that the program will not spend all it's
 
indexes belonging to class Num, but it is the most useful policy of all, because it ensures that the program will not spend all it's
time expanding the array. On the other side, you can provide your own
+
time expanding arrays. On the other side, you can provide your own
 
policy function that will, for example, expand an array only 1.5 times.
 
policy function that will, for example, expand an array only 1.5 times.
   
Dynamic array supports the same MArray and HasMutableBounds interfaces
+
Dynamic arrays support the same MArray and HasMutableBounds interfaces
 
as other mutable arrays, but they don't support the HasBounds interface.
 
as other mutable arrays, but they don't support the HasBounds interface.
   

Revision as of 21:55, 6 June 2006

The Arrays&References library supports Hugs 2003-2006 and GHC 6.4. It includes the following features:

Unboxed references

This substitutes the numerous "fast mutable Ints", "fast mutable Bools" and "fast mutable Ptrs" ghc-specific modules that are used in almost any large project. In contrast to them, this library mimics the well-known interface of IORef/STRef:

import Data.Ref
main = do x <- newIOURef (0::Int)
          writeIOURef x 1
          a <- readIOURef x
          print a

Unboxed references for IO monad have the type "IOURef a" and operations newIOURef, readIOURef, writeIOURef. Unboxed references for ST monad have the type "STURef s a" and operations newSTURef, readSTURef, writeSTURef.

Unboxed references can only contain values of following types: Bool, Char, Int, Int8..Int64, Word, Word8..Word64, Float, Double, Ptr a, FunPtr a, StablePtr a. These types are members of Unboxed class and you can implement new instances of this class by converting values of some other type (say, CChar) to values of an already supported type.

Despite all these improvements, operations with unboxed references are compiled to the same code as for any "fast mutable variables". Moreover, unboxed references are available even for Hugs which allows simplified debugging of programs that use them. Please note that unboxed references always hold computed values, in contrast to boxed references, which can contain unevaluated thunks.

I wish to thank Simon Marlow and especially Oleg Kiselyov who proposed the idea of these references and their implementation (in particular, see http://www.haskell.org/pipermail/haskell-cafe/2006-February/014324.html)

You can find examples of using unboxed references in "Examples/URef.hs"


Monad-independent references

Sometimes you need to write code that will be compatible with both IO and ST monads, and even better with any monad that is lifted from one of these two. This is especially useful for writing library code that should be as generic as possible. Operations for arrays, for example, are ready for such a kind of usage - readArray and writeArray can work in any monad. But this is not true for references - you need to use readIORef for IO monad, but readSTRef for ST monad, so if you need to implement a monad-independent algorithm that uses references, you will be in trouble. This module solves this problem by providing monad-independent operations on boxed and unboxed references. So, the following routine:

test_Ref = do x <- newRef (0::Int)
              writeRef x 1
              readRef x

can be executed in both the IO and the ST monads:

main = do a <- test_Ref
          print a
          let b = runST test_Ref
          print b

This example uses the boxed references; unboxed references can be used in a similar way with operations newURef, readURef, writeURef.

You can find examples of writing monad-independent routines in "Examples/Universal.hs". Another library of mine, Library/Streams, widely uses this facility to implement common functionality for streams working in different monads.


Syntax sugar for mutable types

Haskell doesn't support a convenient syntax for using mutable vars, such as references, arrays and hash tables. The library includes a module that partially simplifies their usage. For example:

main = do -- syntax sugar used for reference:
          x <- ref (0::Int)
          x += 1
          x .= (*2)
          a <- val x
          print a

          -- syntax sugar used for array:
          arr <- newArray (0,9) 0 :: IO Array Int Int
          (arr,0) =: 1
          b <- val (arr,0)
          print b

Basically, the module supports syntactic sugar for using the following data types: all types of references, arrays and hash tables. Also, it includes two operations to creating references - ref (=newRef) and uref (=newURef). Other operations include

=:  assign
+=  increase
-=  decrease
.=  apply a pure function to the contents
.<- apply a monadic computation to the contents
val return current value

The left part of these operations can be a reference, array or hash element. Code examples:

reference        x += 1
(array,index)    (arr,0) =: 1
(hash,key)       (hash,"str") .= (*2)

You can also omit extra parentheses when indexing a two- or three-dimensional array:

(arr,0,1)   =: 1

is equivalent to

(arr,(0,1)) =: 1

Let's pay attention that this module supports array implementations included in the library, not standard Data.Array.* modules. Module "Examples/SyntaxSugar.hs" should contain further examples.


Reimplemented Arrays library

The library also includes modified implementations of Data.Array.* modules. The main benefit of these modifications is a simplified internal library structure

Nevertheless, it also includes a few user-visible changes:

- Unboxed arrays now can be used in polymorphic functions, they are defined for every element type that belongs to the classes Unboxed and HasDefaultValue (again, look at http://www.haskell.org/pipermail/haskell-cafe/2004-July/006400.html). You can add new instances to these classes

- MArray class now supports arrays with dynamic bounds. It includes monadic operation getBounds, and if you change your code to use this operation with mutable arrays instead of `bounds`, your code will also be ready to work with dynamic (resizable) arrays

- Support for dynamic (resizable) arrays is included. Their bounds can be changed either explicitly (by `resizeDynamicArray`) or implicitly (by writing to non-existing position). Policy of automatic array expansion is selected (or disabled) on array creation.

- Unboxed arrays of Bool values occupy one byte per element (in the old implementation they used one bit per element)

- castUArray/castIOUArray/castSTUArray operations are non-monadic, require "Enum ix" and recalculate upper bounds of arrays according to the size of their elements: UArray (1,2) Word32 -> UArray (1,8) Word8

- Some operations may be slower in the new implementation, because I'm not sure that I discovered all the clever tricks used in the original library. Please test speed and report me about any problems

In other aspects, the new arrays are equivalent to the old ones. Just change "Array" to the "ArrayBZ" in your import statements and enjoy! :) Directory "Examples/Array" contains demonstrations of using each array type


Changes in MArray usage

The old Arrays library contained the following definitions:

class HasBounds a where
    bounds :: Ix i => a i e -> (i,i)
class (Monad m, HasBounds a) => MArray a e m where 
    ...

In the new library, MArray class defined as:

class (Monad m) => HasMutableBounds a m where
    getBounds :: Ix i => a i e -> m (i,i)
class (Monad m, HasMutableBounds a m) => MArray a e m where 
    ...

This means that definitions like this will no longer work:

arrayHead :: (MArray a e m, Ix i) => a i e -> m e
arrayHead marr = case bounds marr of
    (l,_) -> readArray marr l

because the `bounds` operation is part of HasBounds class, that is no longer a base class for MArray. What can you do to fix this problem? Either:

- Add a HasBounds restriction to the operation type:

arrayHead :: (MArray a e m, HasBounds a, Ix i) => a i e -> m e

This way, your code will become compatible with both the old and the new versions of Arrays library, but it will work only with "old" mutable arrays and won't support dynamic arrays.

- Replace calls to the `bounds` operation with calls to `getBounds`. This way, your function will become compatible with any instance of the MArray class, including dynamic arrays:

arrayHead marr = do (l,_) <- getBounds marr
                    readArray marr l

I should mention that despite the fact that MArray isn't based on the HasBounds class anymore, all the old mutable array types (IOArray..StorableArray) still implement this interface. Only the new dynamic arrays don't implement it because this is impossible. So, you can use the `bounds` operation in code that works with one of "old" array constructors:

arrayHead :: IOArray i e -> IO e
arrayHead marr = case bounds marr of
    (l,_) -> readArray marr l


Using dynamic (resizable) arrays

Just to let you know - the current implementation of dynamic arrays is very trivial: it just saves reference (IORef or STRef) to the mutable array. When a dynamic array is resized, a new mutable array is allocated and the contents is copied. New elements are filled with the same default value as when the array was created with the newArray or newDynamicArray operation. If a dynamic array is created with newArray_ or newDynamicArray_, then new elements will be left undefined.

A dynamic array can be resized explicitly by the resizeDynamicArray operation:

  resizeDynamicArray array (l,u)

where (l,u) are new array bounds. If the dynamic array was created by a newArray or newArray_ operation, it is the only way to resize it - attempts to write beyond current bounds will raise an exception:

  arr <- newArray (0,-1) 99 :: IO (DynamicIOArray Int Int)
  resizeDynamicArray arr (0,0)
  writeArray arr 1 1  -- this operation raises an exception


To create an array that will be automatically resized on attempt to write beyond current bounds, you should use a newDynamicArray or newDynamicArray_ operation (the former initializes an array with a given value, while the latter leaves the array uninitialized). Their first argument determines the array expansion policy:

   arr <- newDynamicArray_ growTwoTimes (0,-1) :: IO (DynamicIOArray Int Int)

This array will grow to at least two times its current size, each time automatic expansion occurs, which is determined by using the `growTwoTimes` parameter. This parameter is just the ordinary function that has the following type:

type GrowBoundsF i  =  (i,i) -> i -> (i,i)

This function accepts old array bounds and offending index and returns new array bounds. You can write new functions for an expansion policies yourself, or use one of premastered ones:

growTwoTimes - expand array to at least two times its current size
growMinimally - minimal growth that ensures inclusion of new index
noGrow - disable automatic growth. This policy is used for arrays created by newArray or newArray_

Please note that not every array can work with every expansion policy and that is why I supported freedom of selection of this policy. Only noGrow policy is compatible with every index type. The growMinimally policy by it's type is compatible with any index, but it will not work for partially ordered indexes, in particular for multi-dimensional arrays. Imagine, for example, an array with the bounds (0,0)..(9,9). When you try to write to index (15,5), this expansion policy function will be unable to determine what the new bounds should be (0,0)..(15,9). So you should always provide a custom expansion policy function for partially ordered indexes. At last, the growTwoTimes policy is compatible only with indexes belonging to class Num, but it is the most useful policy of all, because it ensures that the program will not spend all it's time expanding arrays. On the other side, you can provide your own policy function that will, for example, expand an array only 1.5 times.

Dynamic arrays support the same MArray and HasMutableBounds interfaces as other mutable arrays, but they don't support the HasBounds interface.


And now about types of dynamic arrays. These types reflect all the types you can use for mutable arrays, and include DynamicIOArray, DynamicIOUArray, DynamicSTArray, DynamicSTUArray, which have the same parameters as corresponding arrays without the "Dynamic" prefix. Some examples are:

  DynamicIOArray Int Double
  DynamicSTUArray s (Int,Int) Bool

You can also create dynamic arrays from other mutable array types working in IO monad:

  DynamicIO StorableArray Int Double

or ST monad:

  DynamicST s (STUArray s) (Int,Int) Bool

or any other monad (ask me if you need this). Btw, implementation of dynamic arrays use the monad-independent references class mentioned above.


See "Examples/Array/Dynamic.hs" for further examples on using these arrays.