[vector] #54: Missing NFData instances for vector types

vector vector at projects.haskell.org
Sun Jan 29 12:41:01 GMT 2012


#54: Missing NFData instances for vector types
------------------------+---------------------------------------------------
Reporter:  hvr          |        Owner:          
    Type:  enhancement  |       Status:  reopened
Priority:  blocker      |    Milestone:  0.10    
 Version:  0.7          |   Resolution:          
Keywords:               |  
------------------------+---------------------------------------------------

Comment(by hvr):

 What about the variant below? it compiles with GHC 7.4 and seems to
 work...

 {{{
 #!hs
 {-# LANGUAGE MultiParamTypeClasses, FlexibleInstances #-}

 import Control.DeepSeq

 class Monad m => NFDataM m a where
     mrnf :: a -> m ()

 instance (Monad m, NFData a) => NFDataM m a where
     mrnf x = rnf x `seq` return ()
 }}}

-- 
Ticket URL: <http://trac.haskell.org/vector/ticket/54#comment:19>
vector <http://trac.haskell.org/vector>
Package vector


More information about the vector mailing list