File tree Expand file tree Collapse file tree 4 files changed +8
-8
lines changed Expand file tree Collapse file tree 4 files changed +8
-8
lines changed Original file line number Diff line number Diff line change @@ -268,13 +268,13 @@ value = jsonWith (pure . KM.fromList)
268268--
269269-- ==== __Examples__
270270--
271- -- 'json' keeps only the first occurence of each key, using 'Data.Aeson.KeyMap.fromList'.
271+ -- 'json' keeps only the first occurrence of each key, using 'Data.Aeson.KeyMap.fromList'.
272272--
273273-- @
274274-- 'json' = 'jsonWith' ('Right' '.' 'H.fromList')
275275-- @
276276--
277- -- 'jsonLast' keeps the last occurence of each key, using
277+ -- 'jsonLast' keeps the last occurrence of each key, using
278278-- @'HashMap.Lazy.fromListWith' ('const' 'id')@.
279279--
280280-- @
@@ -309,7 +309,7 @@ jsonWith mkObject = fix $ \value_ -> do
309309 | otherwise -> fail " not a valid json value"
310310{-# INLINE jsonWith #-}
311311
312- -- | Variant of 'json' which keeps only the last occurence of every key.
312+ -- | Variant of 'json' which keeps only the last occurrence of every key.
313313jsonLast :: Parser Value
314314jsonLast = jsonWith (Right . KM. fromListWith (const id ))
315315
@@ -365,7 +365,7 @@ jsonWith' mkObject = fix $ \value_ -> do
365365 | otherwise -> fail " not a valid json value"
366366{-# INLINE jsonWith' #-}
367367
368- -- | Variant of 'json'' which keeps only the last occurence of every key.
368+ -- | Variant of 'json'' which keeps only the last occurrence of every key.
369369jsonLast' :: Parser Value
370370jsonLast' = jsonWith' (pure . KM. fromListWith (const id ))
371371
Original file line number Diff line number Diff line change @@ -464,7 +464,7 @@ instance Functor FromJSONKeyFunction where
464464-- are derived with generalized newtype deriving.
465465-- compatible with 'Text' i.e. hash values be equal for wrapped values as well.
466466--
467- -- On pre GHC 7.8 this is unconstrainted function.
467+ -- On pre GHC 7.8 this is unconstrained function.
468468fromJSONKeyCoerce ::
469469 Coercible Text a =>
470470 FromJSONKeyFunction a
@@ -557,7 +557,7 @@ typeOf v = case v of
557557 Null -> " Null"
558558
559559-------------------------------------------------------------------------------
560- -- Lifings of FromJSON and ToJSON to unary and binary type constructors
560+ -- Liftings of FromJSON and ToJSON to unary and binary type constructors
561561-------------------------------------------------------------------------------
562562
563563-- | Lifting of the 'FromJSON' class to unary type constructors.
Original file line number Diff line number Diff line change @@ -564,7 +564,7 @@ class GetConName f => GToJSONKey f
564564instance GetConName f => GToJSONKey f
565565
566566-------------------------------------------------------------------------------
567- -- Lifings of FromJSON and ToJSON to unary and binary type constructors
567+ -- Liftings of FromJSON and ToJSON to unary and binary type constructors
568568-------------------------------------------------------------------------------
569569
570570
Original file line number Diff line number Diff line change @@ -818,7 +818,7 @@ tests = testGroup "unit" [
818818 , testCase " Small rational" smallRationalDecoding
819819 , testCase " Big scientific exponent" bigScientificExponent
820820 , testCase " Big integer decoding" bigIntegerDecoding
821- , testCase " Big natural decading " bigNaturalDecoding
821+ , testCase " Big natural decoding " bigNaturalDecoding
822822 , testCase " Big integer key decoding" bigIntegerKeyDecoding
823823 , testGroup " QQ.Simple"
824824 [ testCase " example" $
You can’t perform that action at this time.
0 commit comments