1 {-# LANGUAGE AllowAmbiguousTypes #-}
2 {-# LANGUAGE DataKinds #-}
3 {-# LANGUAGE DefaultSignatures #-}
4 {-# LANGUAGE TypeFamilyDependencies #-}
5 {-# LANGUAGE UndecidableInstances #-} -- for type instance defaults
6 module Symantic.CLI.API where
9 import Data.Char (Char)
11 import Data.Function (($), (.), id)
12 import Data.Kind (Constraint)
13 import Data.Maybe (Maybe(..), fromJust)
14 import Data.String (String, IsString(..))
15 import Text.Show (Show)
19 (<.>) :: repr a b -> repr b c -> repr a c
24 repr a b -> repr b c -> repr a c
25 x <.> y = noTrans (unTrans x <.> unTrans y)
30 (<!>) :: repr a k -> repr b k -> repr (a:!:b) k
31 alt :: repr a k -> repr a k -> repr a k
32 opt :: repr (a->k) k -> repr (Maybe a->k) k
37 repr a k -> repr b k -> repr (a:!:b) k
41 repr a k -> repr a k -> repr a k
45 repr (a->k) k -> repr (Maybe a->k) k
46 x <!> y = noTrans (unTrans x <!> unTrans y)
47 x `alt` y = noTrans (unTrans x `alt` unTrans y)
48 opt = noTrans . opt . unTrans
49 -- NOTE: yes infixr, not infixl like <|>,
50 -- in order to run left-most checks first.
55 -- | Like @(,)@ but @infixr@.
56 data (:!:) a b = a:!:b
61 dimap :: (a->b) -> (b->a) -> repr (a->k) k -> repr (b->k) k
66 (a->b) -> (b->a) -> repr (a->k) k -> repr (b->k) k
67 dimap a2b b2a = noTrans . dimap a2b b2a . unTrans
70 class AltApp repr where
71 many0 :: repr (a->k) k -> repr ([a]->k) k
72 many1 :: repr (a->k) k -> repr ([a]->k) k
76 AltApp (UnTrans repr) =>
77 repr (a->k) k -> repr ([a]->k) k
80 AltApp (UnTrans repr) =>
81 repr (a->k) k -> repr ([a]->k) k
82 many0 = noTrans . many0 . unTrans
83 many1 = noTrans . many1 . unTrans
85 -- * Class 'Permutable'
86 class Permutable repr where
87 -- NOTE: Use @TypeFamilyDependencies@ to help type-inference infer @(repr)@.
88 type Permutation (repr:: * -> * -> *) = (r :: * -> * -> *) | r -> repr
89 type Permutation repr = Permutation (UnTrans repr)
90 runPermutation :: Permutation repr k a -> repr (a->k) k
91 toPermutation :: repr (a->k) k -> Permutation repr k a
92 toPermDefault :: a -> repr (a->k) k -> Permutation repr k a
94 -- | Convenient wrapper to omit a 'runPermutation'.
97 -- opts '<?>' next = 'runPermutation' opts '<.>' next
100 App repr => Permutable repr =>
101 Permutation repr b a -> repr b c -> repr (a->b) c
102 opts <?> next = runPermutation opts <.> next
105 -- * Class 'Sequenceable'
106 class Sequenceable repr where
107 -- NOTE: Use @TypeFamilyDependencies@ to help type-inference infer @(repr)@.
108 type Sequence (repr:: * -> * -> *) = (r :: * -> * -> *) | r -> repr
109 type Sequence repr = Sequence (UnTrans repr)
110 runSequence :: Sequence repr k a -> repr (a->k) k
111 toSequence :: repr (a->k) k -> Sequence repr k a
117 type Segment = String
119 -- * Class 'CLI_Command'
120 class CLI_Command repr where
121 command :: Name -> repr a k -> repr a k
124 class CLI_Var repr where
125 type VarConstraint repr a :: Constraint
126 var' :: VarConstraint repr a => Name -> repr (a->k) k
128 type VarConstraint repr a = VarConstraint (UnTrans repr) a
131 CLI_Var (UnTrans repr) =>
132 VarConstraint (UnTrans repr) a =>
133 Name -> repr (a->k) k
134 var' = noTrans . var'
136 -- | Like 'var'' but with the type variable @(a)@ first instead or @(repr)@
137 -- so it can be passed using 'TypeApplications' without adding a |\@_| for @(repr)@.
141 VarConstraint repr a =>
142 Name -> repr (a->k) k
147 class CLI_Constant repr where
148 constant :: Segment -> a -> repr (a->k) k
149 just :: a -> repr (a->k) k
153 CLI_Constant (UnTrans repr) =>
154 Segment -> a -> repr (a->k) k
157 CLI_Constant (UnTrans repr) =>
161 CLI_Constant (UnTrans repr) =>
163 constant s = noTrans . constant s
164 just = noTrans . just
165 nothing = noTrans nothing
168 class CLI_Env repr where
169 type EnvConstraint repr a :: Constraint
170 env' :: EnvConstraint repr a => Name -> repr (a->k) k
172 type EnvConstraint repr a = EnvConstraint (UnTrans repr) a
175 CLI_Env (UnTrans repr) =>
176 EnvConstraint (UnTrans repr) a =>
177 Name -> repr (a->k) k
178 env' = noTrans . env'
180 -- | Like 'env'' but with the type enviable @(a)@ first instead or @(repr)@
181 -- so it can be passed using 'TypeApplications' without adding a |\@_| for @(repr)@.
185 EnvConstraint repr a =>
186 Name -> repr (a->k) k
196 instance IsString Tag where
203 class (App repr, Permutable repr, CLI_Constant repr) => CLI_Tag repr where
204 type TagConstraint repr a :: Constraint
205 tag :: Tag -> repr f k -> repr f k
206 -- tag n = (tag n <.>)
209 flag :: TagConstraint repr Bool => Tag -> Permutation repr k Bool
210 flag n = toPermDefault False $ tag n $ just True
213 TagConstraint repr a => AltApp repr => Alt repr => Pro repr =>
214 Tag -> repr (a->k) k -> Permutation repr k (Maybe a)
215 optionalTag n = toPermDefault Nothing . tag n . dimap Just fromJust
218 TagConstraint repr a =>
219 Tag -> a -> repr (a->k) k -> Permutation repr k a
220 defaultTag n a = toPermDefault a . tag n
223 TagConstraint repr a =>
224 Tag -> repr (a->k) k -> Permutation repr k a
225 requiredTag n = toPermutation . tag n
228 TagConstraint repr a => AltApp repr =>
229 Tag -> repr (a->k) k -> Permutation repr k [a]
230 many0Tag n = toPermDefault [] . many1 . tag n
232 TagConstraint repr a => AltApp repr =>
233 Tag -> repr (a->k) k -> Permutation repr k [a]
234 many1Tag n = toPermutation . many1 . tag n
237 type TagConstraint repr a = TagConstraint (UnTrans repr) a
240 CLI_Tag (UnTrans repr) =>
241 Tag -> repr f k -> repr f k
244 CLI_Tag (UnTrans repr) =>
246 tag n = noTrans . tag n . unTrans
247 endOpts = noTrans endOpts
249 -- * Class 'CLI_Response'
250 class CLI_Response repr where
251 type ResponseConstraint repr a :: Constraint
252 type ResponseArgs repr a :: * -- = (r:: *) | r -> a
253 type Response repr :: *
255 ResponseConstraint repr a =>
256 repr (ResponseArgs repr a)
259 type ResponseConstraint repr a = ResponseConstraint (UnTrans repr) a
260 type ResponseArgs repr a = ResponseArgs (UnTrans repr) a
261 type Response repr = Response (UnTrans repr)
265 CLI_Response (UnTrans repr) =>
266 ResponseConstraint (UnTrans repr) a =>
267 ResponseArgs repr a ~ ResponseArgs (UnTrans repr) a =>
268 Response repr ~ Response (UnTrans repr) =>
269 repr (ResponseArgs repr a)
271 response' = noTrans (response' @_ @a)
276 ResponseConstraint repr a =>
277 repr (ResponseArgs repr a)
279 response = response' @repr @a
280 {-# INLINE response #-}
282 -- * Class 'CLI_Help'
283 class CLI_Help repr where
284 type HelpConstraint repr d :: Constraint
285 help :: HelpConstraint repr d => d -> repr f k -> repr f k
287 program :: Name -> repr f k -> repr f k
288 rule :: Name -> repr f k -> repr f k
290 type HelpConstraint repr d = HelpConstraint (UnTrans repr) d
293 CLI_Help (UnTrans repr) =>
294 Name -> repr f k -> repr f k
297 CLI_Help (UnTrans repr) =>
298 Name -> repr f k -> repr f k
299 program n = noTrans . program n . unTrans
300 rule n = noTrans . rule n . unTrans
304 class Trans repr where
305 -- | The @(repr)@esentation that @(repr)@ 'Trans'forms.
306 type UnTrans repr :: * -> * -> *
307 -- | Lift the underlying @(repr)@esentation to @(repr)@.
308 -- Useful to define a combinator that does nothing in a 'Trans'formation.
309 noTrans :: UnTrans repr a b -> repr a b
310 -- | Unlift a @(repr)@esentation. Useful when a 'Trans'formation
311 -- combinator needs to access the 'UnTrans'formed @(repr)@esentation,
312 -- or at the end to get the underlying 'UnTrans'formed @(repr)@esentation
313 -- from the inferred @(repr)@ value (eg. in 'server').
314 unTrans :: repr a b -> UnTrans repr a b