Search results

Jump to navigation Jump to search
  • > data App x y > class Eval1 x y d | x -> y d
    10 KB (1,653 words) - 00:25, 12 July 2021
  • fmap f (Pair x y) = Pair (f x) (f y) liftL2 f x y = fmap (uncurry f) $ zipL x y
    7 KB (1,164 words) - 13:33, 22 May 2024
  • [[[ poly x y | i <- [0..], let x = m + 60*i, test x y ]
    5 KB (679 words) - 17:14, 4 February 2023
  • ...orker x y</hask> is equivalent to, but probably faster than, <hask>reverse y ++ x</hask>.
    2 KB (333 words) - 12:44, 4 June 2018
  • getRandomR (x,y) = RandT $ liftState $ randomR (x,y) getRandomRs (x,y) = RandT $ liftState $
    6 KB (894 words) - 13:41, 2 April 2019
  • y = div n m x = xs!!y
    8 KB (1,054 words) - 15:53, 11 October 2015
  • An applicative functor has more structure than a [[functor]] but less than a [[monad]]. See the Haddock docs for [https://hackage.haskell.org/pa g :: x -> y
    8 KB (1,326 words) - 08:20, 31 March 2022
  • zetaRange s (x,y) = [ fromIntegral n ** (-s) | n <- [x..y] ] cut (x,y) n = (x, x + mine - 1) : cut' (x + mine) size (y - mine)
    4 KB (555 words) - 10:58, 22 June 2021
  • show steps : [[charRep (x,y) | x <- [0..maxX]] | y <- [0..maxY]] where cells = map (\(y,xs) -> zipWith (\x c -> ((x,y),c)) [0..] xs)
    4 KB (516 words) - 15:19, 6 February 2021
  • ...by the <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 (f acc y))
    5 KB (891 words) - 14:21, 3 January 2018
  • y <- Just (5*7) return (x-y)
    10 KB (1,589 words) - 01:08, 27 September 2021
  • divides x y = y `mod` x == 0
    4 KB (546 words) - 19:18, 31 August 2016
  • diff (x:y:xs) = if fst x /= fst y then diff (y:xs) else False problem_63=length[x^y|x<-[1..9],y<-[1..22],y==(length$show$x^y)]
    6 KB (979 words) - 10:20, 18 May 2022
  • class Pair p x y | p -> x, p -> y where toPair :: p -> (x, y)
    4 KB (684 words) - 02:22, 18 May 2020
  • f x y | fst z <= n2 = z | otherwise = y
    6 KB (881 words) - 02:31, 8 May 2016
  • <math>\lambda\;x\;y\;.\;x</math> <math>\lambda\;x\;y\;z\;.\;x\;z\;(\;y\;z\;)</math>
    8 KB (1,374 words) - 14:33, 15 December 2022
  • x <= y = compare x y /= GT x < y = compare x y == LT
    4 KB (572 words) - 10:25, 9 October 2019
  • decodeModified = foldl (\x y -> x ++ decodeHelper y) []
    2 KB (362 words) - 17:33, 13 June 2020
  • if' False _ y = y flipCond cond (x,y) | cond = (x,y)
    6 KB (937 words) - 05:34, 10 December 2020
  • f x n y | n == 1 = x `mul` y
    4 KB (605 words) - 17:09, 18 July 2022

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