module SP where
import ShowFun() -- show instance for function types

data SP a b = PutSP b (SP a b) |
              GetSP (a -> SP a b) |
              NullSP 
          deriving (Int -> SP a b -> ShowS
[SP a b] -> ShowS
SP a b -> String
(Int -> SP a b -> ShowS)
-> (SP a b -> String) -> ([SP a b] -> ShowS) -> Show (SP a b)
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
forall a b. Show b => Int -> SP a b -> ShowS
forall a b. Show b => [SP a b] -> ShowS
forall a b. Show b => SP a b -> String
showList :: [SP a b] -> ShowS
$cshowList :: forall a b. Show b => [SP a b] -> ShowS
show :: SP a b -> String
$cshow :: forall a b. Show b => SP a b -> String
showsPrec :: Int -> SP a b -> ShowS
$cshowsPrec :: forall a b. Show b => Int -> SP a b -> ShowS
Show)