Search results

Jump to navigation Jump to search
  • data Key k v = NoKey | Key k v instance Eq k => Eq (Key k v) where
    2 KB (315 words) - 15:19, 6 February 2021
  • depthfirst (v,e) n | [x|x<-v,x==n] == [] = []
    1 KB (123 words) - 03:51, 10 January 2017
  • dfsbipartite (v,e) ((nv, 0):stack) odd even | [x|x<-v,x==nv] == [] = dfsbipartite (v, e) stack odd even
    1 KB (163 words) - 03:51, 10 January 2017
  • depthfirst (v,e) n | [x|x<-v,x==n] == [] = []
    714 bytes (91 words) - 03:50, 10 January 2017
  • f n = do v <- getLine return $! v : vs
    986 bytes (142 words) - 15:18, 6 February 2021
  • adjToGraph (Adj ((v, a):vs)) = Graph (v : xs) ((a >>= f) ++ ys) f x = if (v, x) `elem` ys || (x, v) `elem` ys
    2 KB (245 words) - 03:48, 10 January 2017
  • class Monad m => VarMonad m v where new :: a -> m (v a)
    1 KB (198 words) - 22:52, 21 July 2021
  • adjToGraph (Adj ((v, a):vs)) = Graph (v : xs) ((a >>= f) ++ ys) f x = if (v, x) `elem` ys || (x, v) `elem` ys
    2 KB (388 words) - 03:47, 10 January 2017
  • class Map m k v where empty :: m k v
    3 KB (170 words) - 23:05, 29 June 2021
  • In this layout strategy, the position of a node v is obtained by the following two rules: * x(v) is equal to the position of the node v in the inorder sequence
    2 KB (337 words) - 03:41, 10 January 2017
  • koch ((v, us):vs) eused vused vplan = koch vs eused' (vn:vused) ((v, vn):vplan)
    3 KB (420 words) - 22:52, 7 June 2017
  • ...<hask>unamb u v</hask> is the more terminating of <hask>u</hask> and <hask>v</hask>. ...u v</hask> becomes available when the earlier of <hask>u</hask> and <hask>v</hask> does.
    2 KB (356 words) - 21:36, 4 February 2014
  • foldr _ v (End) = v foldr f v (Node _ x xs) = f x (foldr f v xs)
    3 KB (587 words) - 15:19, 6 February 2021
  • ...in foldl (\(newt,sofar) (v,s) -> let (t'',lst) = runSuperState (f v) s newt
    1 KB (169 words) - 05:31, 9 March 2021
  • <code>Transform</code>, <code>V</code>. type Context b v m = Style v ::: Name ::: SubMap b v m ::: ()
    7 KB (1,077 words) - 14:56, 12 June 2014
  • atLevel (Branch v l r) n | n == 1 = [v]
    741 bytes (125 words) - 13:40, 25 December 2016
  • === Couldn't match type `V (Point R2)' with `R2' === ...[http://projects.haskell.org/diagrams/doc/manual.html#couldn-t-match-type-v-p2-with-r2 the user manual].
    958 bytes (158 words) - 03:41, 29 January 2014
  • search marks (v:vs) = readSTArray marks v >>= \ visited -> writeSTArray marks v True >>
    3 KB (428 words) - 04:08, 12 April 2024
  • |<code>at :: Ord k => k -> Lens' (Map k v) (Maybe v)</code> |rowspan="3" valign="top" |<code>Just v</code> -> value is present; <code>Nothing</code> -> value is absent
    5 KB (742 words) - 19:22, 22 May 2022
  • ...ションは普通に実行され、<code>v <- x</code>となっている行ではアクション<code>x</code>を実行し、結果を変数<code>v</code>に割り当てます。
    7 KB (299 words) - 11:39, 22 October 2022

View (previous 20 | next 20) (20 | 50 | 100 | 250 | 500)