1 {-# LANGUAGE DeriveFunctor #-}
2 {-# LANGUAGE GeneralizedNewtypeDeriving #-}
3 {-# OPTIONS_GHC -fno-warn-orphans #-}
5 module Webc.Generator where
7 import Control.Applicative (Applicative (..), liftA2)
8 import Data.Either (Either (..))
9 import Data.Eq (Eq (..))
10 import Data.Foldable (toList)
11 import Data.Function (($), (.))
12 import Data.Functor (Functor (..), (<$>))
13 import Data.Maybe (Maybe (..))
14 import Data.Ord (Ord (..))
15 import Data.Semigroup (Semigroup (..))
16 import Network.URI.Slug as URI
17 import Symantic.Classes (Constantable (..), Iso (..), IsoFunctor (..), Optionable (..), ProductFunctor (..), SumFunctor ((<+>)))
18 import Text.Show (Show (..))
22 -- * The 'Generator' interpreter
24 -- | This is a very basic generator.
25 newtype Generator a = Generator
26 { unGenerator :: [Gen a]
28 deriving (Functor, Show)
30 instance Applicative Generator where
31 pure = Generator . pure . pure
32 Generator f <*> Generator x = Generator $ (<*>) <$> f <*> x
34 -- instance Monad Generator where
36 -- Generator x >>= f = Generator (x >>=)
38 generate :: Generator a -> [Gen a]
39 generate = unGenerator
43 { genSlugs :: [Slug] -- TODO: Endo? Seq?
46 deriving (Eq, Ord, Show, Functor)
47 instance Applicative Gen where
49 f <*> x = Gen (genSlugs f <> genSlugs x) (genValue f (genValue x))
51 instance IsoFunctor Generator where
52 (<%>) Iso{..} = (a2b <$>)
53 instance ProductFunctor Generator where
57 instance SumFunctor Generator where
61 ((Left <$>) <$> unGenerator x)
62 ((Right <$>) <$> unGenerator y)
63 instance Repeatable Generator where
66 ((\Gen{} -> Gen [] []) <$> x)
67 <> ((\(Gen s a) -> Gen s [a]) <$> x)
68 <> ((\(Gen s a) -> Gen (s <> s) [a, a]) <$> x)
71 ((\(Gen s a) -> Gen s [a]) <$> x)
72 <> ((\(Gen s a) -> Gen (s <> s) [a, a]) <$> x)
73 instance Optionable Generator where
77 ((Just <$>) <$> unGenerator x)
78 instance Endable Generator where
79 end = Generator [Gen [] ()]
80 instance Slugable Generator where
81 literalSlug s = Generator [Gen [s] ()]
93 instance Capturable Generator where
94 captureSlug n = Generator $ [Gen [n] n]
95 instance Constantable c Generator where