On Mar 8, 2011, at 12:25 AM, Max Bolingbroke wrote:
> Your tutorial is a 404 for me.
Yikes! So sorry. Should be fixed now. When compiled, you should get the
output shown below (if not, make sure you have the latest copy of the git repo
and base package).
I'll have only intermittent access to email the next 48 hours, but will reply
to any questions/comments/bug-reports Thursday evening.
- a
[1 of 1] Compiling GArrowsTutorial ( ../tutorial.hs, ../tutorial.o )
TYPE SIGNATURES
accept :: forall s. Stream s => Regex -> (s -> Bool) -> s -> Bool
back :: forall a b c. (<[b]>@a -> <[c]>@a) -> <[b -> c]>@a
close :: forall a. (forall b. <[a]>@b) -> ClosedCode a
code_fst :: forall a b g. <[(a, b) -> a]>@g
code_fst_fst :: forall t a b b1. <[((a, b), b1) -> a]>@t
dotproduct :: [Int] -> [Int] -> Int
dotproduct' :: [Int] -> [Int] -> Int
dotproduct'' :: forall g.
(GuestLanguageAdd g Int,
GuestLanguageMult g Int,
GuestLanguageFromInteger g Int) =>
[Int] -> <[[Int] -> Int]>@g
example1 :: forall t t1 t2. (t2 -> <[t1]>@t) -> t2 -> <[t1]>@t
example2 :: forall t t1 t2. (t2 -> <[t1]>@t) -> t2 -> <[t1]>@t
forth :: forall a b c. <[b -> c]>@a -> <[b]>@a -> <[c]>@a
ifThenElse :: forall t. Bool -> t -> t -> t
no_shadowing_here :: forall t t1 t2. <[t2]>@t -> <[t1 -> t2]>@t
open :: forall a b. ClosedCode a -> <[a]>@b
paste2 :: forall t t1 t2 t3.
<[t2 -> t1]>@t -> <[t3 -> t2]>@t -> <[t3 -> t1]>@t
pow :: forall a t t1.
(GHC.Num.Num a,
GuestLanguageFromInteger t1 t,
GuestLanguageMult t1 t) =>
a -> <[t -> t]>@t1
pow' :: forall t a t1.
(GHC.Real.Integral a,
Bits a,
GuestLanguageFromInteger t1 t,
GuestLanguageMult t1 t) =>
a -> <[t -> t]>@t1
run :: forall a. (forall b. <[a]>@b) -> a
run_closed :: forall a. ClosedCode a -> a
staged_accept :: Regex
-> forall c s.
(GuestStream c s, GuestLanguageBool c, GuestEqChar c) =>
<[s -> Bool]>@c -> <[s -> Bool]>@c
TYPE CONSTRUCTORS
data ClosedCode a
RecFlag NonRecursive
Generics: no
= ClosedCode :: forall a. (forall b. <[]>@ b a) -> ClosedCode a
Stricts: _
FamilyInstance: none
data Regex
RecFlag NonRecursive
Generics: no
= Empty :: Regex |
Plus :: Regex -> Regex -> Regex Stricts: _ _ |
Times :: Regex -> Regex -> Regex Stricts: _ _ |
Star :: Regex -> Regex Stricts: _ |
Const :: Char -> Regex Stricts: _
FamilyInstance: none
Tycons with generics:
Dependent modules: []
Dependent packages: [base, ghc-prim, integer-gmp]
_______________________________________________
Cvs-ghc mailing list
[email protected]
http://www.haskell.org/mailman/listinfo/cvs-ghc