oauthenticated-0.0.5: Simple OAuth client code built atop http-conduit

Portabilitynon-portable
Stabilityexperimental
Maintainerme@jspha.com
Safe HaskellSafe-Inferred

Network.OAuth.MuLens

Contents

Description

Tiny, Control.Lens compatibility layer.

Synopsis

Basics

type Lens s t a b = forall f. Functor f => (a -> f b) -> s -> f tSource

view :: MonadReader s m => ((a -> Constant a a) -> s -> Constant a s) -> m aSource

use :: MonadState s m => ((a -> Constant a a) -> s -> Constant a s) -> m aSource

preview :: ((a -> Constant (First a) a) -> s -> Constant (First a) s) -> s -> Maybe aSource

set :: ((a -> Identity b) -> s -> Identity t) -> b -> s -> tSource

Generalizations

over :: ((a -> Identity b) -> s -> Identity t) -> (a -> b) -> s -> tSource

foldMapOf :: ((a -> Constant r b) -> s -> Constant r t) -> (a -> r) -> s -> rSource

Building

lens :: (s -> a) -> (s -> b -> t) -> Lens s t a bSource

Tools

zoom :: Monad m => Lens s s t t -> StateT t m a -> StateT s m aSource

Convenience

(<&>) :: Functor f => f a -> (a -> b) -> f bSource

(&) :: b -> (b -> c) -> cSource

(^.) :: s -> ((a -> Constant a a) -> s -> Constant a s) -> aSource

(.~) :: ((a -> Identity b) -> s -> Identity t) -> b -> s -> tSource

(%~) :: ((a -> Identity b) -> s -> Identity t) -> (a -> b) -> s -> tSource

(<~) :: MonadState s m => ((a -> Identity b) -> s -> Identity s) -> m b -> m ()Source