aeson-jsonpath
Safe HaskellSafe-Inferred
LanguageHaskell2010

Data.Aeson.JSONPath

Synopsis

Documentation

runJSPQuery :: JSPQuery -> Value -> Value Source #

Run JSONPath query

{-# LANGUAGE QuasiQuotes #-}

import Data.Aeson          (Value)
import Data.Aeson.JSONPath (runJSPQuery, jsonPath)

book :: Value
book = runJSPQuery [jsonPath|$.store.books[2]|] jsonDoc