Search results

Jump to navigation Jump to search
  • quick (h:t)= quick [ y | y <- t , y < h] ++ [h] ++ quick [ y | y <- t , y > h] * { y | y ← t , y < h }
    1 KB (213 words) - 21:55, 5 April 2021
  • (\x -> 2*x*x + y) (\x -> 2*x*x + y)(7)
    878 bytes (133 words) - 16:57, 6 February 2016
  • layoutAux x y Empty = ([], Empty, []) layoutAux x y (Branch a l r) = (ll', Branch (a, (x,y)) l' r', rr')
    4 KB (637 words) - 03:42, 10 January 2017
  • generate (x :+ y) = binaryOp x y add generate (x :- y) = binaryOp x y sub
    3 KB (386 words) - 21:41, 23 April 2021
  • Partial application in Haskell involves passing less than the full number of arguments to a function that takes multiple argumen add x y = x + y
    1 KB (248 words) - 20:05, 13 May 2020
  • $ ./a.out "%a %b %e %H:%M:%S %Z %Y" $ ./a.out "%y-%m-%d"
    543 bytes (78 words) - 15:19, 6 February 2021
  • range x y = [x..y] range x y = take (y-x+1) $ iterate (+1) x
    1 KB (214 words) - 02:08, 5 April 2014
  • adjacent = [x | (x,y)<-e,y==top] ++ [x | (y,x)<-e,y==top]
    714 bytes (91 words) - 03:50, 10 January 2017
  • f x = (\y -> x + y)
    566 bytes (92 words) - 13:53, 1 January 2017
  • adjacent = [x | (x,y)<-e,y==top] ++ [x | (y,x)<-e,y==top]
    1 KB (123 words) - 03:51, 10 January 2017
  • ...module <hask>Mod</hask> exports four functions named <hask>x</hask>, <hask>y</hask>, <hask>z</hask>, and <hask>(+++)</hask>... | <hask>x, y, z, (+++), Mod.x, Mod.y, Mod.z, (Mod.+++)</hask>
    4 KB (659 words) - 10:27, 14 January 2024
  • ...go ls = [ x ++ [snd y] | x <- ls, y <- g, last x == fst y, not (snd y `elem` tail x)]
    1 KB (153 words) - 06:29, 31 July 2021
  • y:ys -> h y ys y:ys -> uncurry h $ viewRTotal y ys
    3 KB (506 words) - 04:03, 4 September 2017
  • tfs (x:y:xs) | y == ',' || y == ')' = return (y:xs, Branch x Empty Empty)
    2 KB (372 words) - 03:43, 10 January 2017
  • (Key _ x) `mappend` (Key k y) = Key k (x `mappend` y) measure (Elem x y) = Key x y
    2 KB (315 words) - 15:19, 6 February 2021
  • edgeIn g (x,y) = elem y (adjacent g x) weight x y g = head [c | (a,c) <- g!x, a == y]
    1 KB (189 words) - 03:50, 10 January 2017
  • \x y -> ... fun x y -> ...
    2 KB (293 words) - 16:34, 15 May 2023
  • polar (x, y) = atan2 (y - y0) (x - x0) grahamScan' xs [y] = y : xs
    2 KB (298 words) - 03:42, 14 August 2021
  • > mul xs ys = do x<-xs; y<-ys; return (x*y) > mul x' y' = do x<-x'; y<-y' return (x*y)
    3 KB (320 words) - 15:53, 21 June 2018
  • !y -> h y u2 !y -> h y u2
    13 KB (2,108 words) - 12:52, 1 January 2024

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