Skip to content
Snippets Groups Projects

Adapt to Bifunctor gaining a quantified superclass in more libraries

Merged Ryan Scott requested to merge more-bifunctors into master
9 files
+ 137
739
Compare changes
  • Side-by-side
  • Inline
Files
9
+ 19
0
diff --git a/Data/Forest/StructuredPaired.hs b/Data/Forest/StructuredPaired.hs
index ac23221..793f902 100644
--- a/Data/Forest/StructuredPaired.hs
+++ b/Data/Forest/StructuredPaired.hs
@@ -1,4 +1,4 @@
-
+{-# LANGUAGE DeriveFunctor #-}
-- | A semi-specialized forest structure with the following atomic elements:
-- (i) unstructured regions of type @a@, (ii) binary paired regions of type
-- @(b,b)@ with a recursing tree (or insertion between the two @b@'s), (iii)
@@ -32,7 +32,7 @@ data SPForest r t
| SPJ [SPForest r t]
-- | An empty forest. @SPJ SPE SPE `equiv` SPE@ should hold.
| SPE
- deriving (Read,Show,Eq,Ord,Generic)
+ deriving (Read,Show,Eq,Ord,Generic,Functor)
makePrisms ''SPForest
instance Bifunctor SPForest where
Loading