-
Notifications
You must be signed in to change notification settings - Fork 0
/
Copy pathch23state.hs
115 lines (88 loc) · 3.05 KB
/
ch23state.hs
1
2
3
4
5
6
7
8
9
10
11
12
13
14
15
16
17
18
19
20
21
22
23
24
25
26
27
28
29
30
31
32
33
34
35
36
37
38
39
40
41
42
43
44
45
46
47
48
49
50
51
52
53
54
55
56
57
58
59
60
61
62
63
64
65
66
67
68
69
70
71
72
73
74
75
76
77
78
79
80
81
82
83
84
85
86
87
88
89
90
91
92
93
94
95
96
97
98
99
100
101
102
103
104
105
106
107
108
109
110
111
112
113
114
115
module Chapter23State where
import Control.Applicative (liftA3)
import Control.Monad
import Control.Monad.Trans.State
import Data.Functor.Identity
import Data.Maybe
import System.Random
data Die = Die1 | Die2 | Die3 | Die4 | Die5 | Die6 deriving (Eq, Show)
intToDie :: Int -> Maybe Die
intToDie n =
case n of
1 -> Just Die1
2 -> Just Die2
3 -> Just Die3
4 -> Just Die4
5 -> Just Die5
6 -> Just Die6
_ -> Nothing
rollDieThreeTimes :: (Die, Die, Die)
rollDieThreeTimes = do
let s = mkStdGen 0
(d1, s1) = randomR (1, 6) s
(d2, s2) = randomR (1, 6) s1
(d3, _) = randomR (1, 6) s2
((fromJust . intToDie) d1, (fromJust . intToDie) d2, (fromJust . intToDie) d3)
rollDie :: State StdGen Die
rollDie = state $ do
(n, s) <- randomR (1, 6)
return ((fromJust . intToDie) n, s)
rollDie' :: State StdGen Die
rollDie' = (fromJust . intToDie) <$> state (randomR (1, 6))
rollDieThreeTimes' :: State StdGen (Die, Die, Die)
rollDieThreeTimes' = liftA3 (,,) rollDie rollDie rollDie
rollDieNTimes :: Int -> State StdGen [Die]
rollDieNTimes n = replicateM n rollDie'
-- Exercises: Roll Your Own (page 907)
rollsToGetN :: Int -> StdGen -> Int
rollsToGetN n = go 0 0
where go :: Int -> Int -> StdGen -> Int
go suma count gen
| suma >= n = count
| otherwise =
let (die, nextGen) = randomR (1, 6) gen
in go (suma + die) (count + 1) nextGen
rollsToGetNLogged :: Int -> StdGen -> (Int, [Die])
rollsToGetNLogged n = go 0 0 []
where go :: Int -> Int -> [Die] -> StdGen -> (Int, [Die])
go suma count rolls gen
| suma >= n = (count, rolls)
| otherwise =
let (die, nextGen) = randomR (1, 6) gen
in go (suma + die) (count + 1) (rolls ++ [(fromJust . intToDie) die]) nextGen
--
newtype Estado s a = Estado { runEstado :: s -> (a, s) }
instance Functor (Estado s) where
fmap f (Estado g) = Estado h
where h s = let (a, nextS) = g s
in (f a, nextS)
instance Applicative (Estado s) where
pure a = Estado (\s -> (a, s))
Estado f <*> Estado g = Estado h
where h s = let (fab, s') = f s
(a, s'') = g s'
in (fab a, s'')
instance Monad (Estado s) where
return = pure
Estado f >>= g = Estado h
where h s = let (a, s') = f s
in runEstado (g a) s'
-- 23.7 Get a coding job with one weird trick (909)
fizzBuzz :: Integer -> String
fizzBuzz n | n `mod` 15 == 0 = "FizzBuzz"
| n `mod` 5 == 0 = "Fizz"
| n `mod` 3 == 0 = "Buzz"
| otherwise = show n
main :: IO ()
main = mapM_ (putStrLn . fizzBuzz) [1..100]
-- 23.8 Chapter exercices (page 913)
get' :: State s s
get' = StateT { runStateT = \s -> Identity (s, s) }
put' :: s -> State s ()
put' s = StateT { runStateT = \_ -> Identity ((), s) }
exec :: State s a -> s -> s
exec (StateT sa) s = snd $ runIdentity (sa s)
eval :: State s a -> s -> a
eval (StateT sa) s = fst $ runIdentity (sa s)
modify' :: (s -> s) -> State s ()
modify' ss = StateT { runStateT = \s -> Identity ((), ss s) }