summaryrefslogtreecommitdiff
path: root/testsuite/tests/indexed-types/should_compile/T4160.hs
blob: f13aafa103e99f076e0b422c69cdd942bda145ab (plain)
1
2
3
4
5
6
7
8
9
10
11
12
13
14
15
16
17
18
{-# LANGUAGE FlexibleContexts, MultiParamTypeClasses, TypeFamilies #-}
module Foo where

data P f g r = f r :*: g r
type family TrieMapT (f :: * -> *) :: * -> (* -> *) -> * -> *
newtype PMap m1 (m2 :: * -> (* -> *) -> * -> *) k (a :: * -> *) ix = PMap (m1 k (m2 k a) ix)
type instance TrieMapT (P f g) = PMap (TrieMapT f) (TrieMapT g)

class TrieKeyT f m where
	unionT :: (TrieMapT f ~ m) => (f k -> a ix -> a ix -> a ix) ->
		m k a ix -> m k a ix -> m k a ix
	sizeT :: (TrieMapT f ~ m) => m k a ix -> Int

instance (TrieKeyT f m1, TrieKeyT g m2) => TrieKeyT (P f g) (PMap m1 m2) where
	unionT f (PMap m1) (PMap m2) = PMap (uT  (\ a -> unionT (\ b -> f (a :*: b))) m1 m2)
		where uT = unionT
        sizeT = error "urk"