Skip to content

Commit 0704650

Browse files
committed
Fix import warnings
1 parent 25935d1 commit 0704650

File tree

8 files changed

+19
-34
lines changed

8 files changed

+19
-34
lines changed

src/Control/Comonad/Env/Class.purs

Lines changed: 0 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -5,7 +5,6 @@ module Control.Comonad.Env.Class where
55
import Prelude
66

77
import Control.Comonad
8-
import Control.Comonad.Env
98
import Control.Comonad.Env.Trans
109

1110
import Data.Tuple

src/Control/Comonad/Traced/Trans.purs

Lines changed: 0 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -9,7 +9,6 @@ import Control.Comonad.Trans
99
import Control.Extend
1010

1111
import Data.Monoid
12-
import Data.Tuple
1312

1413
-- | The cowriter comonad transformer.
1514
-- |

src/Control/Monad/Except/Trans.purs

Lines changed: 13 additions & 16 deletions
Original file line numberDiff line numberDiff line change
@@ -1,12 +1,12 @@
11
-- | This module defines the _exception monad transformer_ `ExceptT`.
22

3-
module Control.Monad.Except.Trans
3+
module Control.Monad.Except.Trans
44
( ExceptT(..), runExceptT, withExceptT, mapExceptT
55
, module Control.Monad.Trans
66
, module Control.Monad.Error.Class
77
) where
88

9-
import Prelude
9+
import Prelude
1010

1111
import Data.Tuple (Tuple(..))
1212
import Data.Either (Either(..), either)
@@ -18,9 +18,6 @@ import Control.Monad.Rec.Class (MonadRec, tailRecM)
1818
import Control.Monad.Eff.Class (MonadEff, liftEff)
1919
import Control.Monad.Error.Class (MonadError, throwError, catchError)
2020
import Control.Monad.Cont.Class (MonadCont, callCC)
21-
import Control.Monad.Reader.Class
22-
import Control.Monad.State.Class
23-
import Control.Monad.Writer.Class
2421
import Control.Monad.RWS.Class
2522
import Control.Monad.Trans
2623
import Control.MonadPlus (MonadPlus)
@@ -99,29 +96,29 @@ instance monadTransExceptT :: MonadTrans (ExceptT e) where
9996
instance monadEffExceptT :: (MonadEff eff m) => MonadEff eff (ExceptT e m) where
10097
liftEff = lift <<< liftEff
10198

102-
instance monadContExceptT :: (MonadCont m) => MonadCont (ExceptT e m) where
99+
instance monadContExceptT :: (MonadCont m) => MonadCont (ExceptT e m) where
103100
callCC f = ExceptT $ callCC $ \c -> runExceptT (f (\a -> ExceptT $ c (Right a)))
104101

105102
instance monadErrorExceptT :: (Monad m) => MonadError e (ExceptT e m) where
106103
throwError = ExceptT <<< pure <<< Left
107104
catchError m handler = ExceptT (runExceptT m >>= either (runExceptT <<< handler) (pure <<< Right))
108105

109106
instance monadReaderExceptT :: (MonadReader r m) => MonadReader r (ExceptT e m) where
110-
ask = lift ask
107+
ask = lift ask
111108
local f = mapExceptT (local f)
112109

113110
instance monadStateExceptT :: (MonadState s m) => MonadState s (ExceptT e m) where
114111
state f = lift (state f)
115112

116-
instance monadWriterExceptT :: (MonadWriter w m) => MonadWriter w (ExceptT e m) where
117-
writer wd = lift (writer wd)
118-
listen = mapExceptT $ \m -> do
119-
Tuple a w <- listen m
113+
instance monadWriterExceptT :: (MonadWriter w m) => MonadWriter w (ExceptT e m) where
114+
writer wd = lift (writer wd)
115+
listen = mapExceptT $ \m -> do
116+
Tuple a w <- listen m
120117
return $ (\r -> Tuple r w) <$> a
121-
pass = mapExceptT $ \m -> pass $ do
122-
a <- m
123-
return $ case a of
124-
Left e -> Tuple (Left e) id
125-
Right (Tuple r f) -> Tuple (Right r) f
118+
pass = mapExceptT $ \m -> pass $ do
119+
a <- m
120+
return $ case a of
121+
Left e -> Tuple (Left e) id
122+
Right (Tuple r f) -> Tuple (Right r) f
126123

