Search results

Jump to navigation Jump to search
  • I'm not sure about <code>Style</code> yet. type Context b v m = Style v ::: Name ::: SubMap b v m ::: ()
    7 KB (1,077 words) - 14:56, 12 June 2014
  • * jmelesky: i'm interested. maybe a "wrap a C library for hackage" hackathon?
    274 bytes (36 words) - 02:36, 9 April 2021
  • class Functor m where fmap :: (a -> b) -> m a -> m b
    8 KB (1,232 words) - 01:58, 8 October 2014
  • return :: (Monad m) => a -> m a liftM :: (Monad m) => (a1 -> r) -> m a1 -> m r
    7 KB (1,164 words) - 13:33, 22 May 2024
  • ...''m'' as precisely what you need in order to fold up a list of values of ''m''. class Semigroup m where
    7 KB (1,101 words) - 02:30, 27 December 2019
  • magic m n = m : (magic n (m+n)) ...me expression (bound to <code>m</code> in <code>magic n m = n : magic m (n+m)</code>), and so the second <code>(1+1)</code> is now 2 as well. The first
    4 KB (708 words) - 23:10, 19 April 2021
  • ...framework for writing stateful, elastically scalable, AP microservices. I'm probably going to be working on the cluster rebalancing system. Also, help ...for getting native cross platform GUI up and running quickly and easily. I'm probably going to work on patching the missing Linux High DPI support. Any
    2 KB (362 words) - 15:04, 21 October 2016
  • - foldM :: Monad m => (a -> b -> m a) -> a -> [b] -> m a + foldM :: (Foldable t, Monad m) => (b -> a -> m b) -> b -> t a -> m b
    14 KB (2,640 words) - 11:47, 26 November 2023
  • problem_21 = sum [m+n | m <- [2..9999], let n = divisorsSum ! m, amicable m n] where amicable m n = m < n && n < 10000 && divisorsSum ! n == m
    8 KB (1,054 words) - 15:53, 11 October 2015
  • newtype ListT m a = ListT { runListT :: m [a] } instance (Monad m) => Monad (ListT m) where
    13 KB (2,036 words) - 13:54, 4 July 2023
  • sort xs n f = let m = f xs in m : sort [x | x <- xs, x /= m] (n + 1) f
    2 KB (325 words) - 03:50, 10 January 2017
  • SETX /M PATH "%SDL_DIR%\bin;%PATH%" SETX /M LIBRARY_PATH "%SDL_DIR%\bin;C:\Programs\MinGW\lib;%LIBRARY_PATH%"
    6 KB (984 words) - 23:58, 17 June 2016
  • data T m = MkT (m Int) deriving Eq instance Eq (m Int) => Eq (T m) where ...
    5 KB (755 words) - 22:49, 12 June 2021
  • (**) Calculate Euler's totient function phi(m). ...ined as the number of positive integers r (1 <= r < m) that are coprime to m.
    1 KB (224 words) - 19:44, 18 January 2014
  • where I'm writing the kind argument explicitly. To be fully clear, I'm writing <hask>List</hask> for the type constructor for lists (written <hask
    2 KB (242 words) - 23:38, 24 July 2021
  • preInTree :: Monad m => String -> String -> m (Tree Char)
    2 KB (280 words) - 03:43, 10 January 2017
  • minus :: (Monad m) => [CharCount] -> [CharCount] -> m [CharCount]
    2 KB (256 words) - 15:19, 6 February 2021
  • Prelude> :m Database.HDBC Prelude Database.HDBC> :m + Database.HDBC.ODBC
    1 KB (210 words) - 11:52, 19 April 2021
  • unusual m f g = (m f [1,2,4,7] , m g ['A','C','M'] ) unusual m f g nu se poate infera un (cel mai mic) tip al lui m deoarece m este folosit odata ca <br>
    4 KB (617 words) - 03:01, 9 April 2021
  • import qualified Data.Map as M keys = \c -> myKeys c `M.union` keys desktopConfig c,
    4 KB (452 words) - 14:23, 2 May 2018

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