Skip to content
GitLab
Projects
Groups
Snippets
/
Help
Help
Support
Community forum
Keyboard shortcuts
?
Submit feedback
Sign in / Register
Toggle navigation
Menu
Open sidebar
Glasgow Haskell Compiler
GHC
Commits
28207fb3
Commit
28207fb3
authored
May 27, 2013
by
Simon Peyton Jones
Browse files
Explicit kinds in :info command ===> testsuite wibbles
parent
302b38bd
Changes
3
Hide whitespace changes
Inline
Side-by-side
testsuite/tests/ghci/scripts/T7627.stdout
View file @
28207fb3
...
...
@@ -18,7 +18,8 @@ instance Functor ((,) a) -- Defined in ‛GHC.Base’
instance (Ord a, Ord b) => Ord (a, b) -- Defined in ‛GHC.Classes’
instance (Read a, Read b) => Read (a, b) -- Defined in ‛GHC.Read’
instance (Show a, Show b) => Show (a, b) -- Defined in ‛GHC.Show’
data (#,#) a b = (#,#) a b -- Defined in ‛GHC.Prim’
data (#,#) (a :: OpenKind) (b :: OpenKind) = (#,#) a b
-- Defined in ‛GHC.Prim’
(,) :: a -> b -> (a, b)
(#,#) :: a -> b -> (# a, b #)
( , ) :: a -> b -> (a, b)
...
...
testsuite/tests/ghci/scripts/ghci025.stdout
View file @
28207fb3
...
...
@@ -14,7 +14,7 @@ c2 :: (C a b, N b, S b) => a -> b
c3 :: C a b => forall a1. a1 -> b
c4 :: C a b => forall a1. a1 -> b
-- imported via Control.Monad
class Monad m => MonadPlus
m
where
class Monad m => MonadPlus
(m :: * -> *)
where
mzero :: m a
mplus :: m a -> m a -> m a
mplus :: MonadPlus m => forall a. m a -> m a -> m a
...
...
@@ -25,7 +25,7 @@ mzero :: MonadPlus m => forall a. m a
fail :: Monad m => forall a. GHC.Base.String -> m a
return :: Monad m => forall a. a -> m a
-- imported via Control.Monad, Prelude, T
class Monad
m
where
class Monad
(m :: * -> *)
where
(>>=) :: m a -> (a -> m b) -> m b
(>>) :: m a -> m b -> m b
return :: a -> m a
...
...
testsuite/tests/ghci/scripts/ghci027.stdout
View file @
28207fb3
class GHC.Base.Monad m => Control.Monad.MonadPlus m where
...
mplus :: m a -> m a -> m a
class GHC.Base.Monad m => Control.Monad.MonadPlus m where
...
Control.Monad.mplus :: m a -> m a -> m a
class GHC.Base.Monad m =>
Control.Monad.MonadPlus (m :: * -> *) where
...
mplus :: m a -> m a -> m a
class GHC.Base.Monad m =>
Control.Monad.MonadPlus (m :: * -> *) where
...
Control.Monad.mplus :: m a -> m a -> m a
Write
Preview
Supports
Markdown
0%
Try again
or
attach a new file
.
Cancel
You are about to add
0
people
to the discussion. Proceed with caution.
Finish editing this message first!
Cancel
Please
register
or
sign in
to comment