127124
instance monadRWSExceptT :: (Monoid w, MonadRWS r w s m) => MonadRWS r w s (ExceptT e m)

src/Control/Monad/Maybe/Trans.purs

Lines changed: 3 additions & 7 deletions
Original file line numberDiff line numberDiff line change
@@ -1,6 +1,6 @@
11
-- | This module defines the `MaybeT` monad transformer.
22

3-
module Control.Monad.Maybe.Trans
3+
module Control.Monad.Maybe.Trans
44
( MaybeT(..), runMaybeT, mapMaybeT
55
, module Control.Monad.Trans
66
) where
@@ -14,15 +14,11 @@ import Data.Monoid
1414

1515
import Control.Alt
1616
import Control.Alternative
17-
import Control.Monad
1817
import Control.Monad.Trans
1918
import Control.Monad.Rec.Class
2019
import Control.Monad.Eff.Class
2120
import Control.Monad.Cont.Class
2221
import Control.Monad.Error.Class
23-
import Control.Monad.Reader.Class
24-
import Control.Monad.Writer.Class
25-
import Control.Monad.State.Class
2622
import Control.Monad.RWS.Class
2723
import Control.MonadPlus
2824
import Control.Plus
@@ -86,7 +82,7 @@ instance monadRecMaybeT :: (MonadRec m) => MonadRec (MaybeT m) where
8682

8783
instance monadEffMaybe :: (MonadEff eff m) => MonadEff eff (MaybeT m) where
8884
liftEff = lift <<< liftEff
89-
85+
9086
instance monadContMaybeT :: (MonadCont m) => MonadCont (MaybeT m) where
9187
callCC f = MaybeT $ callCC $ \c -> runMaybeT (f (\a -> MaybeT $ c $ Just a))
9288

@@ -112,4 +108,4 @@ instance monadWriterMaybeT :: (Monad m, MonadWriter w m) => MonadWriter w (Maybe
112108
Nothing -> Tuple Nothing id
113109
Just (Tuple v f) -> Tuple (Just v) f
114110

115-
instance monadRWSMaybeT :: (Monoid w, MonadRWS r w s m) => MonadRWS r w s (MaybeT m)
111+
instance monadRWSMaybeT :: (Monoid w, MonadRWS r w s m) => MonadRWS r w s (MaybeT m)

src/Control/Monad/RWS.purs

Lines changed: 1 addition & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -1,6 +1,6 @@
11
-- | This module defines the `RWS` monad.
22

3-
module Control.Monad.RWS
3+
module Control.Monad.RWS
44
( RWS()
55
, rws
66
, runRWS
@@ -14,7 +14,6 @@ module Control.Monad.RWS
1414
import Prelude
1515

1616
import Data.Identity
17-
import Data.Monoid
1817
import Data.Tuple
1918

2019
import Control.Monad.RWS.Class

src/Control/Monad/RWS/Trans.purs

Lines changed: 0 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -17,10 +17,7 @@ import Control.Monad.Eff.Class
1717
import Control.Monad.Error.Class
1818
import Control.Monad.RWS.Class
1919
import Control.Monad.Rec.Class
20-
import Control.Monad.Reader.Class
21-
import Control.Monad.State.Class
2220
import Control.Monad.Trans
23-
import Control.Monad.Writer.Class
2421

2522
data RWSResult state result writer = RWSResult state result writer
2623

src/Control/Monad/State/Class.purs

Lines changed: 0 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -4,7 +4,6 @@ module Control.Monad.State.Class where
44

55
import Prelude
66

7-
import Data.Monoid
87
import Data.Tuple
98

109
-- | The `MonadState s` type class represents those monads which support a single piece of mutable

src/Control/Monad/Writer.purs

Lines changed: 2 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -1,17 +1,16 @@
11
-- | This module defines the `Writer` monad.
22

3-
module Control.Monad.Writer
3+
module Control.Monad.Writer
44
( Writer()
55
, runWriter
66
, execWriter
77
, mapWriter
88
, module Control.Monad.Writer.Class
99
) where
10-
10+
1111
import Prelude
1212

1313
import Data.Identity
14-
import Data.Monoid
1514
import Data.Tuple
1615

1716
import Control.Monad.Writer.Class

0 commit comments

Comments
 (0)