In this notebook, we'll look at finger trees, a general purpose functional data structure developed in the paper by Hinze and Patterson. Finger trees provide a functional sequence data structure, which provides amortized constant-time access and appending to the front and end of the sequence, as well as logarithmic time concatenation and random access. In addition to good asymptotic runtime bounds, the data structure turns out to be incredibly flexible: when combined with monoidal tags on the elements, finger trees may be used to implement efficient random-access sequences, ordered sequences, interval trees, and priority queues.

Please note that all of the algorithms in this notebook are effectively sourced from the paper linked above; some of the images are also from the paper. I highly recommend reading the paper itself, before or after this guide.

Developing the Data Structure

The basis and motivation for finger trees comes from 2-3 trees. 2-3 trees are trees which can have two or three branches at each internal node and which have all of their leaves at the same level. While a binary tree of uniform depth $d$ must have $2^d$ leaves, 2-3 trees are much more flexible, and may be used to store any number of elements (the number does not have to be a power of two).

Consider the following 2-3 tree (image taken from the original finger-tree paper linked above):

This tree stores fourteen elements. Access to any of them requires three steps, and if we were to add more elements, the number of steps for each one would grow logarithmically. We would like to use these trees in order to model sequences. However, in many application sequences are very often accessed repeatedly at the front or back, and much less often in the middle. To accomodate this use case, we can modify this data structure to prioritize front and back access over other features.

In our case, we add two fingers. A finger is simply a point at which you can access part of a data structure; in imperative languages, this would simply be a pointer. In our case, though, we restructure the entire tree and make the parents of the first and last children the two roots of our tree. Visually, consider taking the tree above, grabbing the first and last nodes on the previous-to-last layer, and pulling them up, letting the rest of the tree hang down:

This new data structure is known as a finger tree. The finger tree is composed of several layers (boxed in blue below) which sit along its spine (the brown line): Each layer of the finger tree has a prefix (on the left) and a suffix (on the right), as well as a link further down the spine. The prefix and suffix contain values in the finger tree – on the first level, they contain values (2-3 trees of depth 0); on the second level, they contain 2-3 trees of depth 1; on the third level, they contain 2-3 trees of depth 2, and so on. This somewhat unusual property comes from the fact that the original 2-3 tree was of uniform depth. The edges of the original 2-3 tree are now at the top of the spine. The root of the 2-3 tree is now the very bottom element of the spine. As we go down the spine, we are traversing from the leaves to the root of the original 2-3 tree; as we go closer to the root, the prefix and suffixes contain deeper and deeper subtrees of the original 2-3 tree.

With this description out of the way, let's go ahead and define this data structure. First, we must define the 2-3 tree structure which will be used to store things hanging off the spine:


In [1]:
-- An intermediate node in a 2-3 tree, parameterized
-- based on the type of its child.
data Node a = Branch3 a a a -- The node can have 3 children.
            | Branch2 a a   -- ...or only two children.
            deriving Show

Note that the node is parameterized by what type its child is. This allows nested nodes to be used to represent 2-3 trees, giving us a guarantee of uniform depth. For example, a 2-3 tree of depth 1 could be just aNode Char:


In [2]:
-- The 2-3 trees at the 2nd layer suffix of our example finger tree.
Branch3 'n' 'o' 't'
Branch2 'a' 't'


Branch3 'n' 'o' 't'
Branch2 'a' 't'

However, we can also create deeper 2-3 trees. For example, a 2-3 tree of depth 2 could be a Node (Node Char):


In [3]:
Branch2 (Branch3 'n' 'o' 't') (Branch2 'a' 't')


Branch2 (Branch3 'n' 'o' 't') (Branch2 'a' 't')

