Search results

Jump to navigation Jump to search
  • zipWith f (Node n0 x xs) (Node n1 y ys) = Node (n0 `min` n1) (f x y) (zipWith f xs ys) zip = zipWith (\x y -> (x,y))
    3 KB (587 words) - 15:19, 6 February 2021
  • paths1 a b g current = paths2 a b g current [ y | (x,y) <- g, x == a ]
    2 KB (359 words) - 20:50, 30 July 2021
  • ...athbf{Ob}(\mathcal C)</math>. Let <math>f \in \mathrm{Hom}_{\mathcal C}(X, Y)</math>. ==== Right: side of ''Y'' object ====
    9 KB (1,305 words) - 03:17, 23 September 2014
  • | x,y,z | x,y,z
    2 KB (285 words) - 01:34, 14 July 2021
  • combinations n xs = [ y:ys | y:xs' <- tails xs combinations n xs = do y:xs' <- tails xs
    5 KB (659 words) - 19:40, 18 January 2014
  • compress (x:ys@(y:_)) | x == y = compress ys
    3 KB (454 words) - 15:07, 2 October 2020
  • ...ment with a more specific and less esoteric type than the more general and less foo_barL = lens _bar (\x y -> x { _bar = y })
    5 KB (742 words) - 19:22, 22 May 2022
  • insertAt x (y:ys) n = y:insertAt x ys (n-1)
    2 KB (354 words) - 14:31, 5 January 2024
  • Node y _ <- readIORef q print y
    10 KB (1,757 words) - 23:34, 24 July 2021
  • ...t (x,y,_) = L.sortBy (\(a,b) (x,y) -> compare (length b) (length y)) $ zip y x ...ombine_elements (a,b,c) (x,y,z) = ( (map ('0':) a) ++ (map ('1':) x), b ++ y, c+z)
    5 KB (738 words) - 19:53, 18 January 2014
  • let !y = k x u2 in y
    8 KB (1,236 words) - 12:36, 1 January 2024
  • [ (x, y) | x <- [1..3], y <- "ab"] ==> [ (x,y) | x <- [1..4], even x, y <- "ab" ] ==>
    4 KB (584 words) - 13:24, 22 April 2021
  • concatMap f xs = [ x <- xs, y <- f x -> y ] concatMap f xs = [ y | x <- xs, y <- f x ]
    6 KB (743 words) - 02:12, 5 August 2021
  • second (_, y, _) = y
    3 KB (452 words) - 21:07, 10 March 2019
  • It is used like <hask>x `asTypeOf` y</hask> and has the same value like <hask>x</hask>, but type inference asserts that <hask>x</hask> and <hask>y</hask> have the same type.
    3 KB (435 words) - 22:56, 12 June 2021
  • let dists = sort $ map (\(x,y) -> abs (nodeArray ! x - nodeArray ! y)) edges
    3 KB (420 words) - 22:52, 7 June 2017
  • g x y = if snd x < snd y then y else x if y <= n then 1 + a ! y else 1 + syr y
    8 KB (1,028 words) - 15:16, 16 September 2015
  • y = b in f x y
    6 KB (1,032 words) - 16:45, 2 December 2020
  • where if <code>x</code> and <code>y</code> are IO actions, then <code>(x >> y)</code> is the action that performs <code>x</code>, dropping the result, then performs <code>y</code> and returns its
    5 KB (958 words) - 15:20, 3 August 2022
  • move y,d1 let s = z-(x+y)
    2 KB (378 words) - 23:58, 5 April 2021

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