Home
last modified time | relevance | path

Searched refs:namedArg (Results 1 – 25 of 64) sorted by relevance

123

/dports/www/mattermost-server/mattermost-server-6.0.2/app/
H A Dcommand_autocomplete.go193 namedArg := "--" + arg.Name
195 …el.AutocompleteSuggestion{Complete: parsed + toBeParsed + namedArg + " ", Suggestion: namedArg, Hi…
197 if strings.HasPrefix(strings.ToLower(namedArg), strings.ToLower(in)) {
198 …tocompleteSuggestion{Complete: parsed + toBeParsed + namedArg[len(in):] + " ", Suggestion: namedAr…
201 if !strings.HasPrefix(strings.ToLower(in), strings.ToLower(namedArg)+" ") {
204 if strings.ToLower(in) == strings.ToLower(namedArg)+" " {
205 return false, parsed + namedArg + " ", " ", model.AutocompleteSuggestion{}
207 return false, parsed + namedArg + " ", in[len(namedArg)+1:], model.AutocompleteSuggestion{}
/dports/math/hs-Agda/Agda-2.6.2/src/full/Agda/Syntax/Abstract/
H A DPatternSynonyms.hs47 mergeArg ren p q = setNamedArg p <$> merge ren (namedArg p) (namedArg q)
59 zipWithM_ match (map namedArg ps) (map namedArg args)
72 zipWithM_ match (map namedArg ps) (map namedArg qs)
H A DPattern.hs46 case namedArg p of
61 …RecP i fs -> f $ setNamedArg p $ RecP i $ map (fmap namedArg) $ mapNamedArgPattern f $ ma…
331 case namedArg p0 of
334 WithP _i p -> Just (LHSWithP (p : map namedArg ps1), ps2)
369 LHSProj d h ps -> lhsCoreToSpine (namedArg h) <&> (++ (p : ps))
417 lhsCoreAllPatterns = map namedArg . qnamed . lhsCoreToSpine
/dports/math/hs-Agda/Agda-2.6.2/src/full/Agda/TypeChecking/
H A DWith.hs343 , nest 2 $ "qs = " <+> fsep (punctuate comma $ map (prettyTCM . namedArg) qs)
382 , nest 2 $ "qs =" <+> fsep (punctuate comma $ map (prettyTCM . namedArg) qs)
401 unless (all (implicit . namedArg) ps) $
408 | A.AsP _ x p <- namedArg p0 = do
410 let v = patternToTerm (namedArg q)
423 case namedArg q of
446 VarP _ x | A.DotP _ u <- namedArg p
461 tell [ProblemEq (namedArg p) v a]
477 case namedArg p of
538 LitP _ lit -> case namedArg p of
[all …]
H A DProjectionLike.hs376 onlyMatch n ps = all (shallowMatch . namedArg) (take 1 ps1) &&
382 noMatches = all (noMatch . namedArg)
H A DInjectivity.hs151 case [ n | (n, VarP _ (DBPatVar _ j)) <- zip [0..] $ map namedArg ps, i == j ] of
179 any (properlyMatching' False False . namedArg) . namedClausePats
212 [c] -> prettyTCM $ map namedArg $ namedClausePats c
H A DPretty.hs360 prettyTCM q <+> fsep (map (prettyTCM . namedArg) ps)
363 prettyTCM c <+> fsep (map (prettyTCM . namedArg) ps)
374 sep [ prettyTCM (A.qnameName x) <+> "=" , nest 2 $ prettyTCM $ namedArg p ]
376 showCon = parens $ prTy $ prettyTCM c <+> fsep (map (prettyTCM . namedArg) ps)
H A DEmpty.hs93 …let ps = map (namedArg . lastWithDefault __IMPOSSIBLE__ . fromSplitPatterns . scPats) $ splitClaus…
H A DRecordPatterns.hs73 concat <$> zipWithM comb (map proj fields) (map namedArg ps)
730 (ps', ss, cs) <- unzip3 <$> mapM (translatePattern . namedArg) ps
753 rs <- mapM (recordTree . namedArg) ps
/dports/math/hs-Agda/Agda-2.6.2/src/full/Agda/Syntax/
H A DNotation.hs65 holeTarget (NormalHole _ n) = Just $ rangedThing $ namedArg n
142 holeNames = map namedArg holes >>= \case
164 | namedArg h == w = NormalHole r h : WildHole w : hs function
169 | namedArg h == w = WildHole w : NormalHole r h : hs function
182 case namedArg h of
196 LambdaHole x _ <- [namedArg h], rangedThing x /= "_" ]
H A DIdiomBrackets.hs52 | defaultNamedArg () == fmap (() <$) a = return $ namedArg a
/dports/devel/R-cran-RUnit/RUnit/inst/unitTests/
H A DrunitRUnit.r448 namedArg <- TRUE functionVar
449 names(namedArg) <- "Yes"
450 checkEquals( checkTrue( namedArg), TRUE)
454 namedArg <- FALSE
455 names(namedArg) <- "No"
456 checkException( checkTrue( namedArg))
/dports/www/gitea/gitea-1.16.5/vendor/xorm.io/builder/
H A Dsql.go115 if namedArg, ok := arg.(sql2.NamedArg); ok {
116 arg = namedArg.Value
H A Dbuilder.go279 if namedArg, ok := w.args[e].(sql2.NamedArg); ok {
280 w.args[e] = namedArg.Value
/dports/www/grafana8/builder/
H A Dsql.go111 if namedArg, ok := arg.(sql2.NamedArg); ok {
112 arg = namedArg.Value
H A Dbuilder.go259 if namedArg, ok := w.args[e].(sql2.NamedArg); ok {
260 w.args[e] = namedArg.Value
/dports/math/hs-Agda/Agda-2.6.2/src/full/Agda/TypeChecking/Rules/
H A DDisplay.hs45 patternToTerm (namedArg p) $ \n v ->
51 patternToTerm (namedArg p) $ \n v ->
111 …pp _ e arg -> apply <$> exprToTerm e <*> ((:[]) . inheritHiding arg <$> exprToTerm (namedArg arg))
/dports/math/hs-Agda/Agda-2.6.2/src/full/Agda/TypeChecking/Coverage/
H A DMatch.hs214 : (map (isTrivialPattern . namedArg) ps)
347 matchPat (namedArg p) (namedArg q) `combine` matchPats ps qs
363 Nothing -> blockedOnApplication (case namedArg p of IApplyP{} -> IsIApply; _ -> IsApply)
483 then fmap inc <$> isLitP (namedArg a)
/dports/math/hs-Agda/Agda-2.6.2/src/full/Agda/TypeChecking/Patterns/
H A DMatch.hs158 , nest 2 $ "ps =" <+> fsep (punctuate comma $ map (prettyTCM . namedArg) ps)
163 foldMatch (matchCopattern . namedArg) ps vs
202 foldMatch (matchPattern . namedArg) ps vs
362 mconcat <$> zipWithM matchPatternP (map namedArg ps) qs
/dports/math/hs-Agda/Agda-2.6.2/src/full/Agda/Termination/
H A DTermCheck.hs613 mdbpats <- maskNonDataArgs $ map namedArg ps
1260 compareTerm' (unArg t) (notMasked $ namedArg p)
1284 (Con{}, ConP c _ ps) | any (isSubTerm v . namedArg) ps ->
1310 : zipWith (\ t p -> equal (unArg t) (namedArg p)) ts ps
1321 setUsability True $ decrease 1 $ supremum $ map (subTerm t . namedArg) ps
1337 (1,1) -> compareTerm' (unArg (head ts)) (notMasked $ namedArg $ head ps)
1339 zipWithM compareTerm' (map unArg ts) (map (notMasked . namedArg) ps)
1370 setUsability True . decrease 1 <$> compareVar i (notMasked $ namedArg p)
1374 <*> (Order.supremum <$> mapM (compareVar i . notMasked . namedArg) ps)
1377 <*> (Order.supremum <$> mapM (compareVar i . notMasked . namedArg) ps)
/dports/math/hs-Agda/Agda-2.6.2/src/full/Agda/TypeChecking/Rules/LHS/
H A DProblemRest.hs124 (map namedArg ps1)
125 (map (patternToTerm . namedArg) qs1)
/dports/math/hs-Agda/Agda-2.6.2/src/full/Agda/Syntax/Concrete/
H A DOperators.hs681 mapM_ (valid . namedArg) ps
689 let (ps1, rest) = span (isParsePattern . namedArg) ps0
694 mapM_ (guardWithError Nothing . isParsePattern . namedArg) ps3
697 let (f, lhs0) = fromParseLHS $ namedArg p2
707 mapM_ (valid . namedArg) ps
783 AppP p a -> loop (namedArg a : acc) p
784 OpAppP _ op _ ps -> (IdentP op :| fmap namedArg ps)
H A DPattern.hs91 case namedArg p0 of
92 WithP _i p -> Just (LHSWithP (p : map namedArg ps1), ps2)
358 core = foldl AppP (namedArg hd) args
/dports/devel/bazel-buildtools/buildtools-3.2.1/build/
H A Drewrite.go301 args = append(args, namedArg{ruleNamePriority(rule, name), name, i, x})
351 type namedArg struct { struct
359 type namedArgs []namedArg
/dports/devel/ipython5/ipython-5.10.0/IPython/core/
H A Dcompleter.py897 for namedArg in namedArgs:
898 if namedArg.startswith(text):
899 argMatches.append(u"%s=" %namedArg)

123