Last active
May 1, 2020 14:57
-
-
Save monacoremo/baeff41fd7fde418d6684cfe4988c7d0 to your computer and use it in GitHub Desktop.
DbStructure JSON SQL query
This file contains hidden or bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
| test/with_tmp_db psql -f dbstructure.sql | sed -n '4p' | jq . > out.json |
This file contains hidden or bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
| -- SQL query for the structure of the database. This query defines what | |
| -- PostgREST 'sees' in your database. | |
| prepare dbstructure as | |
| with | |
| -- getDbStructure :: [Schema] -> PgVersion -> HT.Transaction DbStructure | |
| -- getDbStructure schemas pgVer = do | |
| -- HT.sql "set local schema ''" -- This voids the search path. The following queries need this for getting the fully qualified name(schema.name) of every db object | |
| -- tabs <- HT.statement () allTables | |
| -- cols <- HT.statement schemas $ allColumns tabs | |
| -- srcCols <- HT.statement schemas $ allSourceColumns cols pgVer | |
| -- m2oRels <- HT.statement () $ allM2ORels tabs cols | |
| -- keys <- HT.statement () $ allPrimaryKeys tabs | |
| -- procs <- HT.statement schemas allProcs | |
| -- | |
| -- let rels = addM2MRels . addO2MRels $ addViewM2ORels srcCols m2oRels | |
| -- cols' = addForeignKeys rels cols | |
| -- keys' = addViewPrimaryKeys srcCols keys | |
| -- | |
| -- return DbStructure { | |
| -- dbTables = tabs | |
| -- , dbColumns = cols' | |
| -- , dbRelations = rels | |
| -- , dbPrimaryKeys = keys' | |
| -- , dbProcs = procs | |
| -- , pgVersion = pgVer | |
| -- } | |
| -- | |
| -- decodeTables :: HD.Result [Table] | |
| -- decodeTables = | |
| -- HD.rowList tblRow | |
| -- where | |
| -- tblRow = Table <$> column HD.text | |
| -- <*> column HD.text | |
| -- <*> nullableColumn HD.text | |
| -- <*> column HD.bool | |
| -- | |
| -- decodeColumns :: [Table] -> HD.Result [Column] | |
| -- decodeColumns tables = | |
| -- mapMaybe (columnFromRow tables) <$> HD.rowList colRow | |
| -- where | |
| -- colRow = | |
| -- (,,,,,,,,,,,) | |
| -- <$> column HD.text <*> column HD.text | |
| -- <*> column HD.text <*> nullableColumn HD.text | |
| -- <*> column HD.int4 <*> column HD.bool | |
| -- <*> column HD.text <*> column HD.bool | |
| -- <*> nullableColumn HD.int4 | |
| -- <*> nullableColumn HD.int4 | |
| -- <*> nullableColumn HD.text | |
| -- <*> nullableColumn HD.text | |
| -- | |
| -- decodeRels :: [Table] -> [Column] -> HD.Result [Relation] | |
| -- decodeRels tables cols = | |
| -- mapMaybe (relFromRow tables cols) <$> HD.rowList relRow | |
| -- where | |
| -- relRow = (,,,,,,) | |
| -- <$> column HD.text | |
| -- <*> column HD.text | |
| -- <*> column HD.text | |
| -- <*> column (HD.array (HD.dimension replicateM (element HD.text))) | |
| -- <*> column HD.text | |
| -- <*> column HD.text | |
| -- <*> column (HD.array (HD.dimension replicateM (element HD.text))) | |
| -- | |
| -- decodePks :: [Table] -> HD.Result [PrimaryKey] | |
| -- decodePks tables = | |
| -- mapMaybe (pkFromRow tables) <$> HD.rowList pkRow | |
| -- where | |
| -- pkRow = (,,) <$> column HD.text <*> column HD.text <*> column HD.text | |
| -- | |
| -- decodeSourceColumns :: [Column] -> HD.Result [SourceColumn] | |
| -- decodeSourceColumns cols = | |
| -- mapMaybe (sourceColumnFromRow cols) <$> HD.rowList srcColRow | |
| -- where | |
| -- srcColRow = (,,,,,) | |
| -- <$> column HD.text <*> column HD.text | |
| -- <*> column HD.text <*> column HD.text | |
| -- <*> column HD.text <*> column HD.text | |
| -- | |
| -- sourceColumnFromRow :: [Column] -> (Text,Text,Text,Text,Text,Text) -> Maybe SourceColumn | |
| -- sourceColumnFromRow allCols (s1,t1,c1,s2,t2,c2) = (,) <$> col1 <*> col2 | |
| -- where | |
| -- col1 = findCol s1 t1 c1 | |
| -- col2 = findCol s2 t2 c2 | |
| -- findCol s t c = find (\col -> (tableSchema . colTable) col == s && (tableName . colTable) col == t && colName col == c) allCols | |
| -- | |
| -- decodeProcs :: HD.Result ProcsMap | |
| -- decodeProcs = | |
| -- -- Duplicate rows for a function means they're overloaded, order these by least args according to ProcDescription Ord instance | |
| -- map sort . M.fromListWith (++) . map ((\(x,y) -> (x, [y])) . addKey) <$> HD.rowList procRow | |
| -- where | |
| -- procRow = ProcDescription | |
| -- <$> column HD.text | |
| -- <*> column HD.text | |
| -- <*> nullableColumn HD.text | |
| -- <*> (parseArgs <$> column HD.text) | |
| -- <*> (parseRetType | |
| -- <$> column HD.text | |
| -- <*> column HD.text | |
| -- <*> column HD.bool | |
| -- <*> column HD.char) | |
| -- <*> (parseVolatility <$> column HD.char) | |
| -- | |
| -- addKey :: ProcDescription -> (QualifiedIdentifier, ProcDescription) | |
| -- addKey pd = (QualifiedIdentifier (pdSchema pd) (pdName pd), pd) | |
| -- | |
| -- parseArgs :: Text -> [PgArg] | |
| -- parseArgs = mapMaybe parseArg . filter (not . isPrefixOf "OUT" . toS) . map strip . split (==',') | |
| -- | |
| -- parseArg :: Text -> Maybe PgArg | |
| -- parseArg a = | |
| -- let arg = lastDef "" $ splitOn "INOUT " a | |
| -- (body, def) = breakOn " DEFAULT " arg | |
| -- (name, typ) = breakOn " " body in | |
| -- if T.null typ | |
| -- then Nothing | |
| -- else Just $ | |
| -- PgArg (dropAround (== '"') name) (strip typ) (T.null def) | |
| -- | |
| -- parseRetType :: Text -> Text -> Bool -> Char -> RetType | |
| -- parseRetType schema name isSetOf typ | |
| -- | isSetOf = SetOf pgType | |
| -- | otherwise = Single pgType | |
| -- where | |
| -- qi = QualifiedIdentifier schema name | |
| -- pgType = case typ of | |
| -- 'c' -> Composite qi | |
| -- 'p' -> if name == "record" -- Only pg pseudo type that is a row type is 'record' | |
| -- then Composite qi | |
| -- else Scalar qi | |
| -- _ -> Scalar qi -- 'b'ase, 'd'omain, 'e'num, 'r'ange | |
| -- | |
| -- parseVolatility :: Char -> ProcVolatility | |
| -- parseVolatility v | v == 'i' = Immutable | |
| -- | v == 's' = Stable | |
| -- | otherwise = Volatile -- only 'v' can happen here | |
| -- | |
| -- allProcs :: H.Statement [Schema] ProcsMap | |
| -- allProcs = H.Statement (toS sql) (arrayParam HE.text) decodeProcs True | |
| -- where | |
| -- sql = procsSqlQuery <> " WHERE pn.nspname = ANY($1)" | |
| -- | |
| -- accessibleProcs :: H.Statement Schema ProcsMap | |
| -- accessibleProcs = H.Statement (toS sql) (param HE.text) decodeProcs True | |
| -- where | |
| -- sql = procsSqlQuery <> " WHERE pn.nspname = $1 AND has_function_privilege(p.oid, 'execute')" | |
| -- | |
| -- procsSqlQuery :: SqlQuery | |
| -- procsSqlQuery = [q| | |
| procs as ( | |
| SELECT | |
| pn.nspname as proc_schema, | |
| p.proname as proc_name, | |
| d.description as proc_description, | |
| pg_get_function_arguments(p.oid) as args, | |
| tn.nspname as rettype_schema, | |
| coalesce(comp.relname, t.typname) as rettype_name, | |
| p.proretset as rettype_is_setof, | |
| t.typtype as rettype_typ, | |
| p.provolatile | |
| FROM pg_proc p | |
| JOIN pg_namespace pn ON pn.oid = p.pronamespace | |
| JOIN pg_type t ON t.oid = p.prorettype | |
| JOIN pg_namespace tn ON tn.oid = t.typnamespace | |
| LEFT JOIN pg_class comp ON comp.oid = t.typrelid | |
| LEFT JOIN pg_catalog.pg_description as d on d.objoid = p.oid | |
| WHERE | |
| pn.nspname NOT IN ('pg_catalog', 'information_schema') | |
| ), | |
| -- | |
| -- schemaDescription :: H.Statement Schema (Maybe Text) | |
| -- schemaDescription = | |
| -- H.Statement sql (param HE.text) (join <$> HD.rowMaybe (nullableColumn HD.text)) True | |
| -- where | |
| -- sql = [q| | |
| schema_description as ( | |
| select | |
| description | |
| from | |
| pg_catalog.pg_namespace n | |
| left join pg_catalog.pg_description d on d.objoid = n.oid | |
| where | |
| n.nspname = $1 | |
| ), | |
| -- accessibleTables :: H.Statement Schema [Table] | |
| -- accessibleTables = | |
| -- H.Statement sql (param HE.text) decodeTables True | |
| -- where | |
| -- sql = [q| | |
| accessible_tables as ( | |
| select | |
| n.nspname as table_schema, | |
| relname as table_name, | |
| d.description as table_description, | |
| ( | |
| c.relkind in ('r', 'v', 'f') | |
| and (pg_relation_is_updatable(c.oid::regclass, false) & 8) = 8 | |
| -- The function `pg_relation_is_updateable` returns a bitmask where 8 | |
| -- corresponds to `1 << CMD_INSERT` in the PostgreSQL source code, i.e. | |
| -- it's possible to insert into the relation. | |
| or (exists ( | |
| select 1 | |
| from pg_trigger | |
| where | |
| pg_trigger.tgrelid = c.oid | |
| and (pg_trigger.tgtype::integer & 69) = 69) | |
| -- The trigger type `tgtype` is a bitmask where 69 corresponds to | |
| -- TRIGGER_TYPE_ROW + TRIGGER_TYPE_INSTEAD + TRIGGER_TYPE_INSERT | |
| -- in the PostgreSQL source code. | |
| ) | |
| ) as insertable | |
| from | |
| pg_class c | |
| join pg_namespace n on n.oid = c.relnamespace | |
| left join pg_catalog.pg_description as d on d.objoid = c.oid and d.objsubid = 0 | |
| where | |
| c.relkind in ('v', 'r', 'm', 'f') | |
| and n.nspname = $1 | |
| and ( | |
| pg_has_role(c.relowner, 'USAGE') | |
| or has_table_privilege(c.oid, 'SELECT, INSERT, UPDATE, DELETE, TRUNCATE, REFERENCES, TRIGGER') | |
| or has_any_column_privilege(c.oid, 'SELECT, INSERT, UPDATE, REFERENCES') | |
| ) | |
| order by relname | |
| ), | |
| -- | |
| -- addForeignKeys :: [Relation] -> [Column] -> [Column] | |
| -- addForeignKeys rels = map addFk | |
| -- where | |
| -- addFk col = col { colFK = fk col } | |
| -- fk col = find (lookupFn col) rels >>= relToFk col | |
| -- lookupFn :: Column -> Relation -> Bool | |
| -- lookupFn c Relation{relColumns=cs, relType=rty} = c `elem` cs && rty==M2O | |
| -- relToFk col Relation{relColumns=cols, relFColumns=colsF} = do | |
| -- pos <- L.elemIndex col cols | |
| -- colF <- atMay colsF pos | |
| -- return $ ForeignKey colF | |
| -- | |
| -- {- | |
| -- Adds Views M2O Relations based on SourceColumns found, the logic is as follows: | |
| -- | |
| -- Having a Relation{relTable=t1, relColumns=[c1], relFTable=t2, relFColumns=[c2], relType=M2O} represented by: | |
| -- | |
| -- t1.c1------t2.c2 | |
| -- | |
| -- When only having a t1_view.c1 source column, we need to add a View-Table M2O Relation | |
| -- | |
| -- t1.c1----t2.c2 t1.c1----------t2.c2 | |
| -- -> ________/ | |
| -- / | |
| -- t1_view.c1 t1_view.c1 | |
| -- | |
| -- | |
| -- When only having a t2_view.c2 source column, we need to add a Table-View M2O Relation | |
| -- | |
| -- t1.c1----t2.c2 t1.c1----------t2.c2 | |
| -- -> \________ | |
| -- \ | |
| -- t2_view.c2 t2_view.c1 | |
| -- | |
| -- When having t1_view.c1 and a t2_view.c2 source columns, we need to add a View-View M2O Relation in addition to the prior | |
| -- | |
| -- t1.c1----t2.c2 t1.c1----------t2.c2 | |
| -- -> \________/ | |
| -- / \ | |
| -- t1_view.c1 t2_view.c2 t1_view.c1-------t2_view.c1 | |
| -- | |
| -- The logic for composite pks is similar just need to make sure all the Relation columns have source columns. | |
| -- -} | |
| -- addViewM2ORels :: [SourceColumn] -> [Relation] -> [Relation] | |
| -- addViewM2ORels allSrcCols = concatMap (\rel -> | |
| -- rel : case rel of | |
| -- Relation{relType=M2O, relTable, relColumns, relConstraint, relFTable, relFColumns} -> | |
| -- | |
| -- let srcColsGroupedByView :: [Column] -> [[SourceColumn]] | |
| -- srcColsGroupedByView relCols = L.groupBy (\(_, viewCol1) (_, viewCol2) -> colTable viewCol1 == colTable viewCol2) $ | |
| -- filter (\(c, _) -> c `elem` relCols) allSrcCols | |
| -- relSrcCols = srcColsGroupedByView relColumns | |
| -- relFSrcCols = srcColsGroupedByView relFColumns | |
| -- getView :: [SourceColumn] -> Table | |
| -- getView = colTable . snd . unsafeHead | |
| -- srcCols `allSrcColsOf` cols = S.fromList (fst <$> srcCols) == S.fromList cols | |
| -- -- Relation is dependent on the order of relColumns and relFColumns to get the join conditions right in the generated query. | |
| -- -- So we need to change the order of the SourceColumns to match the relColumns | |
| -- -- TODO: This could be avoided if the Relation type is improved with a structure that maintains the association of relColumns and relFColumns | |
| -- srcCols `sortAccordingTo` cols = sortOn (\(k, _) -> L.lookup k $ zip cols [0::Int ..]) srcCols | |
| -- | |
| -- viewTableM2O = | |
| -- [ Relation (getView srcCols) (snd <$> srcCols `sortAccordingTo` relColumns) | |
| -- relConstraint relFTable relFColumns | |
| -- M2O Nothing | |
| -- | srcCols <- relSrcCols, srcCols `allSrcColsOf` relColumns ] | |
| -- | |
| -- tableViewM2O = | |
| -- [ Relation relTable relColumns | |
| -- relConstraint | |
| -- (getView fSrcCols) (snd <$> fSrcCols `sortAccordingTo` relFColumns) | |
| -- M2O Nothing | |
| -- | fSrcCols <- relFSrcCols, fSrcCols `allSrcColsOf` relFColumns ] | |
| -- | |
| -- viewViewM2O = | |
| -- [ Relation (getView srcCols) (snd <$> srcCols `sortAccordingTo` relColumns) | |
| -- relConstraint | |
| -- (getView fSrcCols) (snd <$> fSrcCols `sortAccordingTo` relFColumns) | |
| -- M2O Nothing | |
| -- | srcCols <- relSrcCols, srcCols `allSrcColsOf` relColumns | |
| -- , fSrcCols <- relFSrcCols, fSrcCols `allSrcColsOf` relFColumns ] | |
| -- | |
| -- in viewTableM2O ++ tableViewM2O ++ viewViewM2O | |
| -- | |
| -- _ -> []) | |
| -- | |
| -- addO2MRels :: [Relation] -> [Relation] | |
| -- addO2MRels = concatMap (\rel@(Relation t c cn ft fc _ _) -> [rel, Relation ft fc cn t c O2M Nothing]) | |
| -- | |
| -- addM2MRels :: [Relation] -> [Relation] | |
| -- addM2MRels rels = rels ++ addMirrorRel (mapMaybe junction2Rel junctions) | |
| -- where | |
| -- junctions = join $ map (combinations 2) $ filter (not . null) $ groupWith groupFn $ filter ( (==M2O). relType) rels | |
| -- groupFn :: Relation -> Text | |
| -- groupFn Relation{relTable=Table{tableSchema=s, tableName=t}} = s <> "_" <> t | |
| -- -- Reference : https://wiki.haskell.org/99_questions/Solutions/26 | |
| -- combinations :: Int -> [a] -> [[a]] | |
| -- combinations 0 _ = [ [] ] | |
| -- combinations n xs = [ y:ys | y:xs' <- tails xs | |
| -- , ys <- combinations (n-1) xs'] | |
| -- junction2Rel [ | |
| -- Relation{relTable=jt, relColumns=jc1, relConstraint=const1, relFTable=t, relFColumns=c}, | |
| -- Relation{ relColumns=jc2, relConstraint=const2, relFTable=ft, relFColumns=fc} | |
| -- ] | |
| -- | jc1 /= jc2 && length jc1 == 1 && length jc2 == 1 = Just $ Relation t c Nothing ft fc M2M (Just $ Junction jt const1 jc1 const2 jc2) | |
| -- | otherwise = Nothing | |
| -- junction2Rel _ = Nothing | |
| -- addMirrorRel = concatMap (\rel@(Relation t c _ ft fc _ (Just (Junction jt const1 jc1 const2 jc2))) -> | |
| -- [rel, Relation ft fc Nothing t c M2M (Just (Junction jt const2 jc2 const1 jc1))]) | |
| -- | |
| -- addViewPrimaryKeys :: [SourceColumn] -> [PrimaryKey] -> [PrimaryKey] | |
| -- addViewPrimaryKeys srcCols = concatMap (\pk -> | |
| -- let viewPks = (\(_, viewCol) -> PrimaryKey{pkTable=colTable viewCol, pkName=colName viewCol}) <$> | |
| -- filter (\(col, _) -> colTable col == pkTable pk && colName col == pkName pk) srcCols in | |
| -- pk : viewPks) | |
| -- | |
| -- allTables :: H.Statement () [Table] | |
| -- allTables = | |
| -- H.Statement sql HE.noParams decodeTables True | |
| -- where | |
| -- sql = [q| | |
| all_tables as ( | |
| SELECT | |
| n.nspname AS table_schema, | |
| c.relname AS table_name, | |
| NULL AS table_description, | |
| ( | |
| c.relkind IN ('r', 'v','f') | |
| AND (pg_relation_is_updatable(c.oid::regclass, FALSE) & 8) = 8 | |
| OR EXISTS ( | |
| SELECT 1 | |
| FROM pg_trigger | |
| WHERE | |
| pg_trigger.tgrelid = c.oid | |
| AND (pg_trigger.tgtype::integer & 69) = 69 | |
| ) | |
| ) AS insertable | |
| FROM pg_class c | |
| JOIN pg_namespace n ON n.oid = c.relnamespace | |
| WHERE c.relkind IN ('v','r','m','f') | |
| AND n.nspname NOT IN ('pg_catalog', 'information_schema') | |
| GROUP BY table_schema, table_name, insertable | |
| ORDER BY table_schema, table_name | |
| ), | |
| -- allColumns :: [Table] -> H.Statement [Schema] [Column] | |
| -- allColumns tabs = | |
| -- H.Statement sql (arrayParam HE.text) (decodeColumns tabs) True | |
| -- where | |
| -- sql = [q| | |
| all_columns as ( | |
| SELECT DISTINCT | |
| info.table_schema AS schema, | |
| info.table_name AS table_name, | |
| info.column_name AS name, | |
| info.description AS description, | |
| info.ordinal_position AS position, | |
| info.is_nullable::boolean AS nullable, | |
| info.data_type AS col_type, | |
| info.is_updatable::boolean AS updatable, | |
| info.character_maximum_length AS max_len, | |
| info.numeric_precision AS precision, | |
| info.column_default AS default_value, | |
| array_to_string(enum_info.vals, ',') AS enum | |
| FROM ( | |
| -- CTE based on pg_catalog to get PRIMARY/FOREIGN key and UNIQUE columns outside api schema | |
| WITH key_columns AS ( | |
| SELECT | |
| r.oid AS r_oid, | |
| c.oid AS c_oid, | |
| n.nspname, | |
| c.relname, | |
| r.conname, | |
| r.contype, | |
| unnest(r.conkey) AS conkey | |
| FROM | |
| pg_catalog.pg_constraint r, | |
| pg_catalog.pg_class c, | |
| pg_catalog.pg_namespace n | |
| WHERE | |
| r.contype IN ('f', 'p', 'u') | |
| AND c.relkind IN ('r', 'v', 'f', 'm') | |
| AND r.conrelid = c.oid | |
| AND c.relnamespace = n.oid | |
| AND n.nspname <> ANY (ARRAY['pg_catalog', 'information_schema'] || $2) | |
| ), | |
| /* | |
| -- CTE based on information_schema.columns | |
| -- changed: | |
| -- remove the owner filter | |
| -- limit columns to the ones in the api schema or PK/FK columns | |
| */ | |
| columns AS ( | |
| SELECT | |
| nc.nspname::name AS table_schema, | |
| c.relname::name AS table_name, | |
| a.attname::name AS column_name, | |
| d.description AS description, | |
| a.attnum::integer AS ordinal_position, | |
| pg_get_expr(ad.adbin, ad.adrelid)::text AS column_default, | |
| not (a.attnotnull OR t.typtype = 'd' AND t.typnotnull) AS is_nullable, | |
| CASE | |
| WHEN t.typtype = 'd' THEN | |
| CASE | |
| WHEN bt.typelem <> 0::oid AND bt.typlen = (-1) THEN 'ARRAY'::text | |
| WHEN nbt.nspname = 'pg_catalog'::name THEN format_type(t.typbasetype, NULL::integer) | |
| ELSE format_type(a.atttypid, a.atttypmod) | |
| END | |
| ELSE | |
| CASE | |
| WHEN t.typelem <> 0::oid AND t.typlen = (-1) THEN 'ARRAY'::text | |
| WHEN nt.nspname = 'pg_catalog'::name THEN format_type(a.atttypid, NULL::integer) | |
| ELSE format_type(a.atttypid, a.atttypmod) | |
| END | |
| END::text AS data_type, | |
| information_schema._pg_char_max_length( | |
| information_schema._pg_truetypid(a.*, t.*), | |
| information_schema._pg_truetypmod(a.*, t.*) | |
| )::integer AS character_maximum_length, | |
| information_schema._pg_numeric_precision( | |
| information_schema._pg_truetypid(a.*, t.*), | |
| information_schema._pg_truetypmod(a.*, t.*) | |
| )::integer AS numeric_precision, | |
| COALESCE(bt.typname, t.typname)::name AS udt_name, | |
| ( | |
| c.relkind in ('r', 'v', 'f') | |
| AND pg_column_is_updatable(c.oid::regclass, a.attnum, false) | |
| )::bool is_updatable | |
| FROM pg_attribute a | |
| LEFT JOIN key_columns kc | |
| ON kc.conkey = a.attnum AND kc.c_oid = a.attrelid | |
| LEFT JOIN pg_catalog.pg_description AS d | |
| ON d.objoid = a.attrelid and d.objsubid = a.attnum | |
| LEFT JOIN pg_attrdef ad | |
| ON a.attrelid = ad.adrelid AND a.attnum = ad.adnum | |
| JOIN (pg_class c JOIN pg_namespace nc ON c.relnamespace = nc.oid) | |
| ON a.attrelid = c.oid | |
| JOIN (pg_type t JOIN pg_namespace nt ON t.typnamespace = nt.oid) | |
| ON a.atttypid = t.oid | |
| LEFT JOIN (pg_type bt JOIN pg_namespace nbt ON bt.typnamespace = nbt.oid) | |
| ON t.typtype = 'd' AND t.typbasetype = bt.oid | |
| LEFT JOIN (pg_collation co JOIN pg_namespace nco ON co.collnamespace = nco.oid) | |
| ON a.attcollation = co.oid AND (nco.nspname <> 'pg_catalog'::name OR co.collname <> 'default'::name) | |
| WHERE | |
| NOT pg_is_other_temp_schema(nc.oid) | |
| AND a.attnum > 0 | |
| AND NOT a.attisdropped | |
| AND c.relkind in ('r', 'v', 'f', 'm') | |
| -- Filter only columns that are FK/PK or in the api schema: | |
| AND (nc.nspname = ANY ($2) OR kc.r_oid IS NOT NULL) | |
| ) | |
| SELECT | |
| table_schema, | |
| table_name, | |
| column_name, | |
| description, | |
| ordinal_position, | |
| is_nullable, | |
| data_type, | |
| is_updatable, | |
| character_maximum_length, | |
| numeric_precision, | |
| column_default, | |
| udt_name | |
| FROM columns | |
| WHERE table_schema NOT IN ('pg_catalog', 'information_schema') | |
| ) AS info | |
| LEFT OUTER JOIN ( | |
| SELECT | |
| n.nspname AS s, | |
| t.typname AS n, | |
| array_agg(e.enumlabel ORDER BY e.enumsortorder) AS vals | |
| FROM pg_type t | |
| JOIN pg_enum e ON t.oid = e.enumtypid | |
| JOIN pg_catalog.pg_namespace n ON n.oid = t.typnamespace | |
| GROUP BY s,n | |
| ) AS enum_info ON (info.udt_name = enum_info.n) | |
| ORDER BY schema, position | |
| ), | |
| -- columnFromRow :: [Table] -> | |
| -- (Text, Text, Text, | |
| -- Maybe Text, Int32, Bool, | |
| -- Text, Bool, Maybe Int32, | |
| -- Maybe Int32, Maybe Text, Maybe Text) | |
| -- -> Maybe Column | |
| -- columnFromRow tabs (s, t, n, desc, pos, nul, typ, u, l, p, d, e) = buildColumn <$> table | |
| -- where | |
| -- buildColumn tbl = Column tbl n desc pos nul typ u l p d (parseEnum e) Nothing | |
| -- table = find (\tbl -> tableSchema tbl == s && tableName tbl == t) tabs | |
| -- parseEnum :: Maybe Text -> [Text] | |
| -- parseEnum = maybe [] (split (==',')) | |
| -- | |
| -- allM2ORels :: [Table] -> [Column] -> H.Statement () [Relation] | |
| -- allM2ORels tabs cols = | |
| -- H.Statement sql HE.noParams (decodeRels tabs cols) True | |
| -- where | |
| -- sql = [q| | |
| m2o_rels as ( | |
| SELECT ns1.nspname AS table_schema, | |
| tab.relname AS table_name, | |
| conname AS constraint_name, | |
| column_info.cols AS columns, | |
| ns2.nspname AS foreign_table_schema, | |
| other.relname AS foreign_table_name, | |
| column_info.refs AS foreign_columns | |
| FROM pg_constraint, | |
| LATERAL ( | |
| SELECT array_agg(cols.attname) AS cols, | |
| array_agg(cols.attnum) AS nums, | |
| array_agg(refs.attname) AS refs | |
| FROM ( SELECT unnest(conkey) AS col, unnest(confkey) AS ref) k, | |
| LATERAL (SELECT * FROM pg_attribute WHERE attrelid = conrelid AND attnum = col) AS cols, | |
| LATERAL (SELECT * FROM pg_attribute WHERE attrelid = confrelid AND attnum = ref) AS refs) AS column_info, | |
| LATERAL (SELECT * FROM pg_namespace WHERE pg_namespace.oid = connamespace) AS ns1, | |
| LATERAL (SELECT * FROM pg_class WHERE pg_class.oid = conrelid) AS tab, | |
| LATERAL (SELECT * FROM pg_class WHERE pg_class.oid = confrelid) AS other, | |
| LATERAL (SELECT * FROM pg_namespace WHERE pg_namespace.oid = other.relnamespace) AS ns2 | |
| WHERE confrelid != 0 | |
| ORDER BY (conrelid, column_info.nums) | |
| ), | |
| -- relFromRow :: [Table] -> [Column] -> (Text, Text, Text, [Text], Text, Text, [Text]) -> Maybe Relation | |
| -- relFromRow allTabs allCols (rs, rt, cn, rcs, frs, frt, frcs) = | |
| -- Relation <$> table <*> cols <*> pure (Just cn) <*> tableF <*> colsF <*> pure M2O <*> pure Nothing | |
| -- where | |
| -- findTable s t = find (\tbl -> tableSchema tbl == s && tableName tbl == t) allTabs | |
| -- findCol s t c = find (\col -> tableSchema (colTable col) == s && tableName (colTable col) == t && colName col == c) allCols | |
| -- table = findTable rs rt | |
| -- tableF = findTable frs frt | |
| -- cols = mapM (findCol rs rt) rcs | |
| -- colsF = mapM (findCol frs frt) frcs | |
| -- | |
| -- allPrimaryKeys :: [Table] -> H.Statement () [PrimaryKey] | |
| -- allPrimaryKeys tabs = | |
| -- H.Statement sql HE.noParams (decodePks tabs) True | |
| -- where | |
| -- sql = [q| | |
| primary_keys as ( | |
| -- CTE to replace information_schema.table_constraints to remove owner limit | |
| WITH tc AS ( | |
| SELECT | |
| c.conname::name AS constraint_name, | |
| nr.nspname::name AS table_schema, | |
| r.relname::name AS table_name | |
| FROM pg_namespace nc, | |
| pg_namespace nr, | |
| pg_constraint c, | |
| pg_class r | |
| WHERE | |
| nc.oid = c.connamespace | |
| AND nr.oid = r.relnamespace | |
| AND c.conrelid = r.oid | |
| AND r.relkind = 'r' | |
| AND NOT pg_is_other_temp_schema(nr.oid) | |
| AND c.contype = 'p' | |
| ), | |
| -- CTE to replace information_schema.key_column_usage to remove owner limit | |
| kc AS ( | |
| SELECT | |
| ss.conname::name AS constraint_name, | |
| ss.nr_nspname::name AS table_schema, | |
| ss.relname::name AS table_name, | |
| a.attname::name AS column_name, | |
| (ss.x).n::integer AS ordinal_position, | |
| CASE | |
| WHEN ss.contype = 'f' THEN information_schema._pg_index_position(ss.conindid, ss.confkey[(ss.x).n]) | |
| ELSE NULL::integer | |
| END::integer AS position_in_unique_constraint | |
| FROM pg_attribute a, | |
| ( SELECT r.oid AS roid, | |
| r.relname, | |
| r.relowner, | |
| nc.nspname AS nc_nspname, | |
| nr.nspname AS nr_nspname, | |
| c.oid AS coid, | |
| c.conname, | |
| c.contype, | |
| c.conindid, | |
| c.confkey, | |
| information_schema._pg_expandarray(c.conkey) AS x | |
| FROM pg_namespace nr, | |
| pg_class r, | |
| pg_namespace nc, | |
| pg_constraint c | |
| WHERE | |
| nr.oid = r.relnamespace | |
| AND r.oid = c.conrelid | |
| AND nc.oid = c.connamespace | |
| AND c.contype in ('p', 'u', 'f') | |
| AND r.relkind = 'r' | |
| AND NOT pg_is_other_temp_schema(nr.oid) | |
| ) ss | |
| WHERE | |
| ss.roid = a.attrelid | |
| AND a.attnum = (ss.x).x | |
| AND NOT a.attisdropped | |
| ) | |
| SELECT | |
| kc.table_schema, | |
| kc.table_name, | |
| kc.column_name | |
| FROM | |
| tc, kc | |
| WHERE | |
| kc.table_name = tc.table_name AND | |
| kc.table_schema = tc.table_schema AND | |
| kc.constraint_name = tc.constraint_name AND | |
| kc.table_schema NOT IN ('pg_catalog', 'information_schema') | |
| ), | |
| -- pkFromRow :: [Table] -> (Schema, Text, Text) -> Maybe PrimaryKey | |
| -- pkFromRow tabs (s, t, n) = PrimaryKey <$> table <*> pure n | |
| -- where table = find (\tbl -> tableSchema tbl == s && tableName tbl == t) tabs | |
| -- | |
| -- allSourceColumns :: [Column] -> PgVersion -> H.Statement [Schema] [SourceColumn] | |
| -- allSourceColumns cols pgVer = | |
| -- H.Statement sql (arrayParam HE.text) (decodeSourceColumns cols) True | |
| -- -- query explanation at https://gist.github.com/steve-chavez/7ee0e6590cddafb532e5f00c46275569 | |
| -- where | |
| -- subselectRegex :: Text | |
| -- -- "result" appears when the subselect is used inside "case when", see `authors_have_book_in_decade` fixture | |
| -- -- "resno" appears in every other case | |
| -- -- when copying the query into pg make sure you omit one backslash from \\d+, it should be like `\d+` for the regex | |
| -- subselectRegex | pgVer < pgVersion100 = ":subselect {.*?:constraintDeps <>} :location \\d+} :res(no|ult)" | |
| -- | otherwise = ":subselect {.*?:stmt_len 0} :location \\d+} :res(no|ult)" | |
| -- sql = [qc| | |
| source_columns as ( | |
| with | |
| views as ( | |
| select | |
| n.nspname as view_schema, | |
| c.relname as view_name, | |
| r.ev_action as view_definition | |
| from pg_class c | |
| join pg_namespace n on n.oid = c.relnamespace | |
| join pg_rewrite r on r.ev_class = c.oid | |
| where c.relkind in ('v', 'm') and n.nspname = ANY ($2) | |
| ), | |
| removed_subselects as( | |
| select | |
| view_schema, view_name, | |
| regexp_replace(view_definition, '{subselectRegex}', '', 'g') as x | |
| from views | |
| ), | |
| target_lists as( | |
| select | |
| view_schema, view_name, | |
| regexp_split_to_array(x, 'targetList') as x | |
| from removed_subselects | |
| ), | |
| last_target_list_wo_tail as( | |
| select | |
| view_schema, view_name, | |
| (regexp_split_to_array(x[array_upper(x, 1)], ':onConflict'))[1] as x | |
| from target_lists | |
| ), | |
| target_entries as( | |
| select | |
| view_schema, view_name, | |
| unnest(regexp_split_to_array(x, 'TARGETENTRY')) as entry | |
| from last_target_list_wo_tail | |
| ), | |
| results as( | |
| select | |
| view_schema, view_name, | |
| substring(entry from ':resname (.*?) :') as view_colum_name, | |
| substring(entry from ':resorigtbl (.*?) :') as resorigtbl, | |
| substring(entry from ':resorigcol (.*?) :') as resorigcol | |
| from target_entries | |
| ) | |
| select | |
| sch.nspname as table_schema, | |
| tbl.relname as table_name, | |
| col.attname as table_column_name, | |
| res.view_schema, | |
| res.view_name, | |
| res.view_colum_name | |
| from results res | |
| join pg_class tbl on tbl.oid::text = res.resorigtbl | |
| join pg_attribute col on col.attrelid = tbl.oid and col.attnum::text = res.resorigcol | |
| join pg_namespace sch on sch.oid = tbl.relnamespace | |
| where resorigtbl <> '0' | |
| order by view_schema, view_name, view_colum_name | |
| ), | |
| -- getPgVersion :: H.Session PgVersion | |
| -- getPgVersion = H.statement () $ H.Statement sql HE.noParams versionRow False | |
| -- where | |
| pg_version as ( | |
| SELECT | |
| current_setting('server_version_num')::integer as server_version_num, | |
| current_setting('server_version') as server_version | |
| ) | |
| -- versionRow = HD.singleRow $ PgVersion <$> column HD.int4 <*> column HD.text | |
| select | |
| json_build_object( | |
| 'procs', procs_agg.array_agg, | |
| 'schema_description', schema_description, | |
| 'accessible_tables', accessible_tables_agg.array_agg, | |
| 'tables', tables_agg.array_agg, | |
| 'columns', columns_agg.array_agg, | |
| 'm2o_rels', m2o_rels_agg.array_agg, | |
| 'primary_keys', primary_keys_agg.array_agg, | |
| 'source_columns', source_columns_agg.array_agg, | |
| 'pg_version', pg_version | |
| ) as dbstructure | |
| from | |
| (select array_agg(procs) from procs) procs_agg, | |
| schema_description, | |
| (select array_agg(accessible_tables) from accessible_tables) as accessible_tables_agg, | |
| (select array_agg(all_tables) from all_tables) as tables_agg, | |
| (select array_agg(all_columns) from all_columns) as columns_agg, | |
| (select array_agg(m2o_rels) from m2o_rels) as m2o_rels_agg, | |
| (select array_agg(primary_keys) from primary_keys) as primary_keys_agg, | |
| (select array_agg(source_columns) from source_columns) as source_columns_agg, | |
| pg_version; | |
| execute dbstructure('test', ARRAY['test']::text[]); |
This file contains hidden or bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
| { | |
| "procs": [ | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "varied_arguments", | |
| "proc_description": "An RPC function\n\nJust a test for RPC function arguments", | |
| "args": "double double precision, \"varchar\" character varying, \"boolean\" boolean, date date, money money, enum test.enum_menagerie_type, \"integer\" integer DEFAULT 42, json json DEFAULT '{}'::json, jsonb jsonb DEFAULT '{}'::jsonb", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "text", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "hashissn13", | |
| "proc_description": null, | |
| "args": "extensions.issn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "btean13cmp", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.issn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "lca", | |
| "proc_description": null, | |
| "args": "ltree, ltree, ltree, ltree, ltree, ltree, ltree", | |
| "rettype_schema": "public", | |
| "rettype_name": "ltree", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "ismn", | |
| "proc_description": null, | |
| "args": "extensions.ean13", | |
| "rettype_schema": "extensions", | |
| "rettype_name": "ismn", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "sayhello", | |
| "proc_description": null, | |
| "args": "name text", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "text", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnle", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.isbn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnlt", | |
| "proc_description": null, | |
| "args": "extensions.issn13, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnlt", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.isbn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "encrypt", | |
| "proc_description": null, | |
| "args": "bytea, bytea, text", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bytea", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "lca", | |
| "proc_description": null, | |
| "args": "ltree, ltree, ltree, ltree, ltree", | |
| "rettype_schema": "public", | |
| "rettype_name": "ltree", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "ltree_gt", | |
| "proc_description": null, | |
| "args": "ltree, ltree", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "welcome.html", | |
| "proc_description": null, | |
| "args": "", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "text", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnge", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.isbn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "ret_void", | |
| "proc_description": null, | |
| "args": "", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "void", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "p", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnne", | |
| "proc_description": null, | |
| "args": "extensions.isbn, extensions.isbn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isngt", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.issn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "ltree_same", | |
| "proc_description": null, | |
| "args": "ltree_gist, ltree_gist, internal", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "internal", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "p", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnge", | |
| "proc_description": null, | |
| "args": "extensions.ismn13, extensions.ismn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "ltree_gist_in", | |
| "proc_description": null, | |
| "args": "cstring", | |
| "rettype_schema": "public", | |
| "rettype_name": "ltree_gist", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "hashismn13", | |
| "proc_description": null, | |
| "args": "extensions.ismn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnlt", | |
| "proc_description": null, | |
| "args": "extensions.ismn, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnge", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "btupccmp", | |
| "proc_description": null, | |
| "args": "extensions.upc, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnle", | |
| "proc_description": null, | |
| "args": "extensions.isbn13, extensions.isbn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnne", | |
| "proc_description": null, | |
| "args": "extensions.ismn, extensions.ismn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "btisbn13cmp", | |
| "proc_description": null, | |
| "args": "extensions.isbn13, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isneq", | |
| "proc_description": null, | |
| "args": "extensions.ismn13, extensions.ismn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isneq", | |
| "proc_description": null, | |
| "args": "extensions.isbn, extensions.isbn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnle", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.issn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "getitemrange", | |
| "proc_description": null, | |
| "args": "min bigint, max bigint", | |
| "rettype_schema": "test", | |
| "rettype_name": "items", | |
| "rettype_is_setof": true, | |
| "rettype_typ": "c", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "ltq_regex", | |
| "proc_description": null, | |
| "args": "ltree, lquery", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnne", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.ismn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnne", | |
| "proc_description": null, | |
| "args": "extensions.ismn, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "ret_rows_with_base64_bin", | |
| "proc_description": null, | |
| "args": "", | |
| "rettype_schema": "test", | |
| "rettype_name": "images_base64", | |
| "rettype_is_setof": true, | |
| "rettype_typ": "c", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnge", | |
| "proc_description": null, | |
| "args": "extensions.isbn13, extensions.isbn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "_ltree_risparent", | |
| "proc_description": null, | |
| "args": "ltree[], ltree", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "set_cookie_twice", | |
| "proc_description": null, | |
| "args": "", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "void", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "p", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnge", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.issn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnle", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.ismn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "pgp_pub_encrypt", | |
| "proc_description": null, | |
| "args": "text, bytea, text", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bytea", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isngt", | |
| "proc_description": null, | |
| "args": "extensions.ismn, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "is_valid", | |
| "proc_description": null, | |
| "args": "extensions.ismn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isngt", | |
| "proc_description": null, | |
| "args": "extensions.ismn13, extensions.ismn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "ltree_isparent", | |
| "proc_description": null, | |
| "args": "ltree, ltree", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isngt", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.upc", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnne", | |
| "proc_description": null, | |
| "args": "extensions.upc, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "ean13_out", | |
| "proc_description": null, | |
| "args": "extensions.isbn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "cstring", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "p", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "make_valid", | |
| "proc_description": null, | |
| "args": "extensions.ean13", | |
| "rettype_schema": "extensions", | |
| "rettype_name": "ean13", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "btissncmp", | |
| "proc_description": null, | |
| "args": "extensions.issn, extensions.issn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "pgp_sym_encrypt_bytea", | |
| "proc_description": null, | |
| "args": "bytea, text", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bytea", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "pgp_sym_decrypt_bytea", | |
| "proc_description": null, | |
| "args": "bytea, text, text", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bytea", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "bad_guc_headers_1", | |
| "proc_description": null, | |
| "args": "", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "void", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "p", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "_ltree_same", | |
| "proc_description": null, | |
| "args": "ltree_gist, ltree_gist, internal", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "internal", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "p", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnlt", | |
| "proc_description": null, | |
| "args": "extensions.isbn, extensions.isbn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "btismncmp", | |
| "proc_description": null, | |
| "args": "extensions.ismn, extensions.ismn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnne", | |
| "proc_description": null, | |
| "args": "extensions.isbn13, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "btismncmp", | |
| "proc_description": null, | |
| "args": "extensions.ismn, extensions.ismn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "lca", | |
| "proc_description": null, | |
| "args": "ltree, ltree, ltree, ltree", | |
| "rettype_schema": "public", | |
| "rettype_name": "ltree", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnlt", | |
| "proc_description": null, | |
| "args": "extensions.isbn, extensions.isbn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "_ltree_r_risparent", | |
| "proc_description": null, | |
| "args": "ltree, ltree[]", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "jwt", | |
| "proc_name": "url_encode", | |
| "proc_description": null, | |
| "args": "data bytea", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "text", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "subltree", | |
| "proc_description": null, | |
| "args": "ltree, integer, integer", | |
| "rettype_schema": "public", | |
| "rettype_name": "ltree", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnne", | |
| "proc_description": null, | |
| "args": "extensions.upc, extensions.upc", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "get_projects_above", | |
| "proc_description": null, | |
| "args": "id integer", | |
| "rettype_schema": "test", | |
| "rettype_name": "projects", | |
| "rettype_is_setof": true, | |
| "rettype_typ": "c", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnlt", | |
| "proc_description": null, | |
| "args": "extensions.ismn13, extensions.ismn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "btismn13cmp", | |
| "proc_description": null, | |
| "args": "extensions.ismn13, extensions.ismn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnne", | |
| "proc_description": null, | |
| "args": "extensions.issn13, extensions.issn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "decrypt", | |
| "proc_description": null, | |
| "args": "bytea, bytea, text", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bytea", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnle", | |
| "proc_description": null, | |
| "args": "extensions.issn, extensions.issn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "ltree_decompress", | |
| "proc_description": null, | |
| "args": "internal", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "internal", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "p", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isngt", | |
| "proc_description": null, | |
| "args": "extensions.issn, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnne", | |
| "proc_description": null, | |
| "args": "extensions.issn13, extensions.issn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isngt", | |
| "proc_description": null, | |
| "args": "extensions.upc, extensions.upc", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "upc_in", | |
| "proc_description": null, | |
| "args": "cstring", | |
| "rettype_schema": "extensions", | |
| "rettype_name": "upc", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "make_valid", | |
| "proc_description": null, | |
| "args": "extensions.isbn13", | |
| "rettype_schema": "extensions", | |
| "rettype_name": "isbn13", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "pgp_pub_decrypt", | |
| "proc_description": null, | |
| "args": "bytea, bytea", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "text", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnle", | |
| "proc_description": null, | |
| "args": "extensions.isbn, extensions.isbn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isbn_in", | |
| "proc_description": null, | |
| "args": "cstring", | |
| "rettype_schema": "extensions", | |
| "rettype_name": "isbn", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "btisbn13cmp", | |
| "proc_description": null, | |
| "args": "extensions.isbn13, extensions.isbn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnle", | |
| "proc_description": null, | |
| "args": "extensions.ismn, extensions.ismn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "subpath", | |
| "proc_description": null, | |
| "args": "ltree, integer, integer", | |
| "rettype_schema": "public", | |
| "rettype_name": "ltree", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "ret_range", | |
| "proc_description": null, | |
| "args": "low integer, up integer", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4range", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "r", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "ltxtq_in", | |
| "proc_description": null, | |
| "args": "cstring", | |
| "rettype_schema": "public", | |
| "rettype_name": "ltxtquery", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnle", | |
| "proc_description": null, | |
| "args": "extensions.ismn, extensions.ismn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "lca", | |
| "proc_description": null, | |
| "args": "ltree, ltree, ltree, ltree, ltree, ltree, ltree, ltree", | |
| "rettype_schema": "public", | |
| "rettype_name": "ltree", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnlt", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.issn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "hashissn", | |
| "proc_description": null, | |
| "args": "extensions.issn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "_lt_q_rregex", | |
| "proc_description": null, | |
| "args": "lquery[], ltree[]", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "switch_role", | |
| "proc_description": null, | |
| "args": "", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "void", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "p", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnge", | |
| "proc_description": null, | |
| "args": "extensions.isbn, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnge", | |
| "proc_description": null, | |
| "args": "extensions.ismn13, extensions.ismn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "many_inout_params", | |
| "proc_description": null, | |
| "args": "INOUT num integer, INOUT str text, INOUT b boolean DEFAULT true", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "record", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "p", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "ltree_lt", | |
| "proc_description": null, | |
| "args": "ltree, ltree", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "lt_q_rregex", | |
| "proc_description": null, | |
| "args": "lquery[], ltree", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "ltree2text", | |
| "proc_description": null, | |
| "args": "ltree", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "text", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "issn13", | |
| "proc_description": null, | |
| "args": "extensions.ean13", | |
| "rettype_schema": "extensions", | |
| "rettype_name": "issn13", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnge", | |
| "proc_description": null, | |
| "args": "extensions.isbn13, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "make_valid", | |
| "proc_description": null, | |
| "args": "extensions.issn13", | |
| "rettype_schema": "extensions", | |
| "rettype_name": "issn13", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "_ltq_extract_regex", | |
| "proc_description": null, | |
| "args": "ltree[], lquery", | |
| "rettype_schema": "public", | |
| "rettype_name": "ltree", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "root", | |
| "proc_description": null, | |
| "args": "", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "jsonb", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "callcounter", | |
| "proc_description": null, | |
| "args": "", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int8", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "decrypt_iv", | |
| "proc_description": null, | |
| "args": "bytea, bytea, bytea, text", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bytea", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnle", | |
| "proc_description": null, | |
| "args": "extensions.upc, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnne", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.ismn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "encrypt_iv", | |
| "proc_description": null, | |
| "args": "bytea, bytea, bytea, text", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bytea", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isneq", | |
| "proc_description": null, | |
| "args": "extensions.ismn13, extensions.ismn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnge", | |
| "proc_description": null, | |
| "args": "extensions.upc, extensions.upc", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "_ltree_consistent", | |
| "proc_description": null, | |
| "args": "internal, ltree[], smallint, oid, internal", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "armor", | |
| "proc_description": null, | |
| "args": "bytea, text[], text[]", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "text", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "digest", | |
| "proc_description": null, | |
| "args": "bytea, text", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bytea", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "pgp_sym_decrypt_bytea", | |
| "proc_description": null, | |
| "args": "bytea, text", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bytea", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnge", | |
| "proc_description": null, | |
| "args": "extensions.isbn, extensions.isbn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnle", | |
| "proc_description": null, | |
| "args": "extensions.ismn, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnne", | |
| "proc_description": null, | |
| "args": "extensions.issn, extensions.issn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "is_first", | |
| "proc_description": null, | |
| "args": "test.items", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "s" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnle", | |
| "proc_description": null, | |
| "args": "extensions.issn13, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnne", | |
| "proc_description": null, | |
| "args": "extensions.isbn13, extensions.isbn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "make_valid", | |
| "proc_description": null, | |
| "args": "extensions.upc", | |
| "rettype_schema": "extensions", | |
| "rettype_name": "upc", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "setprojects", | |
| "proc_description": null, | |
| "args": "id_l integer, id_h integer, name text", | |
| "rettype_schema": "test", | |
| "rettype_name": "projects", | |
| "rettype_is_setof": true, | |
| "rettype_typ": "c", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "singlejsonparam", | |
| "proc_description": null, | |
| "args": "single_param json", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "json", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnlt", | |
| "proc_description": null, | |
| "args": "extensions.isbn13, extensions.isbn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "test_empty_rowset", | |
| "proc_description": null, | |
| "args": "", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4", | |
| "rettype_is_setof": true, | |
| "rettype_typ": "b", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "welcome", | |
| "proc_description": null, | |
| "args": "", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "text", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnlt", | |
| "proc_description": null, | |
| "args": "extensions.isbn, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "_validate_json_schema_type", | |
| "proc_description": null, | |
| "args": "type text, data jsonb", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "ltree_compress", | |
| "proc_description": null, | |
| "args": "internal", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "internal", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "p", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnne", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.issn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isneq", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.upc", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "file_fdw_validator", | |
| "proc_description": null, | |
| "args": "text[], oid", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "void", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "p", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "btean13cmp", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.issn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnlt", | |
| "proc_description": null, | |
| "args": "extensions.issn13, extensions.issn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "pgp_pub_encrypt", | |
| "proc_description": null, | |
| "args": "text, bytea", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bytea", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isneq", | |
| "proc_description": null, | |
| "args": "extensions.ismn13, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "btismncmp", | |
| "proc_description": null, | |
| "args": "extensions.ismn, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "ltree_penalty", | |
| "proc_description": null, | |
| "args": "internal, internal, internal", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "internal", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "p", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "ltree_eq", | |
| "proc_description": null, | |
| "args": "ltree, ltree", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isneq", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "ret_point_3d", | |
| "proc_description": null, | |
| "args": "", | |
| "rettype_schema": "private", | |
| "rettype_name": "point_3d", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "c", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "reveal_big_jwt", | |
| "proc_description": null, | |
| "args": "", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "record", | |
| "rettype_is_setof": true, | |
| "rettype_typ": "p", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "ltree_in", | |
| "proc_description": null, | |
| "args": "cstring", | |
| "rettype_schema": "public", | |
| "rettype_name": "ltree", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isngt", | |
| "proc_description": null, | |
| "args": "extensions.ismn, extensions.ismn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "hashisbn", | |
| "proc_description": null, | |
| "args": "extensions.isbn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "ean13_out", | |
| "proc_description": null, | |
| "args": "extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "cstring", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "p", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "_ltxtq_exec", | |
| "proc_description": null, | |
| "args": "ltree[], ltxtquery", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isngt", | |
| "proc_description": null, | |
| "args": "extensions.isbn13, extensions.isbn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnlt", | |
| "proc_description": null, | |
| "args": "extensions.issn, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "postgrest", | |
| "proc_name": "update_owner", | |
| "proc_description": null, | |
| "args": "", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "trigger", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "p", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isngt", | |
| "proc_description": null, | |
| "args": "extensions.upc, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isn_out", | |
| "proc_description": null, | |
| "args": "extensions.issn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "cstring", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "p", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnle", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isngt", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.isbn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnne", | |
| "proc_description": null, | |
| "args": "extensions.ismn13, extensions.ismn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "raise_pt402", | |
| "proc_description": null, | |
| "args": "", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "void", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "p", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "dearmor", | |
| "proc_description": null, | |
| "args": "text", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bytea", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "btean13cmp", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.isbn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnle", | |
| "proc_description": null, | |
| "args": "extensions.upc, extensions.upc", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnne", | |
| "proc_description": null, | |
| "args": "extensions.ismn13, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isneq", | |
| "proc_description": null, | |
| "args": "extensions.issn13, extensions.issn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "noparamsproc", | |
| "proc_description": null, | |
| "args": "", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "text", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "pgp_pub_decrypt_bytea", | |
| "proc_description": null, | |
| "args": "bytea, bytea, text, text", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bytea", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "lquery_in", | |
| "proc_description": null, | |
| "args": "cstring", | |
| "rettype_schema": "public", | |
| "rettype_name": "lquery", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isneq", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.ismn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "ret_setof_integers", | |
| "proc_description": null, | |
| "args": "", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4", | |
| "rettype_is_setof": true, | |
| "rettype_typ": "b", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "is_valid", | |
| "proc_description": null, | |
| "args": "extensions.issn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "armor", | |
| "proc_description": null, | |
| "args": "bytea", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "text", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "ltree_out", | |
| "proc_description": null, | |
| "args": "ltree", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "cstring", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "p", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnne", | |
| "proc_description": null, | |
| "args": "extensions.isbn13, extensions.isbn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnle", | |
| "proc_description": null, | |
| "args": "extensions.isbn, extensions.isbn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "hashupc", | |
| "proc_description": null, | |
| "args": "extensions.upc", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "gen_salt", | |
| "proc_description": null, | |
| "args": "text", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "text", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnlt", | |
| "proc_description": null, | |
| "args": "extensions.isbn13, extensions.isbn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnlt", | |
| "proc_description": null, | |
| "args": "extensions.ismn13, extensions.ismn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isneq", | |
| "proc_description": null, | |
| "args": "extensions.ismn, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "btissn13cmp", | |
| "proc_description": null, | |
| "args": "extensions.issn13, extensions.issn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "jwt", | |
| "proc_name": "verify", | |
| "proc_description": null, | |
| "args": "token text, secret text, algorithm text DEFAULT 'HS256'::text", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "record", | |
| "rettype_is_setof": true, | |
| "rettype_typ": "p", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "ismn13_in", | |
| "proc_description": null, | |
| "args": "cstring", | |
| "rettype_schema": "extensions", | |
| "rettype_name": "ismn13", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isn_out", | |
| "proc_description": null, | |
| "args": "extensions.ismn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "cstring", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "p", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "lt_q_regex", | |
| "proc_description": null, | |
| "args": "ltree, lquery[]", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isneq", | |
| "proc_description": null, | |
| "args": "extensions.upc, extensions.upc", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isngt", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.ismn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnge", | |
| "proc_description": null, | |
| "args": "extensions.issn, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "getallusers", | |
| "proc_description": null, | |
| "args": "", | |
| "rettype_schema": "test", | |
| "rettype_name": "users", | |
| "rettype_is_setof": true, | |
| "rettype_typ": "c", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isbn", | |
| "proc_description": null, | |
| "args": "extensions.ean13", | |
| "rettype_schema": "extensions", | |
| "rettype_name": "isbn", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isngt", | |
| "proc_description": null, | |
| "args": "extensions.isbn, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "bad_guc_headers_3", | |
| "proc_description": null, | |
| "args": "", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "void", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "p", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "make_valid", | |
| "proc_description": null, | |
| "args": "extensions.ismn13", | |
| "rettype_schema": "extensions", | |
| "rettype_name": "ismn13", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "is_valid", | |
| "proc_description": null, | |
| "args": "extensions.isbn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "ltree_consistent", | |
| "proc_description": null, | |
| "args": "internal, ltree, smallint, oid, internal", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "make_valid", | |
| "proc_description": null, | |
| "args": "extensions.issn", | |
| "rettype_schema": "extensions", | |
| "rettype_name": "issn", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "location_for_stuff", | |
| "proc_description": null, | |
| "args": "", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "trigger", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "p", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "login", | |
| "proc_description": null, | |
| "args": "id text, pass text", | |
| "rettype_schema": "public", | |
| "rettype_name": "jwt_token", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "c", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnle", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.upc", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "overloaded", | |
| "proc_description": null, | |
| "args": "a integer, b integer", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isngt", | |
| "proc_description": null, | |
| "args": "extensions.ismn13, extensions.ismn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnlt", | |
| "proc_description": null, | |
| "args": "extensions.issn, extensions.issn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isneq", | |
| "proc_description": null, | |
| "args": "extensions.issn, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnge", | |
| "proc_description": null, | |
| "args": "extensions.isbn, extensions.isbn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "btupccmp", | |
| "proc_description": null, | |
| "args": "extensions.upc, extensions.upc", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "pgp_pub_decrypt_bytea", | |
| "proc_description": null, | |
| "args": "bytea, bytea", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bytea", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isneq", | |
| "proc_description": null, | |
| "args": "extensions.issn13, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnlt", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.ismn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnne", | |
| "proc_description": null, | |
| "args": "extensions.ismn13, extensions.ismn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "btean13cmp", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.upc", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnle", | |
| "proc_description": null, | |
| "args": "extensions.ismn13, extensions.ismn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "ltree_cmp", | |
| "proc_description": null, | |
| "args": "ltree, ltree", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "jwt", | |
| "proc_name": "algorithm_sign", | |
| "proc_description": null, | |
| "args": "signables text, secret text, algorithm text", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "text", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "three_defaults", | |
| "proc_description": null, | |
| "args": "a integer DEFAULT 1, b integer DEFAULT 2, c integer DEFAULT 3", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isneq", | |
| "proc_description": null, | |
| "args": "extensions.isbn13, extensions.isbn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "hashisbn13", | |
| "proc_description": null, | |
| "args": "extensions.isbn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnle", | |
| "proc_description": null, | |
| "args": "extensions.issn, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "search", | |
| "proc_description": null, | |
| "args": "id bigint", | |
| "rettype_schema": "test", | |
| "rettype_name": "items", | |
| "rettype_is_setof": true, | |
| "rettype_typ": "c", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnge", | |
| "proc_description": null, | |
| "args": "extensions.upc, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "_ltree_compress", | |
| "proc_description": null, | |
| "args": "internal", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "internal", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "p", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "_ltree_extract_isparent", | |
| "proc_description": null, | |
| "args": "ltree[], ltree", | |
| "rettype_schema": "public", | |
| "rettype_name": "ltree", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "subpath", | |
| "proc_description": null, | |
| "args": "ltree, integer", | |
| "rettype_schema": "public", | |
| "rettype_name": "ltree", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "quotedFunction", | |
| "proc_description": null, | |
| "args": "\"user\" text, \"fullName\" text, \"SSN\" text", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "jsonb", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnge", | |
| "proc_description": null, | |
| "args": "extensions.ismn, extensions.ismn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnlt", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.isbn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "issn_in", | |
| "proc_description": null, | |
| "args": "cstring", | |
| "rettype_schema": "extensions", | |
| "rettype_name": "issn", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "ltree_textadd", | |
| "proc_description": null, | |
| "args": "text, ltree", | |
| "rettype_schema": "public", | |
| "rettype_name": "ltree", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "ean13_out", | |
| "proc_description": null, | |
| "args": "extensions.ismn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "cstring", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "p", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "btisbncmp", | |
| "proc_description": null, | |
| "args": "extensions.isbn, extensions.isbn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "problem", | |
| "proc_description": null, | |
| "args": "", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "void", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "p", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "ret_domain", | |
| "proc_description": null, | |
| "args": "val integer", | |
| "rettype_schema": "test", | |
| "rettype_name": "one_nine", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "d", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "privileged_hello", | |
| "proc_description": null, | |
| "args": "name text", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "text", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnlt", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.issn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnge", | |
| "proc_description": null, | |
| "args": "extensions.ismn, extensions.ismn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "ltree_gist_out", | |
| "proc_description": null, | |
| "args": "ltree_gist", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "cstring", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "p", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "always_true", | |
| "proc_description": null, | |
| "args": "test.items", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "s" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnne", | |
| "proc_description": null, | |
| "args": "extensions.ismn, extensions.ismn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "_ltxtq_extract_exec", | |
| "proc_description": null, | |
| "args": "ltree[], ltxtquery", | |
| "rettype_schema": "public", | |
| "rettype_name": "ltree", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isn_out", | |
| "proc_description": null, | |
| "args": "extensions.upc", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "cstring", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "p", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "computed_overload", | |
| "proc_description": null, | |
| "args": "test.items", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "s" | |
| }, | |
| { | |
| "proc_schema": "postgrest", | |
| "proc_name": "set_authors_only_owner", | |
| "proc_description": null, | |
| "args": "", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "trigger", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "p", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnle", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.ismn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isngt", | |
| "proc_description": null, | |
| "args": "extensions.issn13, extensions.issn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnle", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.issn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isngt", | |
| "proc_description": null, | |
| "args": "extensions.issn, extensions.issn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "issn", | |
| "proc_description": null, | |
| "args": "extensions.ean13", | |
| "rettype_schema": "extensions", | |
| "rettype_name": "issn", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnne", | |
| "proc_description": null, | |
| "args": "extensions.issn, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isbn13", | |
| "proc_description": null, | |
| "args": "extensions.ean13", | |
| "rettype_schema": "extensions", | |
| "rettype_name": "isbn13", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "ret_base64_bin", | |
| "proc_description": null, | |
| "args": "", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "text", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isneq", | |
| "proc_description": null, | |
| "args": "extensions.isbn13, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "pgp_sym_decrypt", | |
| "proc_description": null, | |
| "args": "bytea, text, text", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "text", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "text2ltree", | |
| "proc_description": null, | |
| "args": "text", | |
| "rettype_schema": "public", | |
| "rettype_name": "ltree", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "is_valid", | |
| "proc_description": null, | |
| "args": "extensions.isbn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "btissncmp", | |
| "proc_description": null, | |
| "args": "extensions.issn, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "ismn13", | |
| "proc_description": null, | |
| "args": "extensions.ean13", | |
| "rettype_schema": "extensions", | |
| "rettype_name": "ismn13", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isneq", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.isbn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "btean13cmp", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "btisbncmp", | |
| "proc_description": null, | |
| "args": "extensions.isbn, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnge", | |
| "proc_description": null, | |
| "args": "extensions.issn, extensions.issn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "_ltree_extract_risparent", | |
| "proc_description": null, | |
| "args": "ltree[], ltree", | |
| "rettype_schema": "public", | |
| "rettype_name": "ltree", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnge", | |
| "proc_description": null, | |
| "args": "extensions.ismn, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnle", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.isbn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "overloaded", | |
| "proc_description": null, | |
| "args": "a text, b text, c text", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "text", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnlt", | |
| "proc_description": null, | |
| "args": "extensions.isbn13, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "many_out_params", | |
| "proc_description": null, | |
| "args": "OUT my_json json, OUT num integer, OUT str text", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "record", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "p", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "hmac", | |
| "proc_description": null, | |
| "args": "text, text, text", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bytea", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnlt", | |
| "proc_description": null, | |
| "args": "extensions.ismn13, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "nlevel", | |
| "proc_description": null, | |
| "args": "ltree", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isneq", | |
| "proc_description": null, | |
| "args": "extensions.isbn, extensions.isbn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnle", | |
| "proc_description": null, | |
| "args": "extensions.issn, extensions.issn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "lca", | |
| "proc_description": null, | |
| "args": "ltree, ltree, ltree, ltree, ltree, ltree", | |
| "rettype_schema": "public", | |
| "rettype_name": "ltree", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "is_valid", | |
| "proc_description": null, | |
| "args": "extensions.issn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "ltree_addltree", | |
| "proc_description": null, | |
| "args": "ltree, ltree", | |
| "rettype_schema": "public", | |
| "rettype_name": "ltree", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnlt", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.ismn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnge", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.ismn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isneq", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.ismn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "pgp_sym_encrypt", | |
| "proc_description": null, | |
| "args": "text, text, text", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bytea", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "digest", | |
| "proc_description": null, | |
| "args": "text, text", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bytea", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "is_valid_isbn", | |
| "proc_description": null, | |
| "args": "input text", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "ean13_out", | |
| "proc_description": null, | |
| "args": "extensions.issn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "cstring", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "p", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "issn13_in", | |
| "proc_description": null, | |
| "args": "cstring", | |
| "rettype_schema": "extensions", | |
| "rettype_name": "issn13", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnne", | |
| "proc_description": null, | |
| "args": "extensions.isbn, extensions.isbn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "_ltq_regex", | |
| "proc_description": null, | |
| "args": "ltree[], lquery", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnge", | |
| "proc_description": null, | |
| "args": "extensions.ismn13, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "crypt", | |
| "proc_description": null, | |
| "args": "text, text", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "text", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "btean13cmp", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.isbn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnge", | |
| "proc_description": null, | |
| "args": "extensions.issn13, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "is_valid", | |
| "proc_description": null, | |
| "args": "extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "_ltree_union", | |
| "proc_description": null, | |
| "args": "internal, internal", | |
| "rettype_schema": "public", | |
| "rettype_name": "ltree_gist", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "_ltree_penalty", | |
| "proc_description": null, | |
| "args": "internal, internal, internal", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "internal", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "p", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnge", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.upc", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "test_arg", | |
| "proc_description": null, | |
| "args": "my_arg my_type", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "text", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnne", | |
| "proc_description": null, | |
| "args": "extensions.issn, extensions.issn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnle", | |
| "proc_description": null, | |
| "args": "extensions.isbn, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "gen_random_bytes", | |
| "proc_description": null, | |
| "args": "integer", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bytea", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "bad_guc_headers_2", | |
| "proc_description": null, | |
| "args": "", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "void", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "p", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isngt", | |
| "proc_description": null, | |
| "args": "extensions.ismn13, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "overloaded", | |
| "proc_description": null, | |
| "args": "json", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "record", | |
| "rettype_is_setof": true, | |
| "rettype_typ": "p", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "get_guc_value", | |
| "proc_description": null, | |
| "args": "name text", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "text", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "single_out_param", | |
| "proc_description": null, | |
| "args": "num integer, OUT num_plus_one integer", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "leak", | |
| "proc_description": null, | |
| "args": "blob bytea", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "void", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "p", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "custom_headers", | |
| "proc_description": null, | |
| "args": "", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "void", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "p", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "_lt_q_regex", | |
| "proc_description": null, | |
| "args": "ltree[], lquery[]", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "jwt", | |
| "proc_name": "sign", | |
| "proc_description": null, | |
| "args": "payload json, secret text, algorithm text DEFAULT 'HS256'::text", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "text", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isneq", | |
| "proc_description": null, | |
| "args": "extensions.isbn, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "btissn13cmp", | |
| "proc_description": null, | |
| "args": "extensions.issn13, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "_ltq_rregex", | |
| "proc_description": null, | |
| "args": "lquery, ltree[]", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "raise_bad_pt", | |
| "proc_description": null, | |
| "args": "", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "void", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "p", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "index", | |
| "proc_description": null, | |
| "args": "ltree, ltree, integer", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "computed_overload", | |
| "proc_description": null, | |
| "args": "test.items2", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "s" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "ltxtq_exec", | |
| "proc_description": null, | |
| "args": "ltree, ltxtquery", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnne", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.isbn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnge", | |
| "proc_description": null, | |
| "args": "extensions.isbn13, extensions.isbn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnge", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.ismn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "pgp_pub_encrypt_bytea", | |
| "proc_description": null, | |
| "args": "bytea, bytea", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bytea", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "single_inout_param", | |
| "proc_description": null, | |
| "args": "INOUT num integer", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isn_weak", | |
| "proc_description": null, | |
| "args": "", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isngt", | |
| "proc_description": null, | |
| "args": "extensions.isbn13, extensions.isbn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isngt", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "postgrest", | |
| "proc_name": "check_role_exists", | |
| "proc_description": null, | |
| "args": "", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "trigger", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "p", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "get_projects_and_guc_headers", | |
| "proc_description": null, | |
| "args": "", | |
| "rettype_schema": "test", | |
| "rettype_name": "projects", | |
| "rettype_is_setof": true, | |
| "rettype_typ": "c", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isbn13_in", | |
| "proc_description": null, | |
| "args": "cstring", | |
| "rettype_schema": "extensions", | |
| "rettype_name": "isbn13", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "add_them", | |
| "proc_description": null, | |
| "args": "a integer, b integer", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "_ltree_picksplit", | |
| "proc_description": null, | |
| "args": "internal, internal", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "internal", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "p", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isngt", | |
| "proc_description": null, | |
| "args": "extensions.isbn13, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "btean13cmp", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.ismn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isneq", | |
| "proc_description": null, | |
| "args": "extensions.issn, extensions.issn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isngt", | |
| "proc_description": null, | |
| "args": "extensions.issn, extensions.issn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnlt", | |
| "proc_description": null, | |
| "args": "extensions.issn13, extensions.issn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnge", | |
| "proc_description": null, | |
| "args": "extensions.issn13, extensions.issn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "_ltxtq_rexec", | |
| "proc_description": null, | |
| "args": "ltxtquery, ltree[]", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "getproject", | |
| "proc_description": null, | |
| "args": "id integer", | |
| "rettype_schema": "test", | |
| "rettype_name": "projects", | |
| "rettype_is_setof": true, | |
| "rettype_typ": "c", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnlt", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.upc", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "hashean13", | |
| "proc_description": null, | |
| "args": "extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "lca", | |
| "proc_description": null, | |
| "args": "ltree, ltree", | |
| "rettype_schema": "public", | |
| "rettype_name": "ltree", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnne", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "get_current_user", | |
| "proc_description": null, | |
| "args": "", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "text", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "make_valid", | |
| "proc_description": null, | |
| "args": "extensions.isbn", | |
| "rettype_schema": "extensions", | |
| "rettype_name": "isbn", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "overloaded", | |
| "proc_description": null, | |
| "args": "", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4", | |
| "rettype_is_setof": true, | |
| "rettype_typ": "b", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "ltree_union", | |
| "proc_description": null, | |
| "args": "internal, internal", | |
| "rettype_schema": "public", | |
| "rettype_name": "ltree_gist", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "gen_salt", | |
| "proc_description": null, | |
| "args": "text, integer", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "text", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "ismn_in", | |
| "proc_description": null, | |
| "args": "cstring", | |
| "rettype_schema": "extensions", | |
| "rettype_name": "ismn", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "ret_scalars", | |
| "proc_description": null, | |
| "args": "", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "record", | |
| "rettype_is_setof": true, | |
| "rettype_typ": "p", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isngt", | |
| "proc_description": null, | |
| "args": "extensions.isbn, extensions.isbn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "is_valid", | |
| "proc_description": null, | |
| "args": "extensions.upc", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnlt", | |
| "proc_description": null, | |
| "args": "extensions.ismn, extensions.ismn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "number_of_labels", | |
| "proc_description": null, | |
| "args": "test.ltree_sample", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnle", | |
| "proc_description": null, | |
| "args": "extensions.ismn13, extensions.ismn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "ltree_ne", | |
| "proc_description": null, | |
| "args": "ltree, ltree", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isneq", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.issn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "btismn13cmp", | |
| "proc_description": null, | |
| "args": "extensions.ismn13, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "v2", | |
| "proc_name": "get_parents_below", | |
| "proc_description": null, | |
| "args": "id integer", | |
| "rettype_schema": "v2", | |
| "rettype_name": "parents", | |
| "rettype_is_setof": true, | |
| "rettype_typ": "c", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "lca", | |
| "proc_description": null, | |
| "args": "ltree, ltree, ltree", | |
| "rettype_schema": "public", | |
| "rettype_name": "ltree", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "ltree_addtext", | |
| "proc_description": null, | |
| "args": "ltree, text", | |
| "rettype_schema": "public", | |
| "rettype_name": "ltree", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "lca", | |
| "proc_description": null, | |
| "args": "ltree[]", | |
| "rettype_schema": "public", | |
| "rettype_name": "ltree", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isngt", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.issn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnne", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.isbn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isngt", | |
| "proc_description": null, | |
| "args": "extensions.issn13, extensions.issn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "index", | |
| "proc_description": null, | |
| "args": "ltree, ltree", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "ret_enum", | |
| "proc_description": null, | |
| "args": "val text", | |
| "rettype_schema": "test", | |
| "rettype_name": "enum_menagerie_type", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "e", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "ean13_in", | |
| "proc_description": null, | |
| "args": "cstring", | |
| "rettype_schema": "extensions", | |
| "rettype_name": "ean13", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isneq", | |
| "proc_description": null, | |
| "args": "extensions.ismn, extensions.ismn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "upc", | |
| "proc_description": null, | |
| "args": "extensions.ean13", | |
| "rettype_schema": "extensions", | |
| "rettype_name": "upc", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "gen_random_uuid", | |
| "proc_description": null, | |
| "args": "", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "uuid", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "btissn13cmp", | |
| "proc_description": null, | |
| "args": "extensions.issn13, extensions.issn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "single_json_out_param", | |
| "proc_description": null, | |
| "args": "a integer, b text, OUT my_json json", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "json", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "btissncmp", | |
| "proc_description": null, | |
| "args": "extensions.issn, extensions.issn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isneq", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.isbn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "ret_array", | |
| "proc_description": null, | |
| "args": "", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "_int4", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "ltree_picksplit", | |
| "proc_description": null, | |
| "args": "internal, internal", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "internal", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "p", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "btean13cmp", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.ismn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "lquery_out", | |
| "proc_description": null, | |
| "args": "lquery", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "cstring", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "p", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnlt", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isn_weak", | |
| "proc_description": null, | |
| "args": "boolean", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isneq", | |
| "proc_description": null, | |
| "args": "extensions.isbn13, extensions.isbn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "pgp_armor_headers", | |
| "proc_description": null, | |
| "args": "text, OUT key text, OUT value text", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "record", | |
| "rettype_is_setof": true, | |
| "rettype_typ": "p", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isneq", | |
| "proc_description": null, | |
| "args": "extensions.upc, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "pgp_key_id", | |
| "proc_description": null, | |
| "args": "bytea", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "text", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "btismn13cmp", | |
| "proc_description": null, | |
| "args": "extensions.ismn13, extensions.ismn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnge", | |
| "proc_description": null, | |
| "args": "extensions.issn, extensions.issn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "pgp_pub_decrypt_bytea", | |
| "proc_description": null, | |
| "args": "bytea, bytea, text", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bytea", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnlt", | |
| "proc_description": null, | |
| "args": "extensions.issn, extensions.issn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isn_out", | |
| "proc_description": null, | |
| "args": "extensions.isbn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "cstring", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "p", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "btisbncmp", | |
| "proc_description": null, | |
| "args": "extensions.isbn, extensions.isbn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "get_tsearch", | |
| "proc_description": null, | |
| "args": "", | |
| "rettype_schema": "test", | |
| "rettype_name": "tsearch", | |
| "rettype_is_setof": true, | |
| "rettype_typ": "c", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnle", | |
| "proc_description": null, | |
| "args": "extensions.issn13, extensions.issn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "ltq_rregex", | |
| "proc_description": null, | |
| "args": "lquery, ltree", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "pgp_pub_decrypt", | |
| "proc_description": null, | |
| "args": "bytea, bytea, text, text", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "text", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "getallprojects", | |
| "proc_description": null, | |
| "args": "", | |
| "rettype_schema": "test", | |
| "rettype_name": "projects", | |
| "rettype_is_setof": true, | |
| "rettype_typ": "c", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "ltxtq_rexec", | |
| "proc_description": null, | |
| "args": "ltxtquery, ltree", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnlt", | |
| "proc_description": null, | |
| "args": "extensions.ismn, extensions.ismn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "btisbn13cmp", | |
| "proc_description": null, | |
| "args": "extensions.isbn13, extensions.isbn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "ltree_le", | |
| "proc_description": null, | |
| "args": "ltree, ltree", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isneq", | |
| "proc_description": null, | |
| "args": "extensions.ismn, extensions.ismn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "test", | |
| "proc_description": null, | |
| "args": "", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "record", | |
| "rettype_is_setof": true, | |
| "rettype_typ": "p", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "pgp_pub_decrypt", | |
| "proc_description": null, | |
| "args": "bytea, bytea, text", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "text", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "ret_point_2d", | |
| "proc_description": null, | |
| "args": "", | |
| "rettype_schema": "test", | |
| "rettype_name": "point_2d", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "c", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "hmac", | |
| "proc_description": null, | |
| "args": "bytea, bytea, text", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bytea", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "ltree_risparent", | |
| "proc_description": null, | |
| "args": "ltree, ltree", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnle", | |
| "proc_description": null, | |
| "args": "extensions.isbn13, extensions.isbn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "validate_json_schema", | |
| "proc_description": null, | |
| "args": "schema jsonb, data jsonb, root_schema jsonb DEFAULT NULL::jsonb", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnlt", | |
| "proc_description": null, | |
| "args": "extensions.upc, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "pgp_sym_encrypt", | |
| "proc_description": null, | |
| "args": "text, text", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bytea", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isngt", | |
| "proc_description": null, | |
| "args": "extensions.isbn, extensions.isbn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnlt", | |
| "proc_description": null, | |
| "args": "extensions.upc, extensions.upc", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "_ltree_isparent", | |
| "proc_description": null, | |
| "args": "ltree[], ltree", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnne", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.upc", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnne", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.issn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnle", | |
| "proc_description": null, | |
| "args": "extensions.issn13, extensions.issn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isneq", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.issn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "anti_id", | |
| "proc_description": null, | |
| "args": "test.items", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int8", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "s" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "ltree_ge", | |
| "proc_description": null, | |
| "args": "ltree, ltree", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isneq", | |
| "proc_description": null, | |
| "args": "extensions.issn, extensions.issn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnge", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.issn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnne", | |
| "proc_description": null, | |
| "args": "extensions.isbn, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isngt", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.isbn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnle", | |
| "proc_description": null, | |
| "args": "extensions.isbn13, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "make_valid", | |
| "proc_description": null, | |
| "args": "extensions.ismn", | |
| "rettype_schema": "extensions", | |
| "rettype_name": "ismn", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "always_false", | |
| "proc_description": null, | |
| "args": "test.items", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "s" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "hashismn", | |
| "proc_description": null, | |
| "args": "extensions.ismn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isngt", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.ismn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnle", | |
| "proc_description": null, | |
| "args": "extensions.ismn13, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "v1", | |
| "proc_name": "get_parents_below", | |
| "proc_description": null, | |
| "args": "id integer", | |
| "rettype_schema": "v1", | |
| "rettype_name": "parents", | |
| "rettype_is_setof": true, | |
| "rettype_typ": "c", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnge", | |
| "proc_description": null, | |
| "args": "extensions.ean13, extensions.isbn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "ltreeparentsel", | |
| "proc_description": null, | |
| "args": "internal, oid, internal, integer", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "float8", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "is_valid", | |
| "proc_description": null, | |
| "args": "extensions.ismn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "_ltree_r_isparent", | |
| "proc_description": null, | |
| "args": "ltree, ltree[]", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "json_argument", | |
| "proc_description": null, | |
| "args": "arg json", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "text", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isngt", | |
| "proc_description": null, | |
| "args": "extensions.issn13, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "get_int_and_guc_headers", | |
| "proc_description": null, | |
| "args": "num integer", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "int4", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "ltxtq_out", | |
| "proc_description": null, | |
| "args": "ltxtquery", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "cstring", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "p", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "single_article", | |
| "proc_description": null, | |
| "args": "id integer", | |
| "rettype_schema": "test", | |
| "rettype_name": "articles", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "c", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "jwt", | |
| "proc_name": "url_decode", | |
| "proc_description": null, | |
| "args": "data text", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bytea", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnne", | |
| "proc_description": null, | |
| "args": "extensions.issn13, extensions.ean13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "file_fdw_handler", | |
| "proc_description": null, | |
| "args": "", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "fdw_handler", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "p", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "jwt_test", | |
| "proc_description": null, | |
| "args": "", | |
| "rettype_schema": "public", | |
| "rettype_name": "jwt_token", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "c", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "test", | |
| "proc_name": "get_projects_below", | |
| "proc_description": null, | |
| "args": "id integer", | |
| "rettype_schema": "test", | |
| "rettype_name": "projects", | |
| "rettype_is_setof": true, | |
| "rettype_typ": "c", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "pgp_sym_decrypt", | |
| "proc_description": null, | |
| "args": "bytea, text", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "text", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isngt", | |
| "proc_description": null, | |
| "args": "extensions.ismn, extensions.ismn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "pgp_pub_encrypt_bytea", | |
| "proc_description": null, | |
| "args": "bytea, bytea, text", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bytea", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isneq", | |
| "proc_description": null, | |
| "args": "extensions.issn13, extensions.issn13", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| }, | |
| { | |
| "proc_schema": "public", | |
| "proc_name": "pgp_sym_encrypt_bytea", | |
| "proc_description": null, | |
| "args": "bytea, text, text", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bytea", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "v" | |
| }, | |
| { | |
| "proc_schema": "extensions", | |
| "proc_name": "isnge", | |
| "proc_description": null, | |
| "args": "extensions.issn13, extensions.issn", | |
| "rettype_schema": "pg_catalog", | |
| "rettype_name": "bool", | |
| "rettype_is_setof": false, | |
| "rettype_typ": "b", | |
| "provolatile": "i" | |
| } | |
| ], | |
| "schema_description": { | |
| "description": null | |
| }, | |
| "accessible_tables": [ | |
| { | |
| "table_schema": "test", | |
| "table_name": "Escap3e;", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "Foo", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "Server Today", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "UnitTest", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "activities", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "addresses", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "agents", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "app_users", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "articleStars", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "articles", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "authors", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "authors_books_number", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "authors_have_book_in_decade", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "authors_only", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "authors_w_entities", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "auto_incrementing_pk", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "bar", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "bars", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "being", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "being_part", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "big_projects", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "books", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "child_entities", | |
| "table_description": "child_entities comment", | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "clashing_column", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "clients", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "comments", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "complex_items", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "compound_pk", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "compound_unique", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "consumers_view", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "contract", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "contract_view", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "departments", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "descendant", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "employees", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "empty_table", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "entities", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "family_tree", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "fifties_books", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "filtered_tasks", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "foos", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "forties_and_fifties_books", | |
| "table_description": null, | |
| "insertable": false | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "forties_books", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "get_projects_above_view", | |
| "table_description": null, | |
| "insertable": false | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "getallprojects_view", | |
| "table_description": null, | |
| "insertable": false | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "ghostBusters", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "grandchild_entities", | |
| "table_description": "grandchild_entities summary\n\ngrandchild_entities description\nthat spans\nmultiple lines", | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "has_count_column", | |
| "table_description": null, | |
| "insertable": false | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "has_fk", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "images", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "images_base64", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "insertable_view_with_join", | |
| "table_description": null, | |
| "insertable": false | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "insertonly", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "isn_sample", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "items", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "items2", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "items_with_different_col_types", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "jobs", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "json", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "json_arr", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "jsonb_test", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "leak", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "limited_article_stars", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "loc_test", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "ltree_sample", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "main_jobs", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "managers", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "materialized_projects", | |
| "table_description": "A materialized view for projects\n\nJust a test for materialized views", | |
| "insertable": false | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "materialized_view", | |
| "table_description": null, | |
| "insertable": false | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "menagerie", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "message", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "no_pk", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "nullable_integer", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "odd_years_publications", | |
| "table_description": null, | |
| "insertable": false | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "only_pk", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "openapi_types", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "orders", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "orders_view", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "organizations", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "pages", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "part", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "perf_articles", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "person", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "person_detail", | |
| "table_description": null, | |
| "insertable": false | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "pgrst_reserved_chars", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "player_view", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "private_table", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "projects", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "projects_count_grouped_by", | |
| "table_description": null, | |
| "insertable": false | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "projects_dump", | |
| "table_description": "A temporary projects dump\n\nJust a test for foreign tables", | |
| "insertable": false | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "projects_view", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "projects_view_alt", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "ranges", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "referrals", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "schedules", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "simple_pk", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "single_unique", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "sites", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "sixties_books", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "space", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "stuff", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "tasks", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "tiobe_pls", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "tsearch", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "unit_workdays", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "users", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "users_projects", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "users_tasks", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "w_or_wo_comma_names", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "web_content", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "whatev_jobs", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "whatev_projects", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "whatev_sites", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "withUnique", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "zone", | |
| "table_description": null, | |
| "insertable": true | |
| } | |
| ], | |
| "tables": [ | |
| { | |
| "table_schema": "postgrest", | |
| "table_name": "auth", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "article_stars", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "articles", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "authors", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "books", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "pages", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "player", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "priv_jobs", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "publishers", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "referrals", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "stuff", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "public", | |
| "table_name": "public_consumers", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "public", | |
| "table_name": "public_orders", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "Escap3e;", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "Foo", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "Server Today", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "UnitTest", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "activities", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "addresses", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "agents", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "app_users", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "articleStars", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "articles", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "authors", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "authors_books_number", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "authors_have_book_in_decade", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "authors_only", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "authors_w_entities", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "auto_incrementing_pk", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "bar", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "bars", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "being", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "being_part", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "big_projects", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "books", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "child_entities", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "clashing_column", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "clients", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "comments", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "complex_items", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "compound_pk", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "compound_unique", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "consumers_view", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "contract", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "contract_view", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "departments", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "descendant", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "employees", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "empty_table", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "entities", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "family_tree", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "fifties_books", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "filtered_tasks", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "foos", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "forties_and_fifties_books", | |
| "table_description": null, | |
| "insertable": false | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "forties_books", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "get_projects_above_view", | |
| "table_description": null, | |
| "insertable": false | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "getallprojects_view", | |
| "table_description": null, | |
| "insertable": false | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "ghostBusters", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "grandchild_entities", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "has_count_column", | |
| "table_description": null, | |
| "insertable": false | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "has_fk", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "images", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "images_base64", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "insertable_view_with_join", | |
| "table_description": null, | |
| "insertable": false | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "insertonly", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "isn_sample", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "items", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "items2", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "items_with_different_col_types", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "jobs", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "json", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "json_arr", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "jsonb_test", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "leak", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "limited_article_stars", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "loc_test", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "ltree_sample", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "main_jobs", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "managers", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "materialized_projects", | |
| "table_description": null, | |
| "insertable": false | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "materialized_view", | |
| "table_description": null, | |
| "insertable": false | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "menagerie", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "message", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "no_pk", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "nullable_integer", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "odd_years_publications", | |
| "table_description": null, | |
| "insertable": false | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "only_pk", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "openapi_types", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "orders", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "orders_view", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "organizations", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "pages", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "part", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "perf_articles", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "person", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "person_detail", | |
| "table_description": null, | |
| "insertable": false | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "pgrst_reserved_chars", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "player_view", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "private_table", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "projects", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "projects_count_grouped_by", | |
| "table_description": null, | |
| "insertable": false | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "projects_dump", | |
| "table_description": null, | |
| "insertable": false | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "projects_view", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "projects_view_alt", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "ranges", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "referrals", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "schedules", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "simple_pk", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "single_unique", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "sites", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "sixties_books", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "space", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "stuff", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "tasks", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "tiobe_pls", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "tsearch", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "unit_workdays", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "users", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "users_projects", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "users_tasks", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "w_or_wo_comma_names", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "web_content", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "whatev_jobs", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "whatev_projects", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "whatev_sites", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "withUnique", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "zone", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "v1", | |
| "table_name": "children", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "v1", | |
| "table_name": "parents", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "v2", | |
| "table_name": "another_table", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "v2", | |
| "table_name": "children", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "v2", | |
| "table_name": "parents", | |
| "table_description": null, | |
| "insertable": true | |
| }, | |
| { | |
| "table_schema": "تست", | |
| "table_name": "موارد", | |
| "table_description": null, | |
| "insertable": true | |
| } | |
| ], | |
| "columns": [ | |
| { | |
| "schema": "postgrest", | |
| "table_name": "auth", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "character varying", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "private", | |
| "table_name": "article_stars", | |
| "name": "article_id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "private", | |
| "table_name": "articles", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "private", | |
| "table_name": "authors", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "private", | |
| "table_name": "books", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "private", | |
| "table_name": "pages", | |
| "name": "link", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "private", | |
| "table_name": "player", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "private", | |
| "table_name": "publishers", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "private", | |
| "table_name": "stuff", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "private", | |
| "table_name": "article_stars", | |
| "name": "user_id", | |
| "description": null, | |
| "position": 2, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "private", | |
| "table_name": "player", | |
| "name": "first_name", | |
| "description": null, | |
| "position": 2, | |
| "nullable": false, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "private", | |
| "table_name": "referrals", | |
| "name": "link", | |
| "description": null, | |
| "position": 2, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "private", | |
| "table_name": "player", | |
| "name": "last_name", | |
| "description": null, | |
| "position": 3, | |
| "nullable": false, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "private", | |
| "table_name": "books", | |
| "name": "author_id", | |
| "description": null, | |
| "position": 4, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "private", | |
| "table_name": "player", | |
| "name": "birth_date", | |
| "description": null, | |
| "position": 4, | |
| "nullable": false, | |
| "col_type": "date", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "private", | |
| "table_name": "books", | |
| "name": "first_publisher_id", | |
| "description": null, | |
| "position": 5, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "public", | |
| "table_name": "public_consumers", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": "nextval('public_consumers_id_seq'::regclass)", | |
| "enum": null | |
| }, | |
| { | |
| "schema": "public", | |
| "table_name": "public_orders", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": "nextval('public_orders_id_seq'::regclass)", | |
| "enum": null | |
| }, | |
| { | |
| "schema": "public", | |
| "table_name": "public_orders", | |
| "name": "consumer", | |
| "description": null, | |
| "position": 2, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "Escap3e;", | |
| "name": "so6meIdColumn", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "Foo", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "Server Today", | |
| "name": "cHostname", | |
| "description": null, | |
| "position": 1, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "UnitTest", | |
| "name": "idUnitTest", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "activities", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "addresses", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "agents", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "app_users", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "articleStars", | |
| "name": "articleId", | |
| "description": null, | |
| "position": 1, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "articles", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "authors", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "authors_books_number", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "authors_have_book_in_decade", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "authors_only", | |
| "name": "owner", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "character varying", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "authors_w_entities", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "auto_incrementing_pk", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": "nextval('test.auto_incrementing_pk_id_seq'::regclass)", | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "bar", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "bars", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "being", | |
| "name": "being", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "being_part", | |
| "name": "being", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "big_projects", | |
| "name": "big_project_id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": "nextval('test.big_projects_big_project_id_seq'::regclass)", | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "books", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "child_entities", | |
| "name": "id", | |
| "description": "child_entities id comment", | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "clashing_column", | |
| "name": "t", | |
| "description": null, | |
| "position": 1, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "clients", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "comments", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "complex_items", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "bigint", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 64, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "compound_pk", | |
| "name": "k1", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "compound_unique", | |
| "name": "key1", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "consumers_view", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "contract", | |
| "name": "tournament", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "contract_view", | |
| "name": "tournament", | |
| "description": null, | |
| "position": 1, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "departments", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "descendant", | |
| "name": "descendant", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "employees", | |
| "name": "first_name", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "empty_table", | |
| "name": "k", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "character varying", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "entities", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "family_tree", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "fifties_books", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "filtered_tasks", | |
| "name": "myId", | |
| "description": null, | |
| "position": 1, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "foos", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "forties_and_fifties_books", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": false, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "forties_books", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "get_projects_above_view", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": false, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "getallprojects_view", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": false, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "ghostBusters", | |
| "name": "escapeId", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "grandchild_entities", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "has_count_column", | |
| "name": "count", | |
| "description": null, | |
| "position": 1, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": false, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "has_fk", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "bigint", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 64, | |
| "default_value": "nextval('test.has_fk_id_seq'::regclass)", | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "images", | |
| "name": "name", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "images_base64", | |
| "name": "name", | |
| "description": null, | |
| "position": 1, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "insertable_view_with_join", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": true, | |
| "col_type": "bigint", | |
| "updatable": false, | |
| "max_len": null, | |
| "precision": 64, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "insertonly", | |
| "name": "v", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "isn_sample", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": true, | |
| "col_type": "extensions.isbn", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "items", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "bigint", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 64, | |
| "default_value": "nextval('test.items_id_seq'::regclass)", | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "items2", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "bigint", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 64, | |
| "default_value": "nextval('test.items2_id_seq'::regclass)", | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "items_with_different_col_types", | |
| "name": "int_data", | |
| "description": null, | |
| "position": 1, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "jobs", | |
| "name": "job_id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "uuid", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "json", | |
| "name": "data", | |
| "description": null, | |
| "position": 1, | |
| "nullable": true, | |
| "col_type": "json", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "json_arr", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "jsonb_test", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "leak", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": "nextval('test.leak_id_seq'::regclass)", | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "limited_article_stars", | |
| "name": "article_id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "loc_test", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "ltree_sample", | |
| "name": "path", | |
| "description": null, | |
| "position": 1, | |
| "nullable": true, | |
| "col_type": "ltree", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "main_jobs", | |
| "name": "job_id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": true, | |
| "col_type": "uuid", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "managers", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "materialized_projects", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": false, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "materialized_view", | |
| "name": "version", | |
| "description": null, | |
| "position": 1, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": false, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "menagerie", | |
| "name": "integer", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "message", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "no_pk", | |
| "name": "a", | |
| "description": null, | |
| "position": 1, | |
| "nullable": true, | |
| "col_type": "character varying", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "nullable_integer", | |
| "name": "a", | |
| "description": null, | |
| "position": 1, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "odd_years_publications", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": false, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "only_pk", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "openapi_types", | |
| "name": "a_character_varying", | |
| "description": null, | |
| "position": 1, | |
| "nullable": true, | |
| "col_type": "character varying", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "orders", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "orders_view", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "organizations", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "pages", | |
| "name": "link", | |
| "description": null, | |
| "position": 1, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "part", | |
| "name": "part", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "perf_articles", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "person", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "person_detail", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": false, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "pgrst_reserved_chars", | |
| "name": "*id*", | |
| "description": null, | |
| "position": 1, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "player_view", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "projects", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "projects_count_grouped_by", | |
| "name": "client_id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": false, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "projects_dump", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": false, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "projects_view", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "projects_view_alt", | |
| "name": "t_id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "ranges", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "referrals", | |
| "name": "site", | |
| "description": null, | |
| "position": 1, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "schedules", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "simple_pk", | |
| "name": "k", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "character varying", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "single_unique", | |
| "name": "unique_key", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "sites", | |
| "name": "site_id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": "nextval('test.sites_site_id_seq'::regclass)", | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "sixties_books", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "space", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "stuff", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "tasks", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "tiobe_pls", | |
| "name": "name", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "tsearch", | |
| "name": "text_search_vector", | |
| "description": null, | |
| "position": 1, | |
| "nullable": true, | |
| "col_type": "tsvector", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "unit_workdays", | |
| "name": "unit_id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "users", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "users_projects", | |
| "name": "user_id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "users_tasks", | |
| "name": "user_id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "w_or_wo_comma_names", | |
| "name": "name", | |
| "description": null, | |
| "position": 1, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "web_content", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "whatev_jobs", | |
| "name": "job_id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "uuid", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "whatev_projects", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": "nextval('test.whatev_projects_id_seq'::regclass)", | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "whatev_sites", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": "nextval('test.whatev_sites_id_seq'::regclass)", | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "withUnique", | |
| "name": "uni", | |
| "description": null, | |
| "position": 1, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "zone", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "Foo", | |
| "name": "name", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "Server Today", | |
| "name": "Just A Server Model", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "UnitTest", | |
| "name": "nameUnitTest", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "activities", | |
| "name": "schedule_id", | |
| "description": null, | |
| "position": 2, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "addresses", | |
| "name": "address", | |
| "description": null, | |
| "position": 2, | |
| "nullable": false, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "agents", | |
| "name": "name", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "app_users", | |
| "name": "email", | |
| "description": null, | |
| "position": 2, | |
| "nullable": false, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "articleStars", | |
| "name": "userId", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "articles", | |
| "name": "body", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "authors", | |
| "name": "name", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "authors_books_number", | |
| "name": "name", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "authors_have_book_in_decade", | |
| "name": "name", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "authors_only", | |
| "name": "secret", | |
| "description": null, | |
| "position": 2, | |
| "nullable": false, | |
| "col_type": "character varying", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "authors_w_entities", | |
| "name": "name", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "auto_incrementing_pk", | |
| "name": "nullable_string", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "character varying", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "bar", | |
| "name": "name", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "bars", | |
| "name": "fooId", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "being_part", | |
| "name": "part", | |
| "description": null, | |
| "position": 2, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "big_projects", | |
| "name": "name", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "books", | |
| "name": "title", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "child_entities", | |
| "name": "name", | |
| "description": "child_entities name comment. Can be longer than sixty-three characters long", | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "clients", | |
| "name": "name", | |
| "description": null, | |
| "position": 2, | |
| "nullable": false, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "comments", | |
| "name": "commenter_id", | |
| "description": null, | |
| "position": 2, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "complex_items", | |
| "name": "name", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "compound_pk", | |
| "name": "k2", | |
| "description": null, | |
| "position": 2, | |
| "nullable": false, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "compound_unique", | |
| "name": "key2", | |
| "description": null, | |
| "position": 2, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "consumers_view", | |
| "name": "name", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "contract", | |
| "name": "time", | |
| "description": null, | |
| "position": 2, | |
| "nullable": false, | |
| "col_type": "tsrange", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "contract_view", | |
| "name": "time", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "tsrange", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "departments", | |
| "name": "name", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "descendant", | |
| "name": "being", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "employees", | |
| "name": "last_name", | |
| "description": null, | |
| "position": 2, | |
| "nullable": false, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "empty_table", | |
| "name": "extra", | |
| "description": null, | |
| "position": 2, | |
| "nullable": false, | |
| "col_type": "character varying", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "entities", | |
| "name": "name", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "family_tree", | |
| "name": "name", | |
| "description": null, | |
| "position": 2, | |
| "nullable": false, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "fifties_books", | |
| "name": "title", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "filtered_tasks", | |
| "name": "name", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "foos", | |
| "name": "name", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "forties_and_fifties_books", | |
| "name": "title", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": false, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "forties_books", | |
| "name": "title", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "get_projects_above_view", | |
| "name": "name", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": false, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "getallprojects_view", | |
| "name": "name", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": false, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "grandchild_entities", | |
| "name": "name", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "has_fk", | |
| "name": "auto_inc_fk", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "images", | |
| "name": "img", | |
| "description": null, | |
| "position": 2, | |
| "nullable": false, | |
| "col_type": "bytea", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "images_base64", | |
| "name": "img", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": false, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "insertable_view_with_join", | |
| "name": "auto_inc_fk", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": false, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "isn_sample", | |
| "name": "name", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "items_with_different_col_types", | |
| "name": "text_data", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "jobs", | |
| "name": "name", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "json_arr", | |
| "name": "data", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "json", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "jsonb_test", | |
| "name": "data", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "jsonb", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "leak", | |
| "name": "blob", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "bytea", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "limited_article_stars", | |
| "name": "user_id", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "loc_test", | |
| "name": "c", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "main_jobs", | |
| "name": "name", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "managers", | |
| "name": "name", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "materialized_projects", | |
| "name": "name", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": false, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "menagerie", | |
| "name": "double", | |
| "description": null, | |
| "position": 2, | |
| "nullable": false, | |
| "col_type": "double precision", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 53, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "message", | |
| "name": "body", | |
| "description": null, | |
| "position": 2, | |
| "nullable": false, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": "''::text", | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "no_pk", | |
| "name": "b", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "character varying", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "odd_years_publications", | |
| "name": "title", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": false, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "openapi_types", | |
| "name": "a_character", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "character", | |
| "updatable": true, | |
| "max_len": 1, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "orders", | |
| "name": "name", | |
| "description": null, | |
| "position": 2, | |
| "nullable": false, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "orders_view", | |
| "name": "consumer", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "organizations", | |
| "name": "name", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "pages", | |
| "name": "url", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "perf_articles", | |
| "name": "body", | |
| "description": null, | |
| "position": 2, | |
| "nullable": false, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "person", | |
| "name": "name", | |
| "description": null, | |
| "position": 2, | |
| "nullable": false, | |
| "col_type": "character varying", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "person_detail", | |
| "name": "name", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "character varying", | |
| "updatable": false, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "pgrst_reserved_chars", | |
| "name": ":arr->ow::cast", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "player_view", | |
| "name": "first_name", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "projects", | |
| "name": "name", | |
| "description": null, | |
| "position": 2, | |
| "nullable": false, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "projects_count_grouped_by", | |
| "name": "number_of_projects", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "bigint", | |
| "updatable": false, | |
| "max_len": null, | |
| "precision": 64, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "projects_dump", | |
| "name": "name", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": false, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "projects_view", | |
| "name": "name", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "projects_view_alt", | |
| "name": "name", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "ranges", | |
| "name": "range", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "numrange", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "referrals", | |
| "name": "link", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "schedules", | |
| "name": "name", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "simple_pk", | |
| "name": "extra", | |
| "description": null, | |
| "position": 2, | |
| "nullable": false, | |
| "col_type": "character varying", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "single_unique", | |
| "name": "value", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "sites", | |
| "name": "name", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "sixties_books", | |
| "name": "title", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "space", | |
| "name": "name", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "stuff", | |
| "name": "name", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "tasks", | |
| "name": "name", | |
| "description": null, | |
| "position": 2, | |
| "nullable": false, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "tiobe_pls", | |
| "name": "rank", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "smallint", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 16, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "unit_workdays", | |
| "name": "day", | |
| "description": null, | |
| "position": 2, | |
| "nullable": false, | |
| "col_type": "date", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "users", | |
| "name": "name", | |
| "description": null, | |
| "position": 2, | |
| "nullable": false, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "users_projects", | |
| "name": "project_id", | |
| "description": null, | |
| "position": 2, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "users_tasks", | |
| "name": "task_id", | |
| "description": null, | |
| "position": 2, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "web_content", | |
| "name": "name", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "whatev_jobs", | |
| "name": "name", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "whatev_projects", | |
| "name": "name", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "whatev_sites", | |
| "name": "name", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "withUnique", | |
| "name": "extra", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "zone", | |
| "name": "name", | |
| "description": null, | |
| "position": 2, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "activities", | |
| "name": "car_id", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "agents", | |
| "name": "department_id", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "app_users", | |
| "name": "password", | |
| "description": null, | |
| "position": 3, | |
| "nullable": false, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "articleStars", | |
| "name": "createdAt", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "timestamp without time zone", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "articles", | |
| "name": "owner", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "name", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "authors_books_number", | |
| "name": "num_in_forties", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "bigint", | |
| "updatable": false, | |
| "max_len": null, | |
| "precision": 64, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "authors_have_book_in_decade", | |
| "name": "has_book_in_forties", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "boolean", | |
| "updatable": false, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "authors_w_entities", | |
| "name": "entities", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "json", | |
| "updatable": false, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "auto_incrementing_pk", | |
| "name": "non_nullable_string", | |
| "description": null, | |
| "position": 3, | |
| "nullable": false, | |
| "col_type": "character varying", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "bar", | |
| "name": "fooId", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "bars", | |
| "name": "name", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "books", | |
| "name": "publication_year", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "smallint", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 16, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "child_entities", | |
| "name": "parent_id", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "comments", | |
| "name": "user_id", | |
| "description": null, | |
| "position": 3, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "complex_items", | |
| "name": "settings", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "json", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "compound_pk", | |
| "name": "extra", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "compound_unique", | |
| "name": "value", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "contract", | |
| "name": "purchase_price", | |
| "description": null, | |
| "position": 3, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "contract_view", | |
| "name": "purchase_price", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "departments", | |
| "name": "head_id", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "employees", | |
| "name": "salary", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "money", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "entities", | |
| "name": "arr", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "ARRAY", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "family_tree", | |
| "name": "parent", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "fifties_books", | |
| "name": "publication_year", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "smallint", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 16, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "filtered_tasks", | |
| "name": "projectID", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "forties_and_fifties_books", | |
| "name": "publication_year", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "smallint", | |
| "updatable": false, | |
| "max_len": null, | |
| "precision": 16, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "forties_books", | |
| "name": "publication_year", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "smallint", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 16, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "get_projects_above_view", | |
| "name": "client_id", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": false, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "getallprojects_view", | |
| "name": "client_id", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": false, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "grandchild_entities", | |
| "name": "parent_id", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "has_fk", | |
| "name": "simple_fk", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "character varying", | |
| "updatable": true, | |
| "max_len": 255, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "insertable_view_with_join", | |
| "name": "simple_fk", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "character varying", | |
| "updatable": false, | |
| "max_len": 255, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "items_with_different_col_types", | |
| "name": "bool_data", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "boolean", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "jobs", | |
| "name": "site_id", | |
| "description": null, | |
| "position": 3, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "limited_article_stars", | |
| "name": "created_at", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "timestamp without time zone", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "main_jobs", | |
| "name": "site_id", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "materialized_projects", | |
| "name": "client_id", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": false, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "menagerie", | |
| "name": "varchar", | |
| "description": null, | |
| "position": 3, | |
| "nullable": false, | |
| "col_type": "character varying", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "message", | |
| "name": "sender", | |
| "description": null, | |
| "position": 3, | |
| "nullable": false, | |
| "col_type": "bigint", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 64, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "odd_years_publications", | |
| "name": "publication_year", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "smallint", | |
| "updatable": false, | |
| "max_len": null, | |
| "precision": 16, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "openapi_types", | |
| "name": "a_text", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "orders", | |
| "name": "billing_address_id", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "orders_view", | |
| "name": "number", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "organizations", | |
| "name": "referee", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "person_detail", | |
| "name": "sent", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "bigint", | |
| "updatable": false, | |
| "max_len": null, | |
| "precision": 64, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "pgrst_reserved_chars", | |
| "name": "(inside,parens)", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "player_view", | |
| "name": "last_name", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "projects", | |
| "name": "client_id", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "projects_dump", | |
| "name": "client_id", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": false, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "projects_view", | |
| "name": "client_id", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "projects_view_alt", | |
| "name": "t_client_id", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "schedules", | |
| "name": "start_at", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "time with time zone", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "sites", | |
| "name": "main_project_id", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "sixties_books", | |
| "name": "publication_year", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "smallint", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 16, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "tasks", | |
| "name": "project_id", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "unit_workdays", | |
| "name": "fst_shift_activity_id", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "web_content", | |
| "name": "p_web_id", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "whatev_jobs", | |
| "name": "site_id_1", | |
| "description": null, | |
| "position": 3, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "zone", | |
| "name": "zone_type_id", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "activities", | |
| "name": "camera_id", | |
| "description": null, | |
| "position": 4, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "authors_books_number", | |
| "name": "num_in_fifties", | |
| "description": null, | |
| "position": 4, | |
| "nullable": true, | |
| "col_type": "bigint", | |
| "updatable": false, | |
| "max_len": null, | |
| "precision": 64, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "authors_have_book_in_decade", | |
| "name": "has_book_in_fifties", | |
| "description": null, | |
| "position": 4, | |
| "nullable": true, | |
| "col_type": "boolean", | |
| "updatable": false, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "auto_incrementing_pk", | |
| "name": "inserted_at", | |
| "description": null, | |
| "position": 4, | |
| "nullable": true, | |
| "col_type": "timestamp with time zone", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": "now()", | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "books", | |
| "name": "author_id", | |
| "description": null, | |
| "position": 4, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "comments", | |
| "name": "task_id", | |
| "description": null, | |
| "position": 4, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "complex_items", | |
| "name": "arr_data", | |
| "description": null, | |
| "position": 4, | |
| "nullable": true, | |
| "col_type": "ARRAY", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "contract", | |
| "name": "id", | |
| "description": null, | |
| "position": 4, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "contract_view", | |
| "name": "id", | |
| "description": null, | |
| "position": 4, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "employees", | |
| "name": "company", | |
| "description": null, | |
| "position": 4, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "entities", | |
| "name": "text_search_vector", | |
| "description": null, | |
| "position": 4, | |
| "nullable": true, | |
| "col_type": "tsvector", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "fifties_books", | |
| "name": "author_id", | |
| "description": null, | |
| "position": 4, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "forties_and_fifties_books", | |
| "name": "first_publisher", | |
| "description": null, | |
| "position": 4, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": false, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "forties_books", | |
| "name": "author_id", | |
| "description": null, | |
| "position": 4, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "grandchild_entities", | |
| "name": "or_starting_col", | |
| "description": null, | |
| "position": 4, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "insertable_view_with_join", | |
| "name": "nullable_string", | |
| "description": null, | |
| "position": 4, | |
| "nullable": true, | |
| "col_type": "character varying", | |
| "updatable": false, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "items_with_different_col_types", | |
| "name": "bin_data", | |
| "description": null, | |
| "position": 4, | |
| "nullable": true, | |
| "col_type": "bytea", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "jobs", | |
| "name": "big_project_id", | |
| "description": null, | |
| "position": 4, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "main_jobs", | |
| "name": "big_project_id", | |
| "description": null, | |
| "position": 4, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "menagerie", | |
| "name": "boolean", | |
| "description": null, | |
| "position": 4, | |
| "nullable": false, | |
| "col_type": "boolean", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "message", | |
| "name": "recipient", | |
| "description": null, | |
| "position": 4, | |
| "nullable": false, | |
| "col_type": "bigint", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 64, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "odd_years_publications", | |
| "name": "first_publisher", | |
| "description": null, | |
| "position": 4, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": false, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "openapi_types", | |
| "name": "a_boolean", | |
| "description": null, | |
| "position": 4, | |
| "nullable": true, | |
| "col_type": "boolean", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "orders", | |
| "name": "shipping_address_id", | |
| "description": null, | |
| "position": 4, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "organizations", | |
| "name": "auditor", | |
| "description": null, | |
| "position": 4, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "person_detail", | |
| "name": "received", | |
| "description": null, | |
| "position": 4, | |
| "nullable": true, | |
| "col_type": "bigint", | |
| "updatable": false, | |
| "max_len": null, | |
| "precision": 64, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "pgrst_reserved_chars", | |
| "name": "a.dotted.column", | |
| "description": null, | |
| "position": 4, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "player_view", | |
| "name": "birth_date", | |
| "description": null, | |
| "position": 4, | |
| "nullable": true, | |
| "col_type": "date", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "schedules", | |
| "name": "end_at", | |
| "description": null, | |
| "position": 4, | |
| "nullable": true, | |
| "col_type": "time with time zone", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "sixties_books", | |
| "name": "author_id", | |
| "description": null, | |
| "position": 4, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "unit_workdays", | |
| "name": "fst_shift_schedule_id", | |
| "description": null, | |
| "position": 4, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "whatev_jobs", | |
| "name": "project_id_1", | |
| "description": null, | |
| "position": 4, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "zone", | |
| "name": "space_id", | |
| "description": null, | |
| "position": 4, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "authors_books_number", | |
| "name": "num_in_sixties", | |
| "description": null, | |
| "position": 5, | |
| "nullable": true, | |
| "col_type": "bigint", | |
| "updatable": false, | |
| "max_len": null, | |
| "precision": 64, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "authors_have_book_in_decade", | |
| "name": "has_book_in_sixties", | |
| "description": null, | |
| "position": 5, | |
| "nullable": true, | |
| "col_type": "boolean", | |
| "updatable": false, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "comments", | |
| "name": "content", | |
| "description": null, | |
| "position": 5, | |
| "nullable": false, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "complex_items", | |
| "name": "field-with_sep", | |
| "description": null, | |
| "position": 5, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": "1", | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "contract", | |
| "name": "first_name", | |
| "description": null, | |
| "position": 5, | |
| "nullable": false, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "contract_view", | |
| "name": "first_name", | |
| "description": null, | |
| "position": 5, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "employees", | |
| "name": "occupation", | |
| "description": null, | |
| "position": 5, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "forties_and_fifties_books", | |
| "name": "author_id", | |
| "description": null, | |
| "position": 5, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": false, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "grandchild_entities", | |
| "name": "and_starting_col", | |
| "description": null, | |
| "position": 5, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "insertable_view_with_join", | |
| "name": "non_nullable_string", | |
| "description": null, | |
| "position": 5, | |
| "nullable": true, | |
| "col_type": "character varying", | |
| "updatable": false, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "items_with_different_col_types", | |
| "name": "char_data", | |
| "description": null, | |
| "position": 5, | |
| "nullable": true, | |
| "col_type": "character varying", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "menagerie", | |
| "name": "date", | |
| "description": null, | |
| "position": 5, | |
| "nullable": false, | |
| "col_type": "date", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "odd_years_publications", | |
| "name": "author_id", | |
| "description": null, | |
| "position": 5, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": false, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "openapi_types", | |
| "name": "a_smallint", | |
| "description": null, | |
| "position": 5, | |
| "nullable": true, | |
| "col_type": "smallint", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 16, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "organizations", | |
| "name": "manager_id", | |
| "description": null, | |
| "position": 5, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "pgrst_reserved_chars", | |
| "name": " col w space ", | |
| "description": null, | |
| "position": 5, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "unit_workdays", | |
| "name": "snd_shift_activity_id", | |
| "description": null, | |
| "position": 5, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "whatev_jobs", | |
| "name": "site_id_2", | |
| "description": null, | |
| "position": 5, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "authors_books_number", | |
| "name": "num_in_all_decades", | |
| "description": null, | |
| "position": 6, | |
| "nullable": true, | |
| "col_type": "bigint", | |
| "updatable": false, | |
| "max_len": null, | |
| "precision": 64, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "contract", | |
| "name": "last_name", | |
| "description": null, | |
| "position": 6, | |
| "nullable": false, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "contract_view", | |
| "name": "last_name", | |
| "description": null, | |
| "position": 6, | |
| "nullable": true, | |
| "col_type": "text", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "grandchild_entities", | |
| "name": "jsonb_col", | |
| "description": null, | |
| "position": 6, | |
| "nullable": true, | |
| "col_type": "jsonb", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "insertable_view_with_join", | |
| "name": "inserted_at", | |
| "description": null, | |
| "position": 6, | |
| "nullable": true, | |
| "col_type": "timestamp with time zone", | |
| "updatable": false, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "items_with_different_col_types", | |
| "name": "date_data", | |
| "description": null, | |
| "position": 6, | |
| "nullable": true, | |
| "col_type": "date", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "menagerie", | |
| "name": "money", | |
| "description": null, | |
| "position": 6, | |
| "nullable": false, | |
| "col_type": "money", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "openapi_types", | |
| "name": "a_integer", | |
| "description": null, | |
| "position": 6, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "unit_workdays", | |
| "name": "snd_shift_schedule_id", | |
| "description": null, | |
| "position": 6, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "whatev_jobs", | |
| "name": "project_id_2", | |
| "description": null, | |
| "position": 6, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "contract", | |
| "name": "birth_date", | |
| "description": null, | |
| "position": 7, | |
| "nullable": true, | |
| "col_type": "date", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "contract_view", | |
| "name": "birth_date", | |
| "description": null, | |
| "position": 7, | |
| "nullable": true, | |
| "col_type": "date", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "items_with_different_col_types", | |
| "name": "real_data", | |
| "description": null, | |
| "position": 7, | |
| "nullable": true, | |
| "col_type": "real", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 24, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "menagerie", | |
| "name": "enum", | |
| "description": null, | |
| "position": 7, | |
| "nullable": false, | |
| "col_type": "test.enum_menagerie_type", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": "foo,bar" | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "openapi_types", | |
| "name": "a_bigint", | |
| "description": null, | |
| "position": 7, | |
| "nullable": true, | |
| "col_type": "bigint", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 64, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "items_with_different_col_types", | |
| "name": "time_data", | |
| "description": null, | |
| "position": 8, | |
| "nullable": true, | |
| "col_type": "time without time zone", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "openapi_types", | |
| "name": "a_numeric", | |
| "description": null, | |
| "position": 8, | |
| "nullable": true, | |
| "col_type": "numeric", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": null, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "openapi_types", | |
| "name": "a_real", | |
| "description": null, | |
| "position": 9, | |
| "nullable": true, | |
| "col_type": "real", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 24, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "test", | |
| "table_name": "openapi_types", | |
| "name": "a_double_precision", | |
| "description": null, | |
| "position": 10, | |
| "nullable": true, | |
| "col_type": "double precision", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 53, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "v1", | |
| "table_name": "children", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": "nextval('v1.children_id_seq'::regclass)", | |
| "enum": null | |
| }, | |
| { | |
| "schema": "v1", | |
| "table_name": "parents", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "v1", | |
| "table_name": "children", | |
| "name": "parent_id", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "v2", | |
| "table_name": "another_table", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "v2", | |
| "table_name": "children", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": "nextval('v2.children_id_seq'::regclass)", | |
| "enum": null | |
| }, | |
| { | |
| "schema": "v2", | |
| "table_name": "parents", | |
| "name": "id", | |
| "description": null, | |
| "position": 1, | |
| "nullable": false, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| }, | |
| { | |
| "schema": "v2", | |
| "table_name": "children", | |
| "name": "parent_id", | |
| "description": null, | |
| "position": 3, | |
| "nullable": true, | |
| "col_type": "integer", | |
| "updatable": true, | |
| "max_len": null, | |
| "precision": 32, | |
| "default_value": null, | |
| "enum": null | |
| } | |
| ], | |
| "m2o_rels": [ | |
| { | |
| "table_schema": "public", | |
| "table_name": "public_orders", | |
| "constraint_name": "public_orders_consumer_fkey", | |
| "columns": [ | |
| "consumer" | |
| ], | |
| "foreign_table_schema": "public", | |
| "foreign_table_name": "public_consumers", | |
| "foreign_columns": [ | |
| "id" | |
| ] | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "has_fk", | |
| "constraint_name": "has_fk_fk_fkey", | |
| "columns": [ | |
| "auto_inc_fk" | |
| ], | |
| "foreign_table_schema": "test", | |
| "foreign_table_name": "auto_incrementing_pk", | |
| "foreign_columns": [ | |
| "id" | |
| ] | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "has_fk", | |
| "constraint_name": "has_fk_simple_fk_fkey", | |
| "columns": [ | |
| "simple_fk" | |
| ], | |
| "foreign_table_schema": "test", | |
| "foreign_table_name": "simple_pk", | |
| "foreign_columns": [ | |
| "k" | |
| ] | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "projects", | |
| "constraint_name": "client", | |
| "columns": [ | |
| "client_id" | |
| ], | |
| "foreign_table_schema": "test", | |
| "foreign_table_name": "clients", | |
| "foreign_columns": [ | |
| "id" | |
| ] | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "users_projects", | |
| "constraint_name": "users_projects_user_id_fkey", | |
| "columns": [ | |
| "user_id" | |
| ], | |
| "foreign_table_schema": "test", | |
| "foreign_table_name": "users", | |
| "foreign_columns": [ | |
| "id" | |
| ] | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "users_projects", | |
| "constraint_name": "users_projects_project_id_fkey", | |
| "columns": [ | |
| "project_id" | |
| ], | |
| "foreign_table_schema": "test", | |
| "foreign_table_name": "projects", | |
| "foreign_columns": [ | |
| "id" | |
| ] | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "tasks", | |
| "constraint_name": "project", | |
| "columns": [ | |
| "project_id" | |
| ], | |
| "foreign_table_schema": "test", | |
| "foreign_table_name": "projects", | |
| "foreign_columns": [ | |
| "id" | |
| ] | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "users_tasks", | |
| "constraint_name": "users_tasks_user_id_fkey", | |
| "columns": [ | |
| "user_id" | |
| ], | |
| "foreign_table_schema": "test", | |
| "foreign_table_name": "users", | |
| "foreign_columns": [ | |
| "id" | |
| ] | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "users_tasks", | |
| "constraint_name": "users_tasks_task_id_fkey", | |
| "columns": [ | |
| "task_id" | |
| ], | |
| "foreign_table_schema": "test", | |
| "foreign_table_name": "tasks", | |
| "foreign_columns": [ | |
| "id" | |
| ] | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "comments", | |
| "constraint_name": "user", | |
| "columns": [ | |
| "commenter_id" | |
| ], | |
| "foreign_table_schema": "test", | |
| "foreign_table_name": "users", | |
| "foreign_columns": [ | |
| "id" | |
| ] | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "comments", | |
| "constraint_name": "comments_task_id_fkey", | |
| "columns": [ | |
| "user_id", | |
| "task_id" | |
| ], | |
| "foreign_table_schema": "test", | |
| "foreign_table_name": "users_tasks", | |
| "foreign_columns": [ | |
| "user_id", | |
| "task_id" | |
| ] | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "article_stars", | |
| "constraint_name": "article", | |
| "columns": [ | |
| "article_id" | |
| ], | |
| "foreign_table_schema": "private", | |
| "foreign_table_name": "articles", | |
| "foreign_columns": [ | |
| "id" | |
| ] | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "article_stars", | |
| "constraint_name": "user", | |
| "columns": [ | |
| "user_id" | |
| ], | |
| "foreign_table_schema": "test", | |
| "foreign_table_name": "users", | |
| "foreign_columns": [ | |
| "id" | |
| ] | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "ghostBusters", | |
| "constraint_name": "ghostBusters_escapeId_fkey", | |
| "columns": [ | |
| "escapeId" | |
| ], | |
| "foreign_table_schema": "test", | |
| "foreign_table_name": "Escap3e;", | |
| "foreign_columns": [ | |
| "so6meIdColumn" | |
| ] | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "orders", | |
| "constraint_name": "billing", | |
| "columns": [ | |
| "billing_address_id" | |
| ], | |
| "foreign_table_schema": "test", | |
| "foreign_table_name": "addresses", | |
| "foreign_columns": [ | |
| "id" | |
| ] | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "orders", | |
| "constraint_name": "shipping", | |
| "columns": [ | |
| "shipping_address_id" | |
| ], | |
| "foreign_table_schema": "test", | |
| "foreign_table_name": "addresses", | |
| "foreign_columns": [ | |
| "id" | |
| ] | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "child_entities", | |
| "constraint_name": "child_entities_parent_id_fkey", | |
| "columns": [ | |
| "parent_id" | |
| ], | |
| "foreign_table_schema": "test", | |
| "foreign_table_name": "entities", | |
| "foreign_columns": [ | |
| "id" | |
| ] | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "grandchild_entities", | |
| "constraint_name": "grandchild_entities_parent_id_fkey", | |
| "columns": [ | |
| "parent_id" | |
| ], | |
| "foreign_table_schema": "test", | |
| "foreign_table_name": "child_entities", | |
| "foreign_columns": [ | |
| "id" | |
| ] | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "descendant", | |
| "constraint_name": "descendant_being_fkey", | |
| "columns": [ | |
| "being" | |
| ], | |
| "foreign_table_schema": "test", | |
| "foreign_table_name": "being", | |
| "foreign_columns": [ | |
| "being" | |
| ] | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "being_part", | |
| "constraint_name": "being_part_being_fkey", | |
| "columns": [ | |
| "being" | |
| ], | |
| "foreign_table_schema": "test", | |
| "foreign_table_name": "being", | |
| "foreign_columns": [ | |
| "being" | |
| ] | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "being_part", | |
| "constraint_name": "being_part_part_fkey", | |
| "columns": [ | |
| "part" | |
| ], | |
| "foreign_table_schema": "test", | |
| "foreign_table_name": "part", | |
| "foreign_columns": [ | |
| "part" | |
| ] | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "family_tree", | |
| "constraint_name": "pptr", | |
| "columns": [ | |
| "parent" | |
| ], | |
| "foreign_table_schema": "test", | |
| "foreign_table_name": "family_tree", | |
| "foreign_columns": [ | |
| "id" | |
| ] | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "organizations", | |
| "constraint_name": "organizations_referee_fkey", | |
| "columns": [ | |
| "referee" | |
| ], | |
| "foreign_table_schema": "test", | |
| "foreign_table_name": "organizations", | |
| "foreign_columns": [ | |
| "id" | |
| ] | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "organizations", | |
| "constraint_name": "organizations_auditor_fkey", | |
| "columns": [ | |
| "auditor" | |
| ], | |
| "foreign_table_schema": "test", | |
| "foreign_table_name": "organizations", | |
| "foreign_columns": [ | |
| "id" | |
| ] | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "organizations", | |
| "constraint_name": "manager", | |
| "columns": [ | |
| "manager_id" | |
| ], | |
| "foreign_table_schema": "test", | |
| "foreign_table_name": "managers", | |
| "foreign_columns": [ | |
| "id" | |
| ] | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "books", | |
| "constraint_name": "books_author_id_fkey", | |
| "columns": [ | |
| "author_id" | |
| ], | |
| "foreign_table_schema": "private", | |
| "foreign_table_name": "authors", | |
| "foreign_columns": [ | |
| "id" | |
| ] | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "books", | |
| "constraint_name": "books_first_publisher_id_fkey", | |
| "columns": [ | |
| "first_publisher_id" | |
| ], | |
| "foreign_table_schema": "private", | |
| "foreign_table_name": "publishers", | |
| "foreign_columns": [ | |
| "id" | |
| ] | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "message", | |
| "constraint_name": "message_sender_fkey", | |
| "columns": [ | |
| "sender" | |
| ], | |
| "foreign_table_schema": "test", | |
| "foreign_table_name": "person", | |
| "foreign_columns": [ | |
| "id" | |
| ] | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "message", | |
| "constraint_name": "message_recipient_fkey", | |
| "columns": [ | |
| "recipient" | |
| ], | |
| "foreign_table_schema": "test", | |
| "foreign_table_name": "person", | |
| "foreign_columns": [ | |
| "id" | |
| ] | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "zone", | |
| "constraint_name": "zone_space_id_fkey", | |
| "columns": [ | |
| "space_id" | |
| ], | |
| "foreign_table_schema": "test", | |
| "foreign_table_name": "space", | |
| "foreign_columns": [ | |
| "id" | |
| ] | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "bar", | |
| "constraint_name": "bar_fooId_fkey", | |
| "columns": [ | |
| "fooId" | |
| ], | |
| "foreign_table_schema": "test", | |
| "foreign_table_name": "Foo", | |
| "foreign_columns": [ | |
| "id" | |
| ] | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "contract", | |
| "constraint_name": "contract_last_name_fkey", | |
| "columns": [ | |
| "id", | |
| "first_name", | |
| "last_name", | |
| "birth_date" | |
| ], | |
| "foreign_table_schema": "private", | |
| "foreign_table_name": "player", | |
| "foreign_columns": [ | |
| "id", | |
| "first_name", | |
| "last_name", | |
| "birth_date" | |
| ] | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "web_content", | |
| "constraint_name": "web_content_p_web_id_fkey", | |
| "columns": [ | |
| "p_web_id" | |
| ], | |
| "foreign_table_schema": "test", | |
| "foreign_table_name": "web_content", | |
| "foreign_columns": [ | |
| "id" | |
| ] | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "referrals", | |
| "constraint_name": "referrals_link_fkey", | |
| "columns": [ | |
| "link" | |
| ], | |
| "foreign_table_schema": "private", | |
| "foreign_table_name": "pages", | |
| "foreign_columns": [ | |
| "link" | |
| ] | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "sites", | |
| "constraint_name": "main_project", | |
| "columns": [ | |
| "main_project_id" | |
| ], | |
| "foreign_table_schema": "test", | |
| "foreign_table_name": "big_projects", | |
| "foreign_columns": [ | |
| "big_project_id" | |
| ] | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "jobs", | |
| "constraint_name": "jobs_site_id_fkey", | |
| "columns": [ | |
| "site_id" | |
| ], | |
| "foreign_table_schema": "test", | |
| "foreign_table_name": "sites", | |
| "foreign_columns": [ | |
| "site_id" | |
| ] | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "jobs", | |
| "constraint_name": "jobs_big_project_id_fkey", | |
| "columns": [ | |
| "big_project_id" | |
| ], | |
| "foreign_table_schema": "test", | |
| "foreign_table_name": "big_projects", | |
| "foreign_columns": [ | |
| "big_project_id" | |
| ] | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "whatev_jobs", | |
| "constraint_name": "whatev_jobs_site_id_1_fkey", | |
| "columns": [ | |
| "site_id_1" | |
| ], | |
| "foreign_table_schema": "test", | |
| "foreign_table_name": "whatev_sites", | |
| "foreign_columns": [ | |
| "id" | |
| ] | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "whatev_jobs", | |
| "constraint_name": "whatev_jobs_project_id_1_fkey", | |
| "columns": [ | |
| "project_id_1" | |
| ], | |
| "foreign_table_schema": "test", | |
| "foreign_table_name": "whatev_projects", | |
| "foreign_columns": [ | |
| "id" | |
| ] | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "whatev_jobs", | |
| "constraint_name": "whatev_jobs_site_id_2_fkey", | |
| "columns": [ | |
| "site_id_2" | |
| ], | |
| "foreign_table_schema": "test", | |
| "foreign_table_name": "whatev_sites", | |
| "foreign_columns": [ | |
| "id" | |
| ] | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "whatev_jobs", | |
| "constraint_name": "whatev_jobs_project_id_2_fkey", | |
| "columns": [ | |
| "project_id_2" | |
| ], | |
| "foreign_table_schema": "test", | |
| "foreign_table_name": "whatev_projects", | |
| "foreign_columns": [ | |
| "id" | |
| ] | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "agents", | |
| "constraint_name": "agents_department_id_fkey", | |
| "columns": [ | |
| "department_id" | |
| ], | |
| "foreign_table_schema": "test", | |
| "foreign_table_name": "departments", | |
| "foreign_columns": [ | |
| "id" | |
| ] | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "departments", | |
| "constraint_name": "departments_head_id_fkey", | |
| "columns": [ | |
| "head_id" | |
| ], | |
| "foreign_table_schema": "test", | |
| "foreign_table_name": "agents", | |
| "foreign_columns": [ | |
| "id" | |
| ] | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "activities", | |
| "constraint_name": "schedule", | |
| "columns": [ | |
| "schedule_id" | |
| ], | |
| "foreign_table_schema": "test", | |
| "foreign_table_name": "schedules", | |
| "foreign_columns": [ | |
| "id" | |
| ] | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "unit_workdays", | |
| "constraint_name": "fst_shift", | |
| "columns": [ | |
| "fst_shift_activity_id", | |
| "fst_shift_schedule_id" | |
| ], | |
| "foreign_table_schema": "test", | |
| "foreign_table_name": "activities", | |
| "foreign_columns": [ | |
| "id", | |
| "schedule_id" | |
| ] | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "unit_workdays", | |
| "constraint_name": "snd_shift", | |
| "columns": [ | |
| "snd_shift_activity_id", | |
| "snd_shift_schedule_id" | |
| ], | |
| "foreign_table_schema": "test", | |
| "foreign_table_name": "activities", | |
| "foreign_columns": [ | |
| "id", | |
| "schedule_id" | |
| ] | |
| }, | |
| { | |
| "table_schema": "v1", | |
| "table_name": "children", | |
| "constraint_name": "parent", | |
| "columns": [ | |
| "parent_id" | |
| ], | |
| "foreign_table_schema": "v1", | |
| "foreign_table_name": "parents", | |
| "foreign_columns": [ | |
| "id" | |
| ] | |
| }, | |
| { | |
| "table_schema": "v2", | |
| "table_name": "children", | |
| "constraint_name": "parent", | |
| "columns": [ | |
| "parent_id" | |
| ], | |
| "foreign_table_schema": "v2", | |
| "foreign_table_name": "parents", | |
| "foreign_columns": [ | |
| "id" | |
| ] | |
| } | |
| ], | |
| "primary_keys": [ | |
| { | |
| "table_schema": "test", | |
| "table_name": "items", | |
| "column_name": "id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "items2", | |
| "column_name": "id" | |
| }, | |
| { | |
| "table_schema": "public", | |
| "table_name": "public_consumers", | |
| "column_name": "id" | |
| }, | |
| { | |
| "table_schema": "public", | |
| "table_name": "public_orders", | |
| "column_name": "id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "clients", | |
| "column_name": "id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "only_pk", | |
| "column_name": "id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "projects", | |
| "column_name": "id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "users", | |
| "column_name": "id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "users_projects", | |
| "column_name": "project_id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "users_projects", | |
| "column_name": "user_id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "tasks", | |
| "column_name": "id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "users_tasks", | |
| "column_name": "task_id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "users_tasks", | |
| "column_name": "user_id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "comments", | |
| "column_name": "id" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "articles", | |
| "column_name": "id" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "article_stars", | |
| "column_name": "article_id" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "article_stars", | |
| "column_name": "user_id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "Escap3e;", | |
| "column_name": "so6meIdColumn" | |
| }, | |
| { | |
| "table_schema": "postgrest", | |
| "table_name": "auth", | |
| "column_name": "id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "authors_only", | |
| "column_name": "secret" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "auto_incrementing_pk", | |
| "column_name": "id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "complex_items", | |
| "column_name": "id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "compound_pk", | |
| "column_name": "k1" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "compound_pk", | |
| "column_name": "k2" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "simple_pk", | |
| "column_name": "k" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "has_fk", | |
| "column_name": "id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "menagerie", | |
| "column_name": "integer" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "entities", | |
| "column_name": "id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "child_entities", | |
| "column_name": "id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "grandchild_entities", | |
| "column_name": "id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "ranges", | |
| "column_name": "id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "being", | |
| "column_name": "being" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "descendant", | |
| "column_name": "descendant" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "part", | |
| "column_name": "part" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "leak", | |
| "column_name": "id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "employees", | |
| "column_name": "first_name" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "employees", | |
| "column_name": "last_name" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "tiobe_pls", | |
| "column_name": "name" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "family_tree", | |
| "column_name": "id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "managers", | |
| "column_name": "id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "organizations", | |
| "column_name": "id" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "authors", | |
| "column_name": "id" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "publishers", | |
| "column_name": "id" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "books", | |
| "column_name": "id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "person", | |
| "column_name": "id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "message", | |
| "column_name": "id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "space", | |
| "column_name": "id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "zone", | |
| "column_name": "id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "UnitTest", | |
| "column_name": "idUnitTest" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "json_arr", | |
| "column_name": "id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "jsonb_test", | |
| "column_name": "id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "Foo", | |
| "column_name": "id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "bar", | |
| "column_name": "id" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "player", | |
| "column_name": "last_name" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "player", | |
| "column_name": "id" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "player", | |
| "column_name": "first_name" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "player", | |
| "column_name": "birth_date" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "web_content", | |
| "column_name": "id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "app_users", | |
| "column_name": "id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "big_projects", | |
| "column_name": "big_project_id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "sites", | |
| "column_name": "site_id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "jobs", | |
| "column_name": "job_id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "whatev_projects", | |
| "column_name": "id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "whatev_sites", | |
| "column_name": "id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "whatev_jobs", | |
| "column_name": "job_id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "agents", | |
| "column_name": "id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "departments", | |
| "column_name": "id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "schedules", | |
| "column_name": "id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "activities", | |
| "column_name": "id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "activities", | |
| "column_name": "schedule_id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "unit_workdays", | |
| "column_name": "unit_id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "unit_workdays", | |
| "column_name": "day" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "stuff", | |
| "column_name": "id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "loc_test", | |
| "column_name": "id" | |
| }, | |
| { | |
| "table_schema": "v1", | |
| "table_name": "parents", | |
| "column_name": "id" | |
| }, | |
| { | |
| "table_schema": "v1", | |
| "table_name": "children", | |
| "column_name": "id" | |
| }, | |
| { | |
| "table_schema": "v2", | |
| "table_name": "parents", | |
| "column_name": "id" | |
| }, | |
| { | |
| "table_schema": "v2", | |
| "table_name": "children", | |
| "column_name": "id" | |
| }, | |
| { | |
| "table_schema": "v2", | |
| "table_name": "another_table", | |
| "column_name": "id" | |
| } | |
| ], | |
| "source_columns": [ | |
| { | |
| "table_schema": "private", | |
| "table_name": "article_stars", | |
| "table_column_name": "article_id", | |
| "view_schema": "test", | |
| "view_name": "articleStars", | |
| "view_colum_name": "articleId" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "article_stars", | |
| "table_column_name": "created_at", | |
| "view_schema": "test", | |
| "view_name": "articleStars", | |
| "view_colum_name": "createdAt" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "article_stars", | |
| "table_column_name": "user_id", | |
| "view_schema": "test", | |
| "view_name": "articleStars", | |
| "view_colum_name": "userId" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "articles", | |
| "table_column_name": "body", | |
| "view_schema": "test", | |
| "view_name": "articles", | |
| "view_colum_name": "body" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "articles", | |
| "table_column_name": "id", | |
| "view_schema": "test", | |
| "view_name": "articles", | |
| "view_colum_name": "id" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "articles", | |
| "table_column_name": "owner", | |
| "view_schema": "test", | |
| "view_name": "articles", | |
| "view_colum_name": "owner" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "authors", | |
| "table_column_name": "id", | |
| "view_schema": "test", | |
| "view_name": "authors", | |
| "view_colum_name": "id" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "authors", | |
| "table_column_name": "name", | |
| "view_schema": "test", | |
| "view_name": "authors", | |
| "view_colum_name": "name" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "sixties_books", | |
| "table_column_name": "author_id", | |
| "view_schema": "test", | |
| "view_name": "authors_have_book_in_decade", | |
| "view_colum_name": "author_id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "bar", | |
| "table_column_name": "fooId", | |
| "view_schema": "test", | |
| "view_name": "bars", | |
| "view_colum_name": "fooId" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "bar", | |
| "table_column_name": "id", | |
| "view_schema": "test", | |
| "view_name": "bars", | |
| "view_colum_name": "id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "bar", | |
| "table_column_name": "name", | |
| "view_schema": "test", | |
| "view_name": "bars", | |
| "view_colum_name": "name" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "books", | |
| "table_column_name": "author_id", | |
| "view_schema": "test", | |
| "view_name": "books", | |
| "view_colum_name": "author_id" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "books", | |
| "table_column_name": "id", | |
| "view_schema": "test", | |
| "view_name": "books", | |
| "view_colum_name": "id" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "books", | |
| "table_column_name": "publication_year", | |
| "view_schema": "test", | |
| "view_name": "books", | |
| "view_colum_name": "publication_year" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "books", | |
| "table_column_name": "title", | |
| "view_schema": "test", | |
| "view_name": "books", | |
| "view_colum_name": "title" | |
| }, | |
| { | |
| "table_schema": "public", | |
| "table_name": "public_consumers", | |
| "table_column_name": "id", | |
| "view_schema": "test", | |
| "view_name": "consumers_view", | |
| "view_colum_name": "id" | |
| }, | |
| { | |
| "table_schema": "public", | |
| "table_name": "public_consumers", | |
| "table_column_name": "name", | |
| "view_schema": "test", | |
| "view_name": "consumers_view", | |
| "view_colum_name": "name" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "contract", | |
| "table_column_name": "birth_date", | |
| "view_schema": "test", | |
| "view_name": "contract_view", | |
| "view_colum_name": "birth_date" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "contract", | |
| "table_column_name": "first_name", | |
| "view_schema": "test", | |
| "view_name": "contract_view", | |
| "view_colum_name": "first_name" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "contract", | |
| "table_column_name": "id", | |
| "view_schema": "test", | |
| "view_name": "contract_view", | |
| "view_colum_name": "id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "contract", | |
| "table_column_name": "last_name", | |
| "view_schema": "test", | |
| "view_name": "contract_view", | |
| "view_colum_name": "last_name" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "contract", | |
| "table_column_name": "purchase_price", | |
| "view_schema": "test", | |
| "view_name": "contract_view", | |
| "view_colum_name": "purchase_price" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "contract", | |
| "table_column_name": "time", | |
| "view_schema": "test", | |
| "view_name": "contract_view", | |
| "view_colum_name": "time" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "contract", | |
| "table_column_name": "tournament", | |
| "view_schema": "test", | |
| "view_name": "contract_view", | |
| "view_colum_name": "tournament" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "books", | |
| "table_column_name": "author_id", | |
| "view_schema": "test", | |
| "view_name": "fifties_books", | |
| "view_colum_name": "author_id" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "books", | |
| "table_column_name": "id", | |
| "view_schema": "test", | |
| "view_name": "fifties_books", | |
| "view_colum_name": "id" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "books", | |
| "table_column_name": "publication_year", | |
| "view_schema": "test", | |
| "view_name": "fifties_books", | |
| "view_colum_name": "publication_year" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "books", | |
| "table_column_name": "title", | |
| "view_schema": "test", | |
| "view_name": "fifties_books", | |
| "view_colum_name": "title" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "tasks", | |
| "table_column_name": "id", | |
| "view_schema": "test", | |
| "view_name": "filtered_tasks", | |
| "view_colum_name": "myId" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "tasks", | |
| "table_column_name": "name", | |
| "view_schema": "test", | |
| "view_name": "filtered_tasks", | |
| "view_colum_name": "name" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "tasks", | |
| "table_column_name": "project_id", | |
| "view_schema": "test", | |
| "view_name": "filtered_tasks", | |
| "view_colum_name": "projectID" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "Foo", | |
| "table_column_name": "id", | |
| "view_schema": "test", | |
| "view_name": "foos", | |
| "view_colum_name": "id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "Foo", | |
| "table_column_name": "name", | |
| "view_schema": "test", | |
| "view_name": "foos", | |
| "view_colum_name": "name" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "books", | |
| "table_column_name": "author_id", | |
| "view_schema": "test", | |
| "view_name": "forties_and_fifties_books", | |
| "view_colum_name": "author_id" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "publishers", | |
| "table_column_name": "name", | |
| "view_schema": "test", | |
| "view_name": "forties_and_fifties_books", | |
| "view_colum_name": "first_publisher" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "books", | |
| "table_column_name": "id", | |
| "view_schema": "test", | |
| "view_name": "forties_and_fifties_books", | |
| "view_colum_name": "id" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "books", | |
| "table_column_name": "publication_year", | |
| "view_schema": "test", | |
| "view_name": "forties_and_fifties_books", | |
| "view_colum_name": "publication_year" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "books", | |
| "table_column_name": "title", | |
| "view_schema": "test", | |
| "view_name": "forties_and_fifties_books", | |
| "view_colum_name": "title" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "books", | |
| "table_column_name": "author_id", | |
| "view_schema": "test", | |
| "view_name": "forties_books", | |
| "view_colum_name": "author_id" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "books", | |
| "table_column_name": "id", | |
| "view_schema": "test", | |
| "view_name": "forties_books", | |
| "view_colum_name": "id" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "books", | |
| "table_column_name": "publication_year", | |
| "view_schema": "test", | |
| "view_name": "forties_books", | |
| "view_colum_name": "publication_year" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "books", | |
| "table_column_name": "title", | |
| "view_schema": "test", | |
| "view_name": "forties_books", | |
| "view_colum_name": "title" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "images", | |
| "table_column_name": "name", | |
| "view_schema": "test", | |
| "view_name": "images_base64", | |
| "view_colum_name": "name" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "has_fk", | |
| "table_column_name": "auto_inc_fk", | |
| "view_schema": "test", | |
| "view_name": "insertable_view_with_join", | |
| "view_colum_name": "auto_inc_fk" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "has_fk", | |
| "table_column_name": "id", | |
| "view_schema": "test", | |
| "view_name": "insertable_view_with_join", | |
| "view_colum_name": "id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "auto_incrementing_pk", | |
| "table_column_name": "inserted_at", | |
| "view_schema": "test", | |
| "view_name": "insertable_view_with_join", | |
| "view_colum_name": "inserted_at" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "auto_incrementing_pk", | |
| "table_column_name": "non_nullable_string", | |
| "view_schema": "test", | |
| "view_name": "insertable_view_with_join", | |
| "view_colum_name": "non_nullable_string" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "auto_incrementing_pk", | |
| "table_column_name": "nullable_string", | |
| "view_schema": "test", | |
| "view_name": "insertable_view_with_join", | |
| "view_colum_name": "nullable_string" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "has_fk", | |
| "table_column_name": "simple_fk", | |
| "view_schema": "test", | |
| "view_name": "insertable_view_with_join", | |
| "view_colum_name": "simple_fk" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "article_stars", | |
| "table_column_name": "article_id", | |
| "view_schema": "test", | |
| "view_name": "limited_article_stars", | |
| "view_colum_name": "article_id" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "article_stars", | |
| "table_column_name": "created_at", | |
| "view_schema": "test", | |
| "view_name": "limited_article_stars", | |
| "view_colum_name": "created_at" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "article_stars", | |
| "table_column_name": "user_id", | |
| "view_schema": "test", | |
| "view_name": "limited_article_stars", | |
| "view_colum_name": "user_id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "jobs", | |
| "table_column_name": "big_project_id", | |
| "view_schema": "test", | |
| "view_name": "main_jobs", | |
| "view_colum_name": "big_project_id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "jobs", | |
| "table_column_name": "job_id", | |
| "view_schema": "test", | |
| "view_name": "main_jobs", | |
| "view_colum_name": "job_id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "jobs", | |
| "table_column_name": "name", | |
| "view_schema": "test", | |
| "view_name": "main_jobs", | |
| "view_colum_name": "name" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "jobs", | |
| "table_column_name": "site_id", | |
| "view_schema": "test", | |
| "view_name": "main_jobs", | |
| "view_colum_name": "site_id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "projects", | |
| "table_column_name": "client_id", | |
| "view_schema": "test", | |
| "view_name": "materialized_projects", | |
| "view_colum_name": "client_id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "projects", | |
| "table_column_name": "id", | |
| "view_schema": "test", | |
| "view_name": "materialized_projects", | |
| "view_colum_name": "id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "projects", | |
| "table_column_name": "name", | |
| "view_schema": "test", | |
| "view_name": "materialized_projects", | |
| "view_colum_name": "name" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "books", | |
| "table_column_name": "author_id", | |
| "view_schema": "test", | |
| "view_name": "odd_years_publications", | |
| "view_colum_name": "author_id" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "publishers", | |
| "table_column_name": "name", | |
| "view_schema": "test", | |
| "view_name": "odd_years_publications", | |
| "view_colum_name": "first_publisher" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "books", | |
| "table_column_name": "id", | |
| "view_schema": "test", | |
| "view_name": "odd_years_publications", | |
| "view_colum_name": "id" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "books", | |
| "table_column_name": "publication_year", | |
| "view_schema": "test", | |
| "view_name": "odd_years_publications", | |
| "view_colum_name": "publication_year" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "books", | |
| "table_column_name": "title", | |
| "view_schema": "test", | |
| "view_name": "odd_years_publications", | |
| "view_colum_name": "title" | |
| }, | |
| { | |
| "table_schema": "public", | |
| "table_name": "public_orders", | |
| "table_column_name": "consumer", | |
| "view_schema": "test", | |
| "view_name": "orders_view", | |
| "view_colum_name": "consumer" | |
| }, | |
| { | |
| "table_schema": "public", | |
| "table_name": "public_orders", | |
| "table_column_name": "id", | |
| "view_schema": "test", | |
| "view_name": "orders_view", | |
| "view_colum_name": "id" | |
| }, | |
| { | |
| "table_schema": "public", | |
| "table_name": "public_orders", | |
| "table_column_name": "number", | |
| "view_schema": "test", | |
| "view_name": "orders_view", | |
| "view_colum_name": "number" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "pages", | |
| "table_column_name": "link", | |
| "view_schema": "test", | |
| "view_name": "pages", | |
| "view_colum_name": "link" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "pages", | |
| "table_column_name": "url", | |
| "view_schema": "test", | |
| "view_name": "pages", | |
| "view_colum_name": "url" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "person", | |
| "table_column_name": "id", | |
| "view_schema": "test", | |
| "view_name": "person_detail", | |
| "view_colum_name": "id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "person", | |
| "table_column_name": "name", | |
| "view_schema": "test", | |
| "view_name": "person_detail", | |
| "view_colum_name": "name" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "player", | |
| "table_column_name": "birth_date", | |
| "view_schema": "test", | |
| "view_name": "player_view", | |
| "view_colum_name": "birth_date" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "player", | |
| "table_column_name": "first_name", | |
| "view_schema": "test", | |
| "view_name": "player_view", | |
| "view_colum_name": "first_name" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "player", | |
| "table_column_name": "id", | |
| "view_schema": "test", | |
| "view_name": "player_view", | |
| "view_colum_name": "id" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "player", | |
| "table_column_name": "last_name", | |
| "view_schema": "test", | |
| "view_name": "player_view", | |
| "view_colum_name": "last_name" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "projects", | |
| "table_column_name": "client_id", | |
| "view_schema": "test", | |
| "view_name": "projects_count_grouped_by", | |
| "view_colum_name": "client_id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "projects", | |
| "table_column_name": "client_id", | |
| "view_schema": "test", | |
| "view_name": "projects_view", | |
| "view_colum_name": "client_id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "projects", | |
| "table_column_name": "id", | |
| "view_schema": "test", | |
| "view_name": "projects_view", | |
| "view_colum_name": "id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "projects", | |
| "table_column_name": "name", | |
| "view_schema": "test", | |
| "view_name": "projects_view", | |
| "view_colum_name": "name" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "projects", | |
| "table_column_name": "name", | |
| "view_schema": "test", | |
| "view_name": "projects_view_alt", | |
| "view_colum_name": "name" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "projects", | |
| "table_column_name": "client_id", | |
| "view_schema": "test", | |
| "view_name": "projects_view_alt", | |
| "view_colum_name": "t_client_id" | |
| }, | |
| { | |
| "table_schema": "test", | |
| "table_name": "projects", | |
| "table_column_name": "id", | |
| "view_schema": "test", | |
| "view_name": "projects_view_alt", | |
| "view_colum_name": "t_id" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "referrals", | |
| "table_column_name": "link", | |
| "view_schema": "test", | |
| "view_name": "referrals", | |
| "view_colum_name": "link" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "referrals", | |
| "table_column_name": "site", | |
| "view_schema": "test", | |
| "view_name": "referrals", | |
| "view_colum_name": "site" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "books", | |
| "table_column_name": "author_id", | |
| "view_schema": "test", | |
| "view_name": "sixties_books", | |
| "view_colum_name": "author_id" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "books", | |
| "table_column_name": "id", | |
| "view_schema": "test", | |
| "view_name": "sixties_books", | |
| "view_colum_name": "id" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "books", | |
| "table_column_name": "publication_year", | |
| "view_schema": "test", | |
| "view_name": "sixties_books", | |
| "view_colum_name": "publication_year" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "books", | |
| "table_column_name": "title", | |
| "view_schema": "test", | |
| "view_name": "sixties_books", | |
| "view_colum_name": "title" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "stuff", | |
| "table_column_name": "id", | |
| "view_schema": "test", | |
| "view_name": "stuff", | |
| "view_colum_name": "id" | |
| }, | |
| { | |
| "table_schema": "private", | |
| "table_name": "stuff", | |
| "table_column_name": "name", | |
| "view_schema": "test", | |
| "view_name": "stuff", | |
| "view_colum_name": "name" | |
| } | |
| ], | |
| "pg_version": { | |
| "server_version_num": 110007, | |
| "server_version": "11.7" | |
| } | |
| } |
Sign up for free
to join this conversation on GitHub.
Already have an account?
Sign in to comment