Note that this representation guarantees that 2-3 trees have uniform depth, because the depth is represented in the type of the tree. This has its own disadvantages (it's harder to write functions that are parametric over the depth of a tree), but will work well in our case.

For later convenience, let's implement some utilities which let us treat Node values as lists of length two or three. This uses the OverloadedLists extension for GHC, which allows you to implement fromList and toList for different data types and then use pattern matching on them as if they were lists:


In [4]:
-- Settings necessary to use fromList and toList on our data structures.
:set -XOverloadedLists -XTypeFamilies
import GHC.Exts (IsList(..))

instance IsList (Node a) where
  type Item (Node a) = a
  
  toList (Branch2 x y) = [x, y]
  toList (Branch3 x y z) = [x, y, z]
  
  fromList [x, y] = Branch2 x y
  fromList [x, y, z] = Branch3 x y z
  fromList _ = error "Node must contain two or three elements"

Now that we have our 2-3 tree type, we need a type to store the prefix and suffixes that hang off the finger tree spine. If our finger tree is exactly analogous to a 2-3 tree, then the very first prefixes and suffixes can have either 2 or 3 elements, and intermediate ones can only have 1 or 2 (because one of the links goes up to the higher level in the spine). However, for the sake of uniformity, this requirement is relaxed for finger trees, and instead each prefix and suffix holds between 1 and 4 elements. (It must be 1, 2, 3, or 4 – no other values are allowed.) Although we could store the prefix and suffix in a list, we will instead devise a custom constructor that can only store the right number of elements:


In [5]:
-- Parameterize the affix by the type of data it stores.
-- This is equivalent to lists of length 1 to 4.
data Affix a = One a
             | Two a a
             | Three a a a
             | Four a a a a
             deriving Show

Working with these affixes is going to be somewhat tedious, so we'll quickly define some helper functions that treat these affixes as lists:


In [6]:
-- Let affixes be treated as lists.
instance IsList (Affix a) where
  type Item (Affix a) = a
  
  toList (One x)        = [x]
  toList (Two x y)      = [x, y]
  toList (Three x y z)  = [x, y, z]
  toList (Four x y z w) = [x, y, z, w]
  
  fromList [x]          = One x
  fromList [x, y]       = Two x y
  fromList [x, y, z]    = Three x y z
  fromList [x, y, z, w] = Four x y z w
  fromList _ = error "Affix must have one to four elements"
  
-- The following functions could be much more efficient.
-- We use the simplest implementation possible.
affixPrepend :: a -> Affix a -> Affix a
affixPrepend x = fromList . (x :) . toList

affixAppend :: a -> Affix a -> Affix a
affixAppend x = fromList . (++ [x]) . toList

Now that we've defined the data types necessary for storing values (the 2-3 tree storing the values and the affixes attached to the spine), we can create the spine data structure. This data structure is what we call the finger tree, and we define it as follows:


In [7]:
-- As usual, the type parameter represents what type
-- of data is stored in this finger tree.
data FingerTree a 
  = Empty      -- We can have empty trees.
  | Single a   -- We need a special case for trees of size one.
  
  -- The common case with a prefix, suffix, and link to a deeper tree.
  | Deep {
    prefix :: Affix a,             -- Values on the left.
    deeper :: FingerTree (Node a), -- The deeper finger tree, storing deeper 2-3 trees.
    suffix :: Affix a              -- Values on the right.
  }
  deriving Show

In the definition above, the deeper field of a FingerTree a has type FingerTree (Node a). This means that the values stored at the next level are 2-3 trees that are one level deeper. Thus, the affixes in the first layer of a FingerTree Char will just store Chars; the second layer will be a FingerTree (Node Char) and will have affixes that hold 2-3 trees of depth 1 (Node Char); the third layer will be a FingerTree (Node (Node Char)) and will have affixes that store 2-3 trees of depth 2 (Node (Node Char)).

Now that we've defined our finger tree data structure, spend a little bit longer staring at the example tree from before, making sure that you understand how to translate that tree into a FingerTree Char:

The translation of this tree is as follows:


In [8]:
layer3 :: FingerTree a
layer3 = Empty

layer2 :: FingerTree (Node Char)
layer2 = Deep prefix layer3 suffix
  where
    prefix = [Branch2 'i' 's', Branch2 'i' 's']
    suffix = [Branch3 'n' 'o' 't', Branch2 'a' 't']

layer1 :: FingerTree Char
layer1 = Deep prefix layer2 suffix
  where
    prefix = ['t', 'h']
    suffix = ['r', 'e', 'e']

exampleTree :: FingerTree Char
exampleTree = layer1

exampleTree


Deep {prefix = Two 't' 'h', deeper = Deep {prefix = Two (Branch2 'i' 's') (Branch2 'i' 's'), deeper = Empty, suffix = Two (Branch3 'n' 'o' 't') (Branch2 'a' 't')}, suffix = Three 'r' 'e' 'e'}

Finger Trees as Sequences

The motivating reason behind developing our strange finger tree data structure was to have a sequence-like tree which could be accessed quickly at the front and back. Thus, in this section we implement operations that view finger trees as sequences.

Prepend and Append

Let's begin by appending an element to the front of a finger tree. Ideally, we could prepend an element simply by prepending it to the prefix of the tree. While this would work for finger trees that have one, two, or three elements in their prefix, it would not work on a finger tree that has four elements in its prefix. In that case, we would be unable to add one more element to the prefix, because the prefix cannot have a length greater than four. To avoid a prefix of length five, we instead take three of these five elements, turn them into a Node using the Branch3 construction, and then prepend them to the deeper finger tree:


In [9]:
-- Use <| to prepend. It's the finger tree analogue of : for lists. 
infixr 5 <|
(<|) :: a -> FingerTree a -> FingerTree a

-- Base case #1: If this is an empty finger tree, make it one element.
x <| Empty = Single x

-- Base case #2: For a single tree, upgrade it to a deep one.
-- Remember that the list syntax is actually creating 'Affix a' values.
x <| Single y = Deep [x] Empty [y]

-- Recursive case: if we have a prefix with four elements, we have to
-- use the last 2 elements with the new one to create a node, and then
-- we prepend that node to the deeper finger tree which contains nodes.
x <| Deep [a, b, c, d] deeper suffix = Deep [x, a] (node <| deeper) suffix
  where
    node = Branch3 b c d
    
-- Non-recursive case: we can just prepend to the prefix.
x <| tree = tree { prefix = affixPrepend x $ prefix tree }

We can do the exact same thing for appending on the right, since we have access to the right end of the tree in the same way as the left end:


In [10]:
infixl 5 |>
(|>) :: FingerTree a -> a -> FingerTree a
Empty |> y = Single y
Single x |> y = Deep [x] Empty [y]
Deep prefix deeper [a, b, c, d] |> y = Deep prefix (deeper |> node) [d, y]
  where
    node = Branch3 a b c
tree |> y = tree { suffix = affixAppend y $ suffix tree }

We can now construct finger trees easily by appending and pre-pending elements to them:


In [11]:
empty :: FingerTree a
empty = Empty

't' <| empty |> 'x' |> 'y' |> 'z' |> 'w' |> 'm'


Deep {prefix = One 't', deeper = Single (Branch3 'x' 'y' 'z'), suffix = Two 'w' 'm'}

Although we've implemented append and prepend for finger trees, it may seem like we haven't gained much in terms of efficiency over trees, because if we get unlucky and the tree already has a lot of prefixes of length four, we may have to traverse all the way down the tree to add the elements. As a result, the worst case of any prepend or append operation is $O(\lg n)$, where $n$ is the number of elements in the list.

While the worst case hasn't gotten better, performance for the typical use case has imporoved. In most uses of prepend and append, the user will be appending or prepending many elements in a row, each time only keeping the new modified tree and discarding the old tree. To analyze this use case, assume that we are performing $m$ append or $m$ prepend operations in a row.

To analyze the asymptotic runtime of this use case, note first that all the non-recursive branches of append are constant time. If the original tree is small (Empty or Single x), or if we can immediately add the element by modifying the prefix, the append or prepend is takes $O(1)$ time. The recursive case (where the affix has length four) is the problematic one. However, when we encounter an affix of length four and want to add to it, we immediately rebalance the tree such that the affix has length two. Thus, we know for sure that the next operation that wants to add an element to that affix can do so immediately in constant time, and will not need to descend another level. From this we can deduce that no more than half the operations could possibly need to recurse down into the second layer of the finger tree; for each operation that does recurse, there must be at least one operation that doesn't. Since the same logic applies to the finger tree at the second layer, we know that only one quarter of operations could possibly go down to the third layer. Continuing with the same logic, the $n$th layer of the finger tree could only be visited by one out of every $2^{n-1}$ operations. Thus, the total time $T$ for all $m$ of the append or prepend operations is at worst going to be

$$T = m + \frac{1}{2}m + \frac{1}{4}m + \frac{1}{8}m + \cdots,$$

because $m$ operations do something at the first level of the tree, $\frac{1}{2}m$ operations do something at the second level of the tree, and so on. However, even if we assume there are an infinite number of layers (and clearly there are less), this series of terms sums to $2m$ (which you can compute using the formula for the sum of a geometric series). Thus, we take $O(m)$ time for $m$ operations, so while the worst case for a single operations is $O(\lg n)$ with $n$ elements in the tree, the amortized time for this use case is just $O(1)$ for each prepend or append.

Views (First and Last)

In the previous section, we implemented an append (|>) and a prepend (<|) operation to add elements to the start or end of our finger-tree-based sequence. However, in addition to adding elements, we need to be able to look at them and remove them. Both of these operations will be based on a more fundamental view operation, which we implement next.

The view operation has two versions: a left view viewl and a right view viewr. Each of these takes one element off the end of the finger tree (left and right end, respectively) and returns that element along with a finger tree representing the rest of the elements. To make this clearer, an equivalent of viewl for a list would be


In [12]:
-- We return our split values wrapped in `Maybe`,
-- because if the list or finger tree is empty, a split is impossible.
listViewL :: [a] -> Maybe (a, [a])
listViewL [] = Nothing
listViewL (x:xs) = Just (x, xs)

A naive implementation of viewl for finger trees might look as follows:


In [13]:
-- For convenience and clarity, construct a view data
-- structure instead of using Maybe (a, FingerTree a).
data View a = Nil | View a (FingerTree a)
  deriving Show

viewl :: FingerTree a -> View a
viewl Empty = Nil                -- Empty sequences can't be viewed.
viewl (Single x) = View x Empty  -- The remainder is empty.
viewl (Deep prefix deeper suffix) = 
  View first $ Deep (fromList rest) deeper suffix
  where
    -- We know that the prefix has at least one element,
    -- so this pattern will always match.
    first:rest = toList prefix

We can even test that this implementation works for an empty tree and for the example tree we devised before:


In [14]:
viewl empty


Nil

In [15]:
viewl exampleTree


View 't' (Deep {prefix = One 'h', deeper = Deep {prefix = Two (Branch2 'i' 's') (Branch2 'i' 's'), deeper = Empty, suffix = Two (Branch3 'n' 'o' 't') (Branch2 'a' 't')}, suffix = Three 'r' 'e' 'e'})

While it may seem that it works, this implementation actually has a very serious flaw. Can you spot it?

The following code block demonstrates this issue:


In [16]:
let View _ rest = viewl exampleTree
viewl rest


Affix must have one to four elements

When we wrote the case of viewl that dealt with Deep constructors, we simply took an element off the left prefix. While we know this works and this will indeed yield the first element, the finger tree that contains the rest of the elements may not be valid. In the block above, we tried to use viewl to create a finger tree that contained zero elements in its prefix, which of course is illegal and immediately raised an error.

In order to handle this case, we have to explicitly check for the number of elements in the finger tree prefix. Then, if there is only one element, we cannot remove it; instead, we must use viewl on the deeper finger tree to get a Node a. This Node a will contain two or three more values, so we can remove the single element in the prefix and instead replace the prefix with the contents of the Node a, thus maintaining the invariant that every affix has between one and four elements. The following code implements viewl properly, reusing the same View a data structure from before:


In [17]:
-- The simple cases are identical to our previous definiton.
viewl :: FingerTree a -> View a
viewl Empty = Nil                -- Empty sequences can't be viewed.
viewl (Single x) = View x Empty  -- The remainder is empty.

-- Handling the Deep case is somewhat tricky.
-- When the prefix is has only one element, 
-- there are several edge cases we must handle.
viewl (Deep [x] deeper suffix) = View x rest
  where
    rest =
      -- Compute what the remainder of the finger tree is.
      case viewl deeper of
        -- If we can get a node from the deeper finger tree...
        View node rest' ->
          -- Promote the node to the prefix.
          Deep (fromList $ toList node) rest' suffix
        
        -- If there are no more nodes in the deeper finger tree,
        -- the remainder is the elements of the suffix.
        -- We must restructure them into a finger tree.
        Nil -> case suffix of
          [x] -> Single x
          [x, y] -> Deep [x] Empty [y]
          
          -- In the next two cases, the choice to put all but
          -- one element on the left is arbitrary. The only
          -- constraint is that each side have at least one element.
          [x, y, z] -> Deep [x, y] Empty [z]
          [x, y, z, w] -> Deep [x, y, z] Empty [w]
          
-- Finally, we have the simple Deep case, where 
-- we can just chop an element off the prefix.
viewl (Deep prefix deeper suffix) =
  View first $ Deep (fromList rest) deeper suffix
  where
    first:rest = toList prefix

With this new implementation of viewl, our failing test from before works fine:


In [18]:
let View _ rest = viewl exampleTree
viewl rest


View 'h' (Deep {prefix = Two 'i' 's', deeper = Deep {prefix = One (Branch2 'i' 's'), deeper = Empty, suffix = Two (Branch3 'n' 'o' 't') (Branch2 'a' 't')}, suffix = Three 'r' 'e' 'e'})

The right equivalent of viewl, viewr, is implemented in almost exactly the same way, substituting uses of the prefix for the suffix and vice versa:


In [19]:
viewr :: FingerTree a -> View a
viewr Empty = Nil
viewr (Single x) = View x Empty
viewr (Deep prefix deeper [x]) = View x rest
  where
    rest =
      case viewr deeper of
        -- Promote a node to the suffix if we can.
        View node rest' ->
          Deep prefix rest' (fromList $ toList node)
        
        -- Convert the prefix to a tree if no more nodes
        -- exist in the deeper finger tree.
        Nil -> case prefix of
          [x] -> Single x
          [x, y] -> Deep [x] Empty [y]
          [x, y, z] -> Deep [x] Empty [y, z]
          [x, y, z, w] -> Deep [x] Empty [y, z, w]
viewr (Deep prefix deeper suffix) =
  View suffixLast $ Deep prefix deeper (fromList suffixInit)
  where
    suffixLast = last $ toList suffix
    suffixInit = init $ toList suffix

We use it just like we use viewl, and it gives us access to the end of the sequence:


In [20]:
viewr exampleTree


View 'e' (Deep {prefix = Two 't' 'h', deeper = Deep {prefix = Two (Branch2 'i' 's') (Branch2 'i' 's'), deeper = Empty, suffix = Two (Branch3 'n' 'o' 't') (Branch2 'a' 't')}, suffix = Two 'r' 'e'})

Since we now have our view primitives, we can easily implement a few other functions, such as the finger tree equivalents of head, tail, last, init, and null:


In [21]:
treeHead :: FingerTree a -> a
treeHead tree = case viewl tree of
  Nil -> error "no elements in tree"
  View x _ -> x
  
treeTail :: FingerTree a -> FingerTree a
treeTail tree = case viewl tree of
  Nil -> error "no elements in tree"
  View _ xs -> xs

treeLast :: FingerTree a -> a
treeLast tree = case viewr tree of
  Nil -> error "no elements in tree"
  View x _ -> x
  
treeInit :: FingerTree a -> FingerTree a
treeInit tree = case viewr tree of
  Nil -> error "no elements in tree"
  View _ xs -> xs
  
isEmpty :: FingerTree a -> Bool
isEmpty tree = case viewl tree of
  Nil -> True
  _ -> False

In particular, we can now easily convert between lists and finger trees:


In [22]:
-- Let affixes be treated as lists.
instance IsList (FingerTree a) where
  type Item (FingerTree a) = a
  
  toList tree = case viewl tree of
    Nil -> []
    View x xs -> x : toList xs

  fromList = foldr (<|) Empty

Using finger trees is now even simpler:


In [23]:
[1..6] :: FingerTree Int


Deep {prefix = Two 1 2, deeper = Single (Branch3 3 4 5), suffix = One 6}

Concatenation

Another operation we can easily implement using the finger tree data structure is concatenation. The operations we currently have are enough to implement simple concatenation, since we can recursively view and then append elements. A very simple implementation of concatentation follows:


In [24]:
-- Concatenation is done using infix >< operator.
(><) :: FingerTree a -> FingerTree a -> FingerTree a
left >< Empty = left
left >< right =
  let View first rest = viewl right in
    (left |> first) >< rest

Although this implementation works fine (as you can verify by looking at the value of something like exampleTree >< exampleTree), it's fairly slow. In terms of asymptotic runtime, it's the same as using toList to get a list of the finger tree elements, concatenating the lists, and then using fromList to convert back to a finger tree. We've shown that |> takes amortized $O(1)$ time, but we must do that $O(m)$ times, where $m$ is the number of elements in the right tree passed to ><. Thus, the total running time is $O(m)$ – it's linear in the number of elements we're appending.

It turns out we can do much better by utilizing the structure of the finger tree. Before doing this, though, we're going to need a helper function called nodes, which can convert from a list of items to a list of Nodes of items:


In [25]:
nodes :: [a] -> [Node a]
nodes xs = case xs of
  [] ->  error "not enough elements for nodes"
  [x] -> error "not enough elements for nodes"
  [x, y] -> [Branch2 x y]
  [x, y, z] -> [Branch3 x y z]
  x:y:rest -> Branch2 x y : nodes rest

For every two elements in the original list, nodes will output only one element in the new list of nodes. In order to accommodate odd numbers of elements, nodes will emit a Branch3 when it is left with a triple. As a result, we know for sure that if nodes is given a list of $n$ elements, it will emit a list of $\lfloor \frac{n}{2} \rfloor$ nodes. This will be important later on.

Next, we're going to redefine concatenation in terms of a somewhat strange operator we'll call concatWithMiddle. concatWithMiddle takes two FingerTree a values to concat, as well as a list of elements to stick between the two trees. Implementing >< with concatWithMiddle is trivial – we just pass an empty list as the extra elements:


In [26]:
(><) :: FingerTree a -> FingerTree a -> FingerTree a
left >< right = concatWithMiddle left [] right

concatWithMiddle :: FingerTree a -> [a] -> FingerTree a -> FingerTree a
concatWithMiddle = unimplemented
  where unimplemented = error "Soon to come!"

The only thing remaining to implement is concatWithMiddle. We need a few special cases to deal with the Empty and Single constructors; in these cases, concatenation simply reduces to $O(1)$ appends. We handle the list of extra elements in the middle by also using several appends or prepends.

In addition to the edge cases, we must handle the common case in which both trees are created with the Deep constructor. When this is the case, we also return a Deep constructor with:

  • prefix equal to the prefix of the left tree
  • suffix equal to the suffix of the right tree
  • deeper (the next finger tree) equal to a recursive call to concatWithMiddle

We also must handle the suffix of the left tree and prefix of the right tree. These can be combined with the middle elements and passed to concatWithMiddle. Since the deeper finger tree stores Node a values instead of a values, we use our helper function nodes to create a list of Nodes we can pass to the recursive concatWithMiddle call. This may be somewhat confusing, and should be elucidated by reading the code:


In [27]:
concatWithMiddle :: FingerTree a -> [a] -> FingerTree a -> FingerTree a

-- Base cases: just use prepending or appending.
concatWithMiddle Empty       []    right = right
concatWithMiddle Empty      (x:xs) right = x <| concatWithMiddle Empty xs right
concatWithMiddle (Single y)  xs    right = y <| concatWithMiddle Empty xs right

concatWithMiddle left  [] Empty = left
concatWithMiddle left  xs Empty = concatWithMiddle left (init xs) Empty |> last xs
concatWithMiddle left  xs (Single y) = concatWithMiddle left xs Empty |> y

-- Recursive case: both trees are deep.
concatWithMiddle left mid right = 
  Deep (prefix left) deeper' (suffix right)
  where
    -- Use concatWithMiddle recursively to generate the next level.
    deeper' = concatWithMiddle (deeper left) mid' (deeper right)
    
    -- Get a list of elements in the left suffix, provided middle, and right prefix.
    -- Convert these into nodes before passing them to concatWithMiddle.
    mid' = nodes $ (toList $ suffix left) ++ mid ++ (toList $ prefix right)

-- Use >< for more convenient concatenation.
(><) :: FingerTree a -> FingerTree a -> FingerTree a
left >< right = concatWithMiddle left [] right

We can test that this code works as we did before, by looking at the output of something like exampleTree >< exampleTree:


In [28]:
putStrLn $ toList $ exampleTree >< exampleTree
putStrLn $ toList $ concatWithMiddle exampleTree " " exampleTree


thisisnotatreethisisnotatree
thisisnotatree thisisnotatree

While it's clear that this code is functional (no pun intended), it's not clear that we've actually done any better in terms of asymptotic runtime guarantees. If we look at the base case for concatWithMiddle, we're still doing a ton of prepends! Since every time we recurse down another layer, we add elements to the middle list (from the unused affixes), is it possible that we still have something like $O(m)$ prepends done in the base cases?

Surprisingly enough, the answer to this is no. We can prove that the base cases still take only $O(1)$ amortized time. The magic here lies in our use of nodes. As we showed when we defined nodes, nodes is guaranteed to output a list no more than half the length of the input list. Using this property, we can easily track the maximum length that the middle list can be at any point in the computation.

When the computation starts, we know that the middle list has length zero, since we pass concatWithMiddle an empty list in our definition of ><. At each step, we add two affixes (a suffix and a prefix) to the middle list before applying nodes to it. We know that the affixes have no more than four elements, so we are adding at most eight elements to the middle list. As a result, after we apply nodes, our list can have no more than eight elements, because as we add more and more elements, the length of the output of nodes can get closer and closer to eight; however, it cannot go above eight, because if we start out with less than or equal to eight elements, add eight elements, then divide the length by two, we will end up with less than or equal to eight elements again. To convince yourself, you can trace through an example execution in which you start with zero elements and add eight at each recursive step:

  • Step 0: Middle list has 0 elements.
  • Step 1: Add 8 elements (4 from suffix, 4 from prefix). nodes reduces the length by half, so middle list now has 4 elements.
  • Step 2: Add 8 elements, for a total of 12; nodes reduces length to 6.
  • Step 3: Add 8 elements, for a total of 14; nodes reduces length to 7.
  • Step 4: Add 8 elements, for a total of 15; nodes reduces length to 7.

Note how the last two steps both yielded a list of the same size – once the computation reaches that point, the middle list will not become any longer as the recursion continues. Thus, the length of the middle list is bounded by seven, which is $O(1)$ (a constant); as a result, we can confidently say that all of the base cases are also $O(1)$ amortized running time, because they do no more than eight prepends.

Since the base cases are all constant time, the main contributor to the runtime of our >< is the recursion. At each recursive step, we look at the deeper tree in both the left and right trees passed to concatWithMiddle; we reach a base case as soon as one of these trees is not created with the Deeper constructor. The depth of these trees grows logarithmically with the number of elements in them; if the finger tree has $n$ elements, it's depth is $O(\lg n)$. Since our runtime is proportional to the minimum depth of either tree, our asympotic runtime bounds are $O(\min(\lg n, \lg m)) = O(\lg(\min(m, n)))$, where $n$ and $m$ are the number of elements in the left and right trees, respectively.

Applications of Finger Trees

We've described the finger tree data structure and figured out how to use it as a sequence, at least as far as access to the front and back of the sequence are concerned. However, we have yet to figure out how to access any element of the sequence without traversing a ton of elements to get to it.

Instead of just defining a random access primitive that operates on finger trees, we will instead define a more general search operation. We'll then use our general search operation to implement random access sequences and prioritiy queues, both based on finger trees.

To implement our search operation, we will need each node of the finger tree to be marked with an annotation. To that end, we begin by redefining our finger tree data structures to store annotations at each branch:


In [29]:
-- 'v' is the type of the annotation.
data Node v a = Branch3 v a a a
              | Branch2 v a a
              deriving Show
            
data FingerTree v a 
  = Empty
  | Single a
  | Deep {
    annotation :: v, -- Add an annotation to each branch.
    prefix :: Affix a,
    deeper :: FingerTree v (Node v a),
    suffix :: Affix a
  }
  deriving Show

We require that these annotations are monoidal; that is, that the type v is a member of the Monoid typeclass. Recall that a monoid is something that has an associative append operation (<>) with an identity (empty). This is embodied in the following typeclass, which is slightly different from the Monoid typeclass that ships in the Haskell base library:


In [30]:
class Monoid m where
  -- Called 'mempty' in the Haskell base library.
  empty :: m
  
  -- Called 'mappend' in the Haskell base library.
  (<>) :: m -> m -> m

We also require that the annotations are not arbitrary annotations, but are actually related to the values in the tree. The annotations must be measures of elements of the tree. More precisely, there must be a measure function that accepts an element of the tree and outputs an annotation for that element. To create that function, we must implement the following Measured typeclass for our element type and annotation type:


In [31]:
:set -XMultiParamTypeClasses

-- The output of the measure must be a monoid.
class Monoid v => Measured a v where
  measure :: a -> v

We can implement a measure for all the data types used in our finger tree – FingerTree, Node, and Affix. For FingerTree's Deep constructor and Node, we cache the annotations, so we just need to retrieve them when we implement measure. For the Empty and Single constructors, we must use the identity element empty and the measure function:


In [32]:
:set -XFlexibleInstances

instance Measured a v => Measured (FingerTree v a) v where
  measure Empty = empty
  measure (Single x) = measure x
  measure tree = annotation tree

instance Measured a v => Measured (Node v a) v where
  measure (Branch2 v _ _) = v
  measure (Branch3 v _ _ _) = v

For Affix, we have chosen (somewhat arbitrarily) to not cache the annotations in the Affix data structure, so instead our implementation of measure computes it from the values in the affix:


In [33]:
-- Called 'mconcat' in the Haskell prelude.
concat :: Monoid m => [m] -> m
concat = foldr (<>) empty

instance Measured a v => Measured (Affix a) v where
  measure = concat . map measure . toList

The definition above is why we require that annotations be a monoid. Since the annotations form a monoid, we can easily compute annotations for branches and affixes based on the measures of the values they contain. The measure of a branch or an affix is the monoidal sum (concat) of all the measures of the values they contain.

In order to simplify our lives, we also need to provide convenience constructors for our new Node constructors and the Deep constructor. First, we implement the IsList typeclass for Node values, so we can easily create new nodes without worrying about annotations:


In [34]:
-- Our IsList instance allows us to write [x, y] to create an annotated node.
instance Measured a v => IsList (Node v a) where
  type Item (Node v a) = a
  
  toList (Branch2 _ x y) = [x, y]
  toList (Branch3 _ x y z) = [x, y, z]
  
  fromList [x, y] = 
    Branch2 (measure x <> measure y) x y
  fromList [x, y, z] = 
    Branch3 (measure x <> measure y <> measure z) x y z
  fromList _ = error "Node must contain two or three elements"

Next, we provide a convenience constructor for trees made with the Deep constructor. This constructor takes care of setting the annotation, and thus has a Measured constraint. However, this constructor also differs from Deep in that it allows the prefixes to be empty, which will greatly simplify our code later. In order to use the constructor, we're going to have to change a lot of our older code to handle the new FingerTree v a type; in the following code block, pay attention to deep and the functions that it uses, but ignore the reimplementations of View, viewr, and viewl – they are just the same code you saw earlier with a little bit more logic to handle the annotations:


In [35]:
-- Convert an affix into an entire tree, doing rebalancing if necessary.
affixToTree :: Measured a v => Affix a -> FingerTree v a
affixToTree affix = case affix of
  [x] ->          Single x
  [x, y] ->       Deep (measure affix) [x] Empty [y]
  [x, y, z] ->    Deep (measure affix) [x] Empty [y, z]
  [x, y, z, w] -> Deep (measure affix) [x, y] Empty [z, w]
  
-- The `deep` function creates `Deep` finger trees.
deep :: Measured a v => [a] -> FingerTree v (Node v a) -> [a] -> FingerTree v a
deep prefix deeper suffix = case (prefix, suffix) of
  ([], []) -> case viewl deeper of
    Nil -> Empty
    View node deeper' -> deep (toList node) deeper' []
  ([], _)  -> case viewr deeper of
    Nil -> affixToTree $ fromList suffix
    View node deeper' -> deep (toList node) deeper' suffix
  (_, [])  -> case viewr deeper of
    Nil -> affixToTree $ fromList prefix
    View node deeper' -> deep prefix deeper' (toList node)
    
  _ -> if length prefix > 4 || length suffix > 4
      then error "Affixes cannot be longer than 4 elements"
      else Deep annotation (fromList prefix) deeper (fromList suffix)
  where
    annotation =  concat (map measure prefix) <> measure deeper <> concat (map measure suffix)

-- We must redefine `viewl` and `viewr`, since we have changed our FingerTree data type.
-- All that follows you have already seen  it is simply shorter and less well-commented.
data View v a = Nil | View a (FingerTree v a) deriving Show
       
viewr :: Measured a v => FingerTree v a -> View v a
viewr Empty = Nil
viewr (Single x) = View x Empty
viewr (Deep _ prefix deeper [x]) = View x $
  case viewr deeper of
    View node rest' ->
      let suff = fromList $ toList node
          annot = measure prefix <> measure rest' <> measure suff in
      Deep annot prefix rest' suff
    Nil -> affixToTree prefix
viewr (Deep _ prefix deeper suffix) =
  View suffixLast $ Deep annot prefix deeper suffixInit
  where
    annot = measure prefix <> measure deeper <> measure  suffixInit
    suffixLast = last $ toList suffix
    suffixInit = fromList $ init $ toList suffix
    
viewl :: Measured a v => FingerTree v a -> View v a
viewl Empty = Nil
viewl (Single x) = View x Empty
viewl (Deep _ [x] deeper suffix) = View x $ case viewl deeper of
        View node rest' ->
          let pref = fromList $ toList node
              annot = measure pref <> measure rest' <> measure suffix in
          Deep annot pref rest' suffix
        Nil -> affixToTree suffix
viewl (Deep _ prefix deeper suffix) =
  View first $ Deep annot prefix' deeper suffix
  where
    first:rest = toList prefix
    prefix' = fromList rest
    annot = measure prefix' <> measure deeper <> measure suffix

We've gone through a whole lot of setup without anything interesting; however, at this point, we're finally prepared to work on our search algorithm, which we will later use to implement random access into our finger trees (as well as other things). Our search will accept a predicate (v -> Bool) that operates on our monoidal annotations (v). The predicate (let's call it pred) must satisfy a few properties:

  • pred empty == False: The predicate must return False on the monoidal identity element.
  • If pred x == True, then pred (x <> y) must also be True, regardless of y. This means that pred is monotonically increasing, and adding more elements to the monoidal sum must not make it false.

The search will scan through our finger tree, adding up the annotations of all the elements as it goes. It will check whether each of the sums satisfies our predicate pred. The search will find and return the location in the finger tree sequence where pred switches from being False to True; if no such place exists, the search will fail.

The goal of our search is depicted in the following graphic from the paper by Hinze and Patterson:

In the graphic above, $v_x$ is the sum of annotations for elements $0$ through $x$, which is why the $v_x$ values appear on the space between the elements. The very first value, $v_0$, is the monoidal identity element empty, depicted there as $i$. The search locates the element $x_i$ such that pred applied to $v_{i-1}$ is False and pred applied to $v_i$ is True.

For example, the following function splitList implements this search algorithm on simple lists, returning a tuple where the first element contains $x_0$ through $x_{i-1}$, and the second element contains $x_i$ and all later elements:


In [36]:
splitList :: Measured a v 
          => (v -> Bool) -- Monotonic predicate on annotations.
          -> v           -- Left-most annotation.
          -> [a]         -- List of measurable values.
          -> ([a], [a])
splitList pred start [] = error "Split point not found"
splitList pred start (x:xs)
  -- Base case of recursion: we found the split point.
  | pred start' = ([], x:xs)
  
  -- If not a split point, keep looking...
  | otherwise =
    let (before, after) = splitList pred start' xs in
      (x : before, after)
  where
    -- The new left-most annotation value after including this element.
    start' = start <> measure x

For lists, the implementation of splitList is fairly straightforward. The implementation for finger trees, which we will call split, shares the same idea, but ends up being somewhat more convoluted to implement. We define a custom Split data structure to store the split location that our search found; our upcoming split function will return a Split as its result. In this Split data structure, the left and right parts of the sequence are stored as finger trees, and the element $x_i$ (which caused pred to switch) is stored directly:


In [37]:
data Split v a = Split (FingerTree v a) a (FingerTree v a) deriving Show

Finally, we can implement split. split is the workhorse of our search. Given a subsequence (passed in as a FingerTree v a) and the annotation at the start of the subsequence, split returns a Split indicating where the predicate switches. Of course, split assumes that the predicate applied to the left value is False – if not, then the search is pointless, as the predicate should return true for all points in the subsequence.


In [38]:
split :: Measured a v 
      => (v -> Bool)     -- Monotonic predicate on annotations.
      -> v               -- Annotation on the left end of the subsequence.
      -> FingerTree v a  -- Subsequence to search within.
      -> Split v a

-- An empty finger tree cannot have a split, since there
-- are no elements whose annotations we 
-- can add to the monoidal value we are given.
split _ _ Empty = error "Split point not found"

-- For a single element, we must check whether or not its
-- annotation makes the predicate true.
split pred start (Single x)
  | pred (start <> measure x) = Split Empty x Empty
  | otherwise = error "Split point not found"
  
-- For the deeper case, we must do several checks:
-- Up to one for each prefix and for the deeper tree.
split pred start (Deep total pref deeper suff)
  -- Make sure a split point exists.
  | not (pred $ start <> total) = error "Split point not found"
  
  -- The split point is in the prefix.
  | pred startPref = 
    -- Treat the prefix as a list and find where the split point is.
    let (before, x:after) = splitList pred start prefix in
      -- Convert the pre-split part of the prefix to a tree.
      Split (chunkToTree before) x (deep after deeper suffix)
  
  -- The split point is in the deeper tree.
  | pred (start <> measure pref <> measure deeper) =
    -- Find the split point in the deeper tree.
    -- The split point is not as fine-grained as we want, as it works on Node v a,
    -- instead of just values of type a.
    let Split before node after = split pred startPref deeper
        start' = start <> measure pref <> measure before
        
        -- Convert the node at the split point into a list, and search for the
        -- real split point within that list.
        (beforeNode, x:afterNode) = splitList pred start' $ toList node in
        
      -- Finally, combine all the pieces back into two trees.
      Split (deep prefix before beforeNode) x (deep afterNode after suffix)
  
  -- Otherwise, the split point is in the suffix.
  | otherwise = 
    let start' = startPref <> measure deeper
        (before, x:after) = splitList pred start' suffix in
      -- Recall that the deep constructor was designed to handle
      -- potentially empty affixes, and takes lists as arguments.
      Split (deep prefix deeper before) x (chunkToTree after)
  
  where
    -- Convert the Affix a into [a], so we can use splitList.
    prefix = toList pref
    suffix = toList suff
    
    startPref = start <> measure pref
    
    -- Convert a small list into a tree.
    chunkToTree [] = Empty
    chunkToTree xs = affixToTree $ fromList xs

If you look carefully at the definition of split, you'll note that it does a constant amount of work at each step. (splitList is a constant amount of work, because we only pass it lists made of nodes and affixes, which cannot exceed four elements in size.) Each step also recurses deeper if it needs to (if the split is in the deeper tree and not in an affix). Thus, in the worst case, we'll do $O(1)$ work for each of the layers of the finger tree; since there are $O(\lg n)$ layers in the finger tree, the split operation has worst case runtime bounds of $O(\lg n)$.

With that, we've completed split and implemented the bulk of the functionality necessary to use finger trees as random access sequences. In the next section, we'll look at exactly how we can use these monoidal annotations to do random access.

Random-Access Sequences

We're prepared to get to the meat of our random access algorithm. In order to implement random-access trees, we're going to annotate each subtree with the number of elements it contains. To achieve this, we just need to annotate each leaf with the value 1 and use summation as monoidal addition. Since our finger trees automatically take care of their own annotations, all we need to do is specify the types the finger tree stores, the measure of those types, and how to combine subtree sizes (just addition):


In [39]:
:set -XGeneralizedNewtypeDeriving

-- Monoidal size  all leaves have Size 1.
newtype Size = Size Int deriving (Show, Eq, Ord)

-- Storage for our values.
newtype Value a = Value a deriving Show

-- Sizes just add normally.
instance Monoid Size where
  empty = Size 0
  Size x <> Size y = Size $ x + y
  
-- All values just have size one.
instance Measured (Value a) Size where
  measure _ = Size 1

Using the types and instances above, leaves of our finger tree are annotated with the value one. Intermediate nodes are annotated with the size of their subtree. In order to find the $n$th node in our sequence, we can look for the place where the sum of the annotations becomes greater than $n$. For example, if we search for the place where the annotations become greater than five, the split point we find will be at the sixth element, because the sixth element is what makes the annotations become greater than five. In a zero-indexed sequence, five is indeed the index of the sixth element!

Thus, the implementation of random access sequences requires a very simple (!) operator, which is just a thin wrapper around split:


In [40]:
-- A wrapper around our finger tree which hides the fact that
-- we're using `Size` and `Value` to guide typeclass inference.
newtype Seq a = Seq (FingerTree Size (Value a))

-- Random-access indexing.
(!) :: Seq a -> Int -> a
Seq tree ! idx = val
  where
    -- We unwrap the Split and the Value to get the actual
    -- value at the index we're accessing.
    Split _ (Value val) _ = split (> Size idx) (Size 0) tree

Let's create an example sequence to test our algorithm on:


In [41]:
layer3 :: FingerTree v a
layer3 = Empty

mkBranch :: [a] -> Node Size (Value a)
mkBranch = fromList . map Value

layer2 :: FingerTree Size (Node Size (Value Char))
layer2 = deep prefix layer3 suffix
  where
    prefix = [mkBranch "is", mkBranch "is"]
    suffix = [mkBranch "not", mkBranch "at"]

layer1 :: FingerTree Size (Value Char)
layer1 = deep prefix layer2 suffix
  where
    prefix = [Value 't', Value 'h']
    suffix = [Value 'r', Value 'e', Value 'e']

exampleSeq :: Seq Char
exampleSeq = Seq layer1

We can test our indexing works by attempting to index into the sequence using each of the possible indices. We should recover the list of elements in the tree:


In [42]:
print $ map (exampleSeq !) [0..13]


"thisisnotatree"

To use this in a serious library, you would want to wrap this in another layer which checks that the index is non-negative and in bounds, and only perform the search if it is, return a Nothing on failure and a Just result on success. In the current implementation, we ignore failure, and if we try to access an element that doesn't exist, the search crashes with an exception that would be rather confusing to the end user:


In [43]:
exampleSeq ! 14


Split point not found

Priority Queues

In addition to random-access sequences, we can easily use the same data structure and the same search algorithm for implementing efficient functional priority queues. We will assume that a priority queue is a data structure PriorityQueue a with the two functions push :: PriorityQueue a -> a -> Int -> PriorityQueue a (which pushes a value of a given integer priority onto the queue) and pop :: PriorityQueue a -> (a, PriorityQueue a) (which takes the maximum priority element, removes it from the priority queue, and returns a tuple with the element and the new tree).

In order to implement our priority queue, we must just choose a different monoid. Instead of our finger trees storing Values and being annotated with Sizes, they will store Prioritized items and be annotated with Prioritys:


In [44]:
-- The finger tree will store items along with their priorities.
data Prioritized a = Prioritized {
    priority :: Int,
    item :: a
  }

-- In order for priorities to be a monoid, it must have
-- an identity element. For that we use NegativeInfinity.
data Priority = NegativeInfinity | Priority Int deriving Eq

We must then implement the Measured typeclass, which in turn requires us to implement Monoid for our Priority type. As we will see, our monoid cannot operate on integers alone – it will need a minimum priority, which we call NegativeInfinity:


In [45]:
-- Return the maximum of two priorities.
-- NegativeInfinity has lower priority than anything else.
maxPriority NegativeInfinity x = x
maxPriority x NegativeInfinity = x
maxPriority (Priority x) (Priority y) = Priority $ max x y

instance Monoid Priority where
  -- Priority is a monoid, where we combine priorities
  -- by taking the maximum of them.
  (<>) = maxPriority

  -- Since NegativeInfinity combined with any value x
  -- is just x, NegativeInfinity is the identity.
  empty = NegativeInfinity

As with our random-access sequences, the Measured typeclass is pretty simple to implement. In this case, the measure of any Prioritized item is simply a Priority representing its priority:


In [46]:
instance Measured (Prioritized a) Priority where
  measure = Priority . priority

With these instances, we can define a priority queue data structure as a finger tree:


In [47]:
newtype PriorityQueue a = PriorityQueue (FingerTree Priority (Prioritized a))

Implementing push is easy: just add an element to the sequence. It doesn't matter how you add it, so we'll just use a prepend:


In [48]:
push :: PriorityQueue a -> a -> Int -> PriorityQueue a
push (PriorityQueue tree) x priority = 
  PriorityQueue $ Prioritized priority x <| tree
  
-- We need to redefine <| to operate on our new annotated finger trees.
(<|) :: Measured a v => a -> FingerTree v a -> FingerTree v a
x <| Empty = Single x
x <| Single y = deep [x] Empty [y]
x <| Deep annot prefix deeper suffix = case prefix of
  [a, b, c, d] -> Deep annot' [x, a] ([b, c, d] <| deeper) suffix
  prefix -> Deep annot' (affixPrepend x prefix) deeper suffix
  where
    annot' = measure x <> annot

In order to implement pop, we'll need to use our Monoid instance, along with our split routine. Since our monoid instance combines priorities by choosing the largest one, each subtree will be annotated with the largest priority it contains. Thus, to find the maximum priority p in the entire tree, we can just measure the tree itself, since it will be annotated with the largest priority it contains. Then, to find an item of a priority p, we can just search for where the predicate == Priority p becomes true.

Recall that we had two requirements on our predicate: first, it must be false on our identity element empty, and second, it must be monotonic – once it is satisfied, it will remain satisfied if we add in all the other elements of the sequence. Both of these properties hold in this case. Since empty is defined to be NegativeInfinity, we know that checking for equality with some priority will return false. The second property is true by virtue of the fact that the priority we're searching for, p, is known to be the maximum priority that exists in the tree; thus, no matter how many elements we add to the monoidal sum, we know the result will just be Priority p, because the monoidal sum picks out the largest priority (which we know is p).

Thus, we can implement pop as follows:


In [49]:
pop :: PriorityQueue a -> (a, PriorityQueue a)
pop (PriorityQueue queue) = (element, PriorityQueue queue')
  where
    -- Find the maximum priority in the entire tree.
    maxPriority = measure queue
    
    -- Split the tree (find the max priority element).
    result = split (== maxPriority) empty queue
    
    -- Pick out the element from the split. Discard
    -- its priority, we only care about its value.
    Split left (Prioritized _ element) right = result
    
    -- Combine the elements we didn't use back into a tree.
    queue' = left >< right
    
-- We must reimplement >< with our new annotated finger trees.
-- For brevity, we use an inefficient concatenation function.
(><) :: Measured a v => FingerTree v a -> FingerTree v a -> FingerTree v a
left >< right = case viewr left of
  Nil -> right
  View x left' -> left' >< (x <| right)

Let's now test our priority queue. We'll add in several strings prioritized by their length, and verify that our priority queue will return the longest ones first:


In [50]:
emptyQueue :: PriorityQueue String
emptyQueue = PriorityQueue Empty

strings :: [String]
strings = ["Goodbye", "one", "Hello", "a"]

-- Create a queue by putting in each of the strings.
queue = foldr addToQueue emptyQueue strings
  where addToQueue str queue = push queue str (length str)

let (longest, queue') = pop queue
putStrLn longest -- Goodbye

let (longest, queue'') = pop queue'
putStrLn longest -- Hello

let (longest, queue''') = pop queue''
putStrLn longest -- one

let (longest, _) = pop queue'''
putStrLn longest -- a


Goodbye
Hello
one
a

Conclusion

Finger trees, as described by Hinze and Patterson, are a pretty awesome data structure. They provide amortized constant time append and prepend (assuming a use case of repeated appends and prepends), amortized constant time left and right views, and logarithmic time concatenation. They can be parameterized by a monoidal annotation; then, given a monotonic boolean predicate on the monoidal annotations, a search can be performed in logarithmic time to determine which element (if any) tipped the scales and caused the incremental monoidal sum along the sequence to pass the predicate. This very general search algorithm allows very high code reuse – by changing the type stored by the finger tree and adding two typeclass instances, finger trees can be used as very different data structures. In this guide, we used finger trees to implement random-access functional sequences and priority queues with push and pop. In the original paper, they also describe several other data structures and operations, including ordered sequences (with access and insert) and interval trees. Due to the efficiency and asymptotic guarantees provided by finger trees, they are the basis for the sequences provided in the Haskell base library under the Data.Sequence module.

This guide is written as an IHaskell notebook. If you would like to work with it interactively, you may download it as a ntoebook.