Search results

Jump to navigation Jump to search
  • and here is the proof that <hask>((.) <$> (:) <*> (:)) = (\y z -> y:y:z)</hask>: \y -> (\z -> (y:) ((y:) z)) = -- definition of (.)
    2 KB (220 words) - 20:45, 28 December 2014
  • add3 x y z = x + y + z add4 x y z u = x + y + z + u
    2 KB (240 words) - 23:49, 18 April 2021
  • -- > runList (fromList xs) f z == foldr f z xs -- > foldr f z (toList xs) == runList xs f z
    4 KB (693 words) - 13:33, 15 April 2024
  • iI f x y J z Ii = join (f <$> x <*> y) <*> z = do {x' <- x; y' <- y; f' <- f x y; z' <- z; return (f' z')}
    2 KB (365 words) - 18:50, 19 September 2017
  • ...tion which assigns an ordering to the "x y and z" axes and determines that z will be "out of" rather than "into" the plane) The mid points of the 27 small cubes are (x,y,z) where x,y,z ∈ {-10,0,10}.
    8 KB (1,020 words) - 01:02, 23 September 2018
  • get () = case box of { Just z -> z; } set z = box#x #= z
    3 KB (432 words) - 00:47, 24 February 2018
  • ...be bought, and moreover it can be done by x boxes of 6, y boxes of 9, and z boxes of 20. Below the code for <hask>buy</hask> is more tedious (understan Just(x,y,z) -> Just(x+1,y,z)
    6 KB (929 words) - 06:42, 21 November 2020
  • Exit z -> return z Continue z -> return $ Continue $ f z
    4 KB (707 words) - 09:43, 9 December 2014
  • impl (x:xs) p@(z:zs) | x == (head z) = impl xs ((x:z):zs)
    2 KB (347 words) - 21:03, 20 December 2018
  • f !x !y = z | otherwise = z
    4 KB (716 words) - 14:44, 8 January 2024
  • grahamScan' xs'@(x : xs) (y : z : ys) | turning x y z == TurnLeft = grahamScan' (y : xs') (z : ys)
    2 KB (298 words) - 03:42, 14 August 2021
  • | t == 'l' = 'a' <= c && c <= 'z' || 'A' <= c && c <= 'Z' identifier = isJust . matchRegexPR "^[a-zA-Z](-?[a-zA-Z0-9])*$"
    2 KB (346 words) - 03:47, 10 January 2017
  • ...</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
  • data BTree = Z | B Int BTree BTree deriving Show rep_x_sum Z _ = return (Z, 0)
    10 KB (1,757 words) - 23:34, 24 July 2021
  • ==Z Shell Completion for GHC, Cabal and Hugs== The Z Shell is a powerful shell with extensive completion support.
    2 KB (245 words) - 15:20, 6 February 2021
  • parse ([],[]) z = ([z], [[z]]) parse (stack, acc) z = (stack', acc')
    7 KB (1,025 words) - 02:14, 23 July 2021
  • $ ./a.out "%a %b %e %H:%M:%S %Z %Y"
    543 bytes (78 words) - 15:19, 6 February 2021
  • data Z = Z instance Card Z where
    9 KB (1,351 words) - 18:21, 6 June 2020
  • ...e <hask>construct</hask> here, calling this e.g. for a list <hask>[x,y,...,z]</hask> scans through the whole list as-if evaluating a nested lambda appli (f acc z)) ...)
    5 KB (891 words) - 14:21, 3 January 2018
  • data N = Z | S N Z + y = y
    9 KB (1,395 words) - 23:16, 24 July 2021

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