Fix Trailing spaces

This commit is contained in:
Ranjeet Kumar Ranjan 2021-09-16 17:52:15 +05:30
parent e6e752b1be
commit 665072a350
3 changed files with 6 additions and 7 deletions

View File

@ -172,13 +172,13 @@ writeReadWithBufferOf inh devNull = IUF.fold fld unf (defaultChunkSize, inh)
{-# NOINLINE writeReadWithBufferOfMaybe #-}
writeReadWithBufferOfMaybe :: Handle -> Handle -> IO ()
writeReadWithBufferOfMaybe inh devNull = S.fold fld strm
writeReadWithBufferOfMaybe inh devNull = S.fold fld strm
where
fld = FH.writeMaybesWithBufferOf defaultChunkSize devNull
strm = ISS.justsOfTimeout defaultChunkSize 0.5
$ S.unfold FH.readWithBufferOf (defaultChunkSize, inh)
strm = ISS.justsOfTimeout defaultChunkSize 0.5
$ S.unfold FH.readWithBufferOf (defaultChunkSize, inh)
#ifdef INSPECTION
inspect $ hasNoTypeClasses 'writeReadWithBufferOf
@ -214,7 +214,7 @@ o_1_space_copy env =
, mkBench "FH.writeWithBufferOf . FH.readWithBufferOf" env $ \inh _ ->
writeReadWithBufferOf inh (nullH env)
, mkBench "FH.writeWithBufferOfMaybe . FH.readWithBufferOf" env $ \inh _ ->
writeReadWithBufferOfMaybe inh (nullH env)
writeReadWithBufferOfMaybe inh (nullH env)
]
]

View File

@ -701,5 +701,4 @@ instance Storable a => Monoid (Array a) where
{-# INLINE_NORMAL writeMaybesN #-}
writeMaybesN :: forall m a. (MonadIO m, Storable a)
=> Int -> Fold m (Maybe a) (Array a)
writeMaybesN n = unsafeFreeze <$> MA.writeMaybesN n
writeMaybesN n = unsafeFreeze <$> MA.writeMaybesN n

View File

@ -504,7 +504,7 @@ writeWithBufferOf2 :: MonadIO m => Int -> Fold2 m Handle Word8 ()
writeWithBufferOf2 n = FL.chunksOf2 n (writeNUnsafe n) writeChunks2
{-# INLINE writeMaybesWithBufferOf #-}
writeMaybesWithBufferOf :: (MonadIO m ) =>
writeMaybesWithBufferOf :: (MonadIO m ) =>
Int -> Handle -> Fold m (Maybe Word8) ()
writeMaybesWithBufferOf n h = FL.many (writeMaybesN n) (writeChunks h)