| Safe Haskell | Safe-Inferred | 
|---|---|
| Language | Haskell2010 | 
Bluefin.Internal.Examples
Documentation
monadIOExample :: IO () Source #
monadFailExample :: Either String () Source #
exampleGet :: (Int, Int) Source #
examplePut :: ((), Int) Source #
exampleModify :: ((), Int) Source #
yieldExample :: ([Int], ()) Source #
forEachExample :: ([Int], ()) Source #
cycleToStreamExample :: ([Int], ()) Source #
takeConsumeExample :: ([Int], ()) Source #
inFoldableExample :: ([Int], ()) Source #
enumerateExample :: ([(Int, String)], ()) Source #
effIOExample :: IO () Source #
awaitList :: e :> es => [a] -> IOE e -> (forall e1. Consume a e1 -> Eff (e1 :& es) ()) -> Eff es () Source #
takeRec :: e3 :> es => Int -> (forall e. Consume a e -> Eff (e :& es) ()) -> Consume a e3 -> Eff es () Source #
mapRec :: e :> es => (a -> b) -> (forall e1. Consume b e1 -> Eff (e1 :& es) ()) -> Consume a e -> Eff es () Source #
traverseRec :: e :> es => (a -> Eff es b) -> (forall e1. Consume b e1 -> Eff (e1 :& es) ()) -> Consume a e -> Eff es () Source #
awaitUsage :: (e1 :> es, e2 :> es) => IOE e1 -> (forall e. Consume () e -> Eff (e :& es) ()) -> Consume Int e2 -> Eff es () Source #
awaitExample :: IO () Source #
consumeStreamExample2 :: IO () Source #
zipCoroutinesExample :: IO () Source #
countPositivesNegatives :: [Int] -> String Source #
runMyHandle :: (forall e. MyHandle e -> Eff (e :& es) a) -> Eff es (Either String (a, Int)) Source #
countExample :: IO () Source #
incrementReadLine :: (e1 :> es, e2 :> es, e3 :> es) => State Int e1 -> Exception String e2 -> IOE e3 -> Eff es () Source #
Constructors
| MkCounter3B (IOE e) | 
runCounter3B :: e1 :> es => IOE e1 -> (forall e. Counter3B e -> Eff (e :& es) r) -> Eff es r Source #
exampleCounter3B :: IO () Source #
runCounter4 :: e1 :> es => Stream String e1 -> (forall e. Counter4 e -> Eff (e :& es) r) -> Eff es Int Source #
exampleCounter4 :: ([String], Int) Source #
Constructors
| MkCounter5 | |
| Fields 
 | |
runCounter5 :: e1 :> es => Stream String e1 -> (forall e. Counter5 e -> Eff (e :& es) r) -> Eff es Int Source #
exampleCounter5 :: ([String], Int) Source #
Constructors
| MkCounter6 | |
| Fields 
 | |
runCounter6 :: e1 :> es => Stream String e1 -> (forall e. Counter6 e -> Eff (e :& es) r) -> Eff es Int Source #
exampleCounter6 :: ([String], Int) Source #
Constructors
| MkCounter7 | |
| Fields 
 | |
runCounter7 :: e1 :> es => Stream String e1 -> (forall e. Counter7 e -> Eff (e :& es) r) -> Eff es Int Source #
exampleCounter7A :: ([String], Int) Source #
exampleCounter7B :: ([String], Int) Source #
data FileSystem es Source #
Constructors
| MkFileSystem | |
| Fields 
 | |
Instances
| Handle FileSystem Source # | |
| Defined in Bluefin.Internal.Examples Methods mapHandle :: forall (e :: Effects) (es :: Effects). e :> es => FileSystem e -> FileSystem es Source # | |
runFileSystemPure :: e1 :> es => Exception String e1 -> [(FilePath, String)] -> (forall e2. FileSystem e2 -> Eff (e2 :& es) r) -> Eff es r Source #
runFileSystemIO :: forall e1 e2 es r. (e1 :> es, e2 :> es) => Exception String e1 -> IOE e2 -> (forall e. FileSystem e -> Eff (e :& es) r) -> Eff es r Source #
data Application e Source #
Constructors
| MkApplication | |
Instances
| Handle Application Source # | |
| Defined in Bluefin.Internal.Examples Methods mapHandle :: forall (e :: Effects) (es :: Effects). e :> es => Application e -> Application es Source # | |
pipesExample1 :: IO () Source #
pipesExample2 :: IO String Source #
promptCoroutine :: IO () Source #
rethrowIOExample :: IO () Source #
data DynamicReader r e Source #
Constructors
| DynamicReader | |
Instances
| Handle (DynamicReader r) Source # | |
| Defined in Bluefin.Internal.Examples Methods mapHandle :: forall (e :: Effects) (es :: Effects). e :> es => DynamicReader r e -> DynamicReader r es Source # | |
runDynamicReader :: r -> (forall e. DynamicReader r e -> Eff (e :& es) a) -> Eff es a Source #