PostgreSQL Source Code  git master
subselect.c
Go to the documentation of this file.
1 /*-------------------------------------------------------------------------
2  *
3  * subselect.c
4  * Planning routines for subselects.
5  *
6  * This module deals with SubLinks and CTEs, but not subquery RTEs (i.e.,
7  * not sub-SELECT-in-FROM cases).
8  *
9  * Portions Copyright (c) 1996-2023, PostgreSQL Global Development Group
10  * Portions Copyright (c) 1994, Regents of the University of California
11  *
12  * IDENTIFICATION
13  * src/backend/optimizer/plan/subselect.c
14  *
15  *-------------------------------------------------------------------------
16  */
17 #include "postgres.h"
18 
19 #include "access/htup_details.h"
20 #include "catalog/pg_operator.h"
21 #include "catalog/pg_type.h"
22 #include "executor/executor.h"
23 #include "miscadmin.h"
24 #include "nodes/makefuncs.h"
25 #include "nodes/nodeFuncs.h"
26 #include "optimizer/clauses.h"
27 #include "optimizer/cost.h"
28 #include "optimizer/optimizer.h"
29 #include "optimizer/paramassign.h"
30 #include "optimizer/pathnode.h"
31 #include "optimizer/planmain.h"
32 #include "optimizer/planner.h"
33 #include "optimizer/prep.h"
34 #include "optimizer/subselect.h"
35 #include "parser/parse_relation.h"
36 #include "rewrite/rewriteManip.h"
37 #include "utils/builtins.h"
38 #include "utils/lsyscache.h"
39 #include "utils/syscache.h"
40 
41 
43 {
45  List *subst_nodes; /* Nodes to substitute for Params */
47 
49 {
51  bool isTopQual;
53 
55 {
57  Bitmapset *paramids; /* Non-local PARAM_EXEC paramids found */
59 
61 {
62  const char *ctename; /* name and relative level of target CTE */
63  int levelsup;
64  Query *ctequery; /* query to substitute */
66 
67 
68 static Node *build_subplan(PlannerInfo *root, Plan *plan, PlannerInfo *subroot,
69  List *plan_params,
70  SubLinkType subLinkType, int subLinkId,
71  Node *testexpr, List *testexpr_paramids,
72  bool unknownEqFalse);
73 static List *generate_subquery_params(PlannerInfo *root, List *tlist,
74  List **paramIds);
75 static List *generate_subquery_vars(PlannerInfo *root, List *tlist,
76  Index varno);
77 static Node *convert_testexpr(PlannerInfo *root,
78  Node *testexpr,
79  List *subst_nodes);
80 static Node *convert_testexpr_mutator(Node *node,
81  convert_testexpr_context *context);
82 static bool subplan_is_hashable(Plan *plan);
83 static bool subpath_is_hashable(Path *path);
84 static bool testexpr_is_hashable(Node *testexpr, List *param_ids);
85 static bool test_opexpr_is_hashable(OpExpr *testexpr, List *param_ids);
86 static bool hash_ok_operator(OpExpr *expr);
87 static bool contain_dml(Node *node);
88 static bool contain_dml_walker(Node *node, void *context);
89 static bool contain_outer_selfref(Node *node);
90 static bool contain_outer_selfref_walker(Node *node, Index *depth);
91 static void inline_cte(PlannerInfo *root, CommonTableExpr *cte);
92 static bool inline_cte_walker(Node *node, inline_cte_walker_context *context);
93 static bool simplify_EXISTS_query(PlannerInfo *root, Query *query);
94 static Query *convert_EXISTS_to_ANY(PlannerInfo *root, Query *subselect,
95  Node **testexpr, List **paramIds);
97 static Node *process_sublinks_mutator(Node *node,
98  process_sublinks_context *context);
99 static Bitmapset *finalize_plan(PlannerInfo *root,
100  Plan *plan,
101  int gather_param,
102  Bitmapset *valid_params,
103  Bitmapset *scan_params);
104 static bool finalize_primnode(Node *node, finalize_primnode_context *context);
105 static bool finalize_agg_primnode(Node *node, finalize_primnode_context *context);
106 
107 
108 /*
109  * Get the datatype/typmod/collation of the first column of the plan's output.
110  *
111  * This information is stored for ARRAY_SUBLINK execution and for
112  * exprType()/exprTypmod()/exprCollation(), which have no way to get at the
113  * plan associated with a SubPlan node. We really only need the info for
114  * EXPR_SUBLINK and ARRAY_SUBLINK subplans, but for consistency we save it
115  * always.
116  */
117 static void
118 get_first_col_type(Plan *plan, Oid *coltype, int32 *coltypmod,
119  Oid *colcollation)
120 {
121  /* In cases such as EXISTS, tlist might be empty; arbitrarily use VOID */
122  if (plan->targetlist)
123  {
124  TargetEntry *tent = linitial_node(TargetEntry, plan->targetlist);
125 
126  if (!tent->resjunk)
127  {
128  *coltype = exprType((Node *) tent->expr);
129  *coltypmod = exprTypmod((Node *) tent->expr);
130  *colcollation = exprCollation((Node *) tent->expr);
131  return;
132  }
133  }
134  *coltype = VOIDOID;
135  *coltypmod = -1;
136  *colcollation = InvalidOid;
137 }
138 
139 /*
140  * Convert a SubLink (as created by the parser) into a SubPlan.
141  *
142  * We are given the SubLink's contained query, type, ID, and testexpr. We are
143  * also told if this expression appears at top level of a WHERE/HAVING qual.
144  *
145  * Note: we assume that the testexpr has been AND/OR flattened (actually,
146  * it's been through eval_const_expressions), but not converted to
147  * implicit-AND form; and any SubLinks in it should already have been
148  * converted to SubPlans. The subquery is as yet untouched, however.
149  *
150  * The result is whatever we need to substitute in place of the SubLink node
151  * in the executable expression. If we're going to do the subplan as a
152  * regular subplan, this will be the constructed SubPlan node. If we're going
153  * to do the subplan as an InitPlan, the SubPlan node instead goes into
154  * root->init_plans, and what we return here is an expression tree
155  * representing the InitPlan's result: usually just a Param node representing
156  * a single scalar result, but possibly a row comparison tree containing
157  * multiple Param nodes, or for a MULTIEXPR subquery a simple NULL constant
158  * (since the real output Params are elsewhere in the tree, and the MULTIEXPR
159  * subquery itself is in a resjunk tlist entry whose value is uninteresting).
160  */
161 static Node *
162 make_subplan(PlannerInfo *root, Query *orig_subquery,
163  SubLinkType subLinkType, int subLinkId,
164  Node *testexpr, bool isTopQual)
165 {
166  Query *subquery;
167  bool simple_exists = false;
168  double tuple_fraction;
169  PlannerInfo *subroot;
170  RelOptInfo *final_rel;
171  Path *best_path;
172  Plan *plan;
173  List *plan_params;
174  Node *result;
175 
176  /*
177  * Copy the source Query node. This is a quick and dirty kluge to resolve
178  * the fact that the parser can generate trees with multiple links to the
179  * same sub-Query node, but the planner wants to scribble on the Query.
180  * Try to clean this up when we do querytree redesign...
181  */
182  subquery = copyObject(orig_subquery);
183 
184  /*
185  * If it's an EXISTS subplan, we might be able to simplify it.
186  */
187  if (subLinkType == EXISTS_SUBLINK)
188  simple_exists = simplify_EXISTS_query(root, subquery);
189 
190  /*
191  * For an EXISTS subplan, tell lower-level planner to expect that only the
192  * first tuple will be retrieved. For ALL and ANY subplans, we will be
193  * able to stop evaluating if the test condition fails or matches, so very
194  * often not all the tuples will be retrieved; for lack of a better idea,
195  * specify 50% retrieval. For EXPR, MULTIEXPR, and ROWCOMPARE subplans,
196  * use default behavior (we're only expecting one row out, anyway).
197  *
198  * NOTE: if you change these numbers, also change cost_subplan() in
199  * path/costsize.c.
200  *
201  * XXX If an ANY subplan is uncorrelated, build_subplan may decide to hash
202  * its output. In that case it would've been better to specify full
203  * retrieval. At present, however, we can only check hashability after
204  * we've made the subplan :-(. (Determining whether it'll fit in hash_mem
205  * is the really hard part.) Therefore, we don't want to be too
206  * optimistic about the percentage of tuples retrieved, for fear of
207  * selecting a plan that's bad for the materialization case.
208  */
209  if (subLinkType == EXISTS_SUBLINK)
210  tuple_fraction = 1.0; /* just like a LIMIT 1 */
211  else if (subLinkType == ALL_SUBLINK ||
212  subLinkType == ANY_SUBLINK)
213  tuple_fraction = 0.5; /* 50% */
214  else
215  tuple_fraction = 0.0; /* default behavior */
216 
217  /* plan_params should not be in use in current query level */
218  Assert(root->plan_params == NIL);
219 
220  /* Generate Paths for the subquery */
221  subroot = subquery_planner(root->glob, subquery,
222  root,
223  false, tuple_fraction);
224 
225  /* Isolate the params needed by this specific subplan */
226  plan_params = root->plan_params;
227  root->plan_params = NIL;
228 
229  /*
230  * Select best Path and turn it into a Plan. At least for now, there
231  * seems no reason to postpone doing that.
232  */
233  final_rel = fetch_upper_rel(subroot, UPPERREL_FINAL, NULL);
234  best_path = get_cheapest_fractional_path(final_rel, tuple_fraction);
235 
236  plan = create_plan(subroot, best_path);
237 
238  /* And convert to SubPlan or InitPlan format. */
239  result = build_subplan(root, plan, subroot, plan_params,
240  subLinkType, subLinkId,
241  testexpr, NIL, isTopQual);
242 
243  /*
244  * If it's a correlated EXISTS with an unimportant targetlist, we might be
245  * able to transform it to the equivalent of an IN and then implement it
246  * by hashing. We don't have enough information yet to tell which way is
247  * likely to be better (it depends on the expected number of executions of
248  * the EXISTS qual, and we are much too early in planning the outer query
249  * to be able to guess that). So we generate both plans, if possible, and
250  * leave it to setrefs.c to decide which to use.
251  */
252  if (simple_exists && IsA(result, SubPlan))
253  {
254  Node *newtestexpr;
255  List *paramIds;
256 
257  /* Make a second copy of the original subquery */
258  subquery = copyObject(orig_subquery);
259  /* and re-simplify */
260  simple_exists = simplify_EXISTS_query(root, subquery);
261  Assert(simple_exists);
262  /* See if it can be converted to an ANY query */
263  subquery = convert_EXISTS_to_ANY(root, subquery,
264  &newtestexpr, &paramIds);
265  if (subquery)
266  {
267  /* Generate Paths for the ANY subquery; we'll need all rows */
268  subroot = subquery_planner(root->glob, subquery,
269  root,
270  false, 0.0);
271 
272  /* Isolate the params needed by this specific subplan */
273  plan_params = root->plan_params;
274  root->plan_params = NIL;
275 
276  /* Select best Path */
277  final_rel = fetch_upper_rel(subroot, UPPERREL_FINAL, NULL);
278  best_path = final_rel->cheapest_total_path;
279 
280  /* Now we can check if it'll fit in hash_mem */
281  if (subpath_is_hashable(best_path))
282  {
283  SubPlan *hashplan;
284  AlternativeSubPlan *asplan;
285 
286  /* OK, finish planning the ANY subquery */
287  plan = create_plan(subroot, best_path);
288 
289  /* ... and convert to SubPlan format */
290  hashplan = castNode(SubPlan,
291  build_subplan(root, plan, subroot,
292  plan_params,
293  ANY_SUBLINK, 0,
294  newtestexpr,
295  paramIds,
296  true));
297  /* Check we got what we expected */
298  Assert(hashplan->parParam == NIL);
299  Assert(hashplan->useHashTable);
300 
301  /* Leave it to setrefs.c to decide which plan to use */
302  asplan = makeNode(AlternativeSubPlan);
303  asplan->subplans = list_make2(result, hashplan);
304  result = (Node *) asplan;
305  root->hasAlternativeSubPlans = true;
306  }
307  }
308  }
309 
310  return result;
311 }
312 
313 /*
314  * Build a SubPlan node given the raw inputs --- subroutine for make_subplan
315  *
316  * Returns either the SubPlan, or a replacement expression if we decide to
317  * make it an InitPlan, as explained in the comments for make_subplan.
318  */
319 static Node *
321  List *plan_params,
322  SubLinkType subLinkType, int subLinkId,
323  Node *testexpr, List *testexpr_paramids,
324  bool unknownEqFalse)
325 {
326  Node *result;
327  SubPlan *splan;
328  bool isInitPlan;
329  ListCell *lc;
330 
331  /*
332  * Initialize the SubPlan node. Note plan_id, plan_name, and cost fields
333  * are set further down.
334  */
336  splan->subLinkType = subLinkType;
337  splan->testexpr = NULL;
338  splan->paramIds = NIL;
339  get_first_col_type(plan, &splan->firstColType, &splan->firstColTypmod,
340  &splan->firstColCollation);
341  splan->useHashTable = false;
342  splan->unknownEqFalse = unknownEqFalse;
343  splan->parallel_safe = plan->parallel_safe;
344  splan->setParam = NIL;
345  splan->parParam = NIL;
346  splan->args = NIL;
347 
348  /*
349  * Make parParam and args lists of param IDs and expressions that current
350  * query level will pass to this child plan.
351  */
352  foreach(lc, plan_params)
353  {
354  PlannerParamItem *pitem = (PlannerParamItem *) lfirst(lc);
355  Node *arg = pitem->item;
356 
357  /*
358  * The Var, PlaceHolderVar, Aggref or GroupingFunc has already been
359  * adjusted to have the correct varlevelsup, phlevelsup, or
360  * agglevelsup.
361  *
362  * If it's a PlaceHolderVar, Aggref or GroupingFunc, its arguments
363  * might contain SubLinks, which have not yet been processed (see the
364  * comments for SS_replace_correlation_vars). Do that now.
365  */
366  if (IsA(arg, PlaceHolderVar) ||
367  IsA(arg, Aggref) ||
368  IsA(arg, GroupingFunc))
369  arg = SS_process_sublinks(root, arg, false);
370 
371  splan->parParam = lappend_int(splan->parParam, pitem->paramId);
372  splan->args = lappend(splan->args, arg);
373  }
374 
375  /*
376  * Un-correlated or undirect correlated plans of EXISTS, EXPR, ARRAY,
377  * ROWCOMPARE, or MULTIEXPR types can be used as initPlans. For EXISTS,
378  * EXPR, or ARRAY, we return a Param referring to the result of evaluating
379  * the initPlan. For ROWCOMPARE, we must modify the testexpr tree to
380  * contain PARAM_EXEC Params instead of the PARAM_SUBLINK Params emitted
381  * by the parser, and then return that tree. For MULTIEXPR, we return a
382  * null constant: the resjunk targetlist item containing the SubLink does
383  * not need to return anything useful, since the referencing Params are
384  * elsewhere.
385  */
386  if (splan->parParam == NIL && subLinkType == EXISTS_SUBLINK)
387  {
388  Param *prm;
389 
390  Assert(testexpr == NULL);
391  prm = generate_new_exec_param(root, BOOLOID, -1, InvalidOid);
392  splan->setParam = list_make1_int(prm->paramid);
393  isInitPlan = true;
394  result = (Node *) prm;
395  }
396  else if (splan->parParam == NIL && subLinkType == EXPR_SUBLINK)
397  {
398  TargetEntry *te = linitial(plan->targetlist);
399  Param *prm;
400 
401  Assert(!te->resjunk);
402  Assert(testexpr == NULL);
403  prm = generate_new_exec_param(root,
404  exprType((Node *) te->expr),
405  exprTypmod((Node *) te->expr),
406  exprCollation((Node *) te->expr));
407  splan->setParam = list_make1_int(prm->paramid);
408  isInitPlan = true;
409  result = (Node *) prm;
410  }
411  else if (splan->parParam == NIL && subLinkType == ARRAY_SUBLINK)
412  {
413  TargetEntry *te = linitial(plan->targetlist);
414  Oid arraytype;
415  Param *prm;
416 
417  Assert(!te->resjunk);
418  Assert(testexpr == NULL);
419  arraytype = get_promoted_array_type(exprType((Node *) te->expr));
420  if (!OidIsValid(arraytype))
421  elog(ERROR, "could not find array type for datatype %s",
422  format_type_be(exprType((Node *) te->expr)));
423  prm = generate_new_exec_param(root,
424  arraytype,
425  exprTypmod((Node *) te->expr),
426  exprCollation((Node *) te->expr));
427  splan->setParam = list_make1_int(prm->paramid);
428  isInitPlan = true;
429  result = (Node *) prm;
430  }
431  else if (splan->parParam == NIL && subLinkType == ROWCOMPARE_SUBLINK)
432  {
433  /* Adjust the Params */
434  List *params;
435 
436  Assert(testexpr != NULL);
437  params = generate_subquery_params(root,
438  plan->targetlist,
439  &splan->paramIds);
440  result = convert_testexpr(root,
441  testexpr,
442  params);
443  splan->setParam = list_copy(splan->paramIds);
444  isInitPlan = true;
445 
446  /*
447  * The executable expression is returned to become part of the outer
448  * plan's expression tree; it is not kept in the initplan node.
449  */
450  }
451  else if (subLinkType == MULTIEXPR_SUBLINK)
452  {
453  /*
454  * Whether it's an initplan or not, it needs to set a PARAM_EXEC Param
455  * for each output column.
456  */
457  List *params;
458 
459  Assert(testexpr == NULL);
460  params = generate_subquery_params(root,
461  plan->targetlist,
462  &splan->setParam);
463 
464  /*
465  * Save the list of replacement Params in the n'th cell of
466  * root->multiexpr_params; setrefs.c will use it to replace
467  * PARAM_MULTIEXPR Params.
468  */
469  while (list_length(root->multiexpr_params) < subLinkId)
471  lc = list_nth_cell(root->multiexpr_params, subLinkId - 1);
472  Assert(lfirst(lc) == NIL);
473  lfirst(lc) = params;
474 
475  /* It can be an initplan if there are no parParams. */
476  if (splan->parParam == NIL)
477  {
478  isInitPlan = true;
479  result = (Node *) makeNullConst(RECORDOID, -1, InvalidOid);
480  }
481  else
482  {
483  isInitPlan = false;
484  result = (Node *) splan;
485  }
486  }
487  else
488  {
489  /*
490  * Adjust the Params in the testexpr, unless caller already took care
491  * of it (as indicated by passing a list of Param IDs).
492  */
493  if (testexpr && testexpr_paramids == NIL)
494  {
495  List *params;
496 
497  params = generate_subquery_params(root,
498  plan->targetlist,
499  &splan->paramIds);
500  splan->testexpr = convert_testexpr(root,
501  testexpr,
502  params);
503  }
504  else
505  {
506  splan->testexpr = testexpr;
507  splan->paramIds = testexpr_paramids;
508  }
509 
510  /*
511  * We can't convert subplans of ALL_SUBLINK or ANY_SUBLINK types to
512  * initPlans, even when they are uncorrelated or undirect correlated,
513  * because we need to scan the output of the subplan for each outer
514  * tuple. But if it's a not-direct-correlated IN (= ANY) test, we
515  * might be able to use a hashtable to avoid comparing all the tuples.
516  */
517  if (subLinkType == ANY_SUBLINK &&
518  splan->parParam == NIL &&
520  testexpr_is_hashable(splan->testexpr, splan->paramIds))
521  splan->useHashTable = true;
522 
523  /*
524  * Otherwise, we have the option to tack a Material node onto the top
525  * of the subplan, to reduce the cost of reading it repeatedly. This
526  * is pointless for a direct-correlated subplan, since we'd have to
527  * recompute its results each time anyway. For uncorrelated/undirect
528  * correlated subplans, we add Material unless the subplan's top plan
529  * node would materialize its output anyway. Also, if enable_material
530  * is false, then the user does not want us to materialize anything
531  * unnecessarily, so we don't.
532  */
533  else if (splan->parParam == NIL && enable_material &&
536 
537  result = (Node *) splan;
538  isInitPlan = false;
539  }
540 
541  /*
542  * Add the subplan and its PlannerInfo to the global lists.
543  */
544  root->glob->subplans = lappend(root->glob->subplans, plan);
545  root->glob->subroots = lappend(root->glob->subroots, subroot);
546  splan->plan_id = list_length(root->glob->subplans);
547 
548  if (isInitPlan)
549  root->init_plans = lappend(root->init_plans, splan);
550 
551  /*
552  * A parameterless subplan (not initplan) should be prepared to handle
553  * REWIND efficiently. If it has direct parameters then there's no point
554  * since it'll be reset on each scan anyway; and if it's an initplan then
555  * there's no point since it won't get re-run without parameter changes
556  * anyway. The input of a hashed subplan doesn't need REWIND either.
557  */
558  if (splan->parParam == NIL && !isInitPlan && !splan->useHashTable)
560  splan->plan_id);
561 
562  /* Label the subplan for EXPLAIN purposes */
563  splan->plan_name = palloc(32 + 12 * list_length(splan->setParam));
564  sprintf(splan->plan_name, "%s %d",
565  isInitPlan ? "InitPlan" : "SubPlan",
566  splan->plan_id);
567  if (splan->setParam)
568  {
569  char *ptr = splan->plan_name + strlen(splan->plan_name);
570 
571  ptr += sprintf(ptr, " (returns ");
572  foreach(lc, splan->setParam)
573  {
574  ptr += sprintf(ptr, "$%d%s",
575  lfirst_int(lc),
576  lnext(splan->setParam, lc) ? "," : ")");
577  }
578  }
579 
580  /* Lastly, fill in the cost estimates for use later */
581  cost_subplan(root, splan, plan);
582 
583  return result;
584 }
585 
586 /*
587  * generate_subquery_params: build a list of Params representing the output
588  * columns of a sublink's sub-select, given the sub-select's targetlist.
589  *
590  * We also return an integer list of the paramids of the Params.
591  */
592 static List *
593 generate_subquery_params(PlannerInfo *root, List *tlist, List **paramIds)
594 {
595  List *result;
596  List *ids;
597  ListCell *lc;
598 
599  result = ids = NIL;
600  foreach(lc, tlist)
601  {
602  TargetEntry *tent = (TargetEntry *) lfirst(lc);
603  Param *param;
604 
605  if (tent->resjunk)
606  continue;
607 
608  param = generate_new_exec_param(root,
609  exprType((Node *) tent->expr),
610  exprTypmod((Node *) tent->expr),
611  exprCollation((Node *) tent->expr));
612  result = lappend(result, param);
613  ids = lappend_int(ids, param->paramid);
614  }
615 
616  *paramIds = ids;
617  return result;
618 }
619 
620 /*
621  * generate_subquery_vars: build a list of Vars representing the output
622  * columns of a sublink's sub-select, given the sub-select's targetlist.
623  * The Vars have the specified varno (RTE index).
624  */
625 static List *
627 {
628  List *result;
629  ListCell *lc;
630 
631  result = NIL;
632  foreach(lc, tlist)
633  {
634  TargetEntry *tent = (TargetEntry *) lfirst(lc);
635  Var *var;
636 
637  if (tent->resjunk)
638  continue;
639 
640  var = makeVarFromTargetEntry(varno, tent);
641  result = lappend(result, var);
642  }
643 
644  return result;
645 }
646 
647 /*
648  * convert_testexpr: convert the testexpr given by the parser into
649  * actually executable form. This entails replacing PARAM_SUBLINK Params
650  * with Params or Vars representing the results of the sub-select. The
651  * nodes to be substituted are passed in as the List result from
652  * generate_subquery_params or generate_subquery_vars.
653  */
654 static Node *
656  Node *testexpr,
657  List *subst_nodes)
658 {
659  convert_testexpr_context context;
660 
661  context.root = root;
662  context.subst_nodes = subst_nodes;
663  return convert_testexpr_mutator(testexpr, &context);
664 }
665 
666 static Node *
668  convert_testexpr_context *context)
669 {
670  if (node == NULL)
671  return NULL;
672  if (IsA(node, Param))
673  {
674  Param *param = (Param *) node;
675 
676  if (param->paramkind == PARAM_SUBLINK)
677  {
678  if (param->paramid <= 0 ||
679  param->paramid > list_length(context->subst_nodes))
680  elog(ERROR, "unexpected PARAM_SUBLINK ID: %d", param->paramid);
681 
682  /*
683  * We copy the list item to avoid having doubly-linked
684  * substructure in the modified parse tree. This is probably
685  * unnecessary when it's a Param, but be safe.
686  */
687  return (Node *) copyObject(list_nth(context->subst_nodes,
688  param->paramid - 1));
689  }
690  }
691  if (IsA(node, SubLink))
692  {
693  /*
694  * If we come across a nested SubLink, it is neither necessary nor
695  * correct to recurse into it: any PARAM_SUBLINKs we might find inside
696  * belong to the inner SubLink not the outer. So just return it as-is.
697  *
698  * This reasoning depends on the assumption that nothing will pull
699  * subexpressions into or out of the testexpr field of a SubLink, at
700  * least not without replacing PARAM_SUBLINKs first. If we did want
701  * to do that we'd need to rethink the parser-output representation
702  * altogether, since currently PARAM_SUBLINKs are only unique per
703  * SubLink not globally across the query. The whole point of
704  * replacing them with Vars or PARAM_EXEC nodes is to make them
705  * globally unique before they escape from the SubLink's testexpr.
706  *
707  * Note: this can't happen when called during SS_process_sublinks,
708  * because that recursively processes inner SubLinks first. It can
709  * happen when called from convert_ANY_sublink_to_join, though.
710  */
711  return node;
712  }
713  return expression_tree_mutator(node,
715  (void *) context);
716 }
717 
718 /*
719  * subplan_is_hashable: can we implement an ANY subplan by hashing?
720  *
721  * This is not responsible for checking whether the combining testexpr
722  * is suitable for hashing. We only look at the subquery itself.
723  */
724 static bool
726 {
727  double subquery_size;
728 
729  /*
730  * The estimated size of the subquery result must fit in hash_mem. (Note:
731  * we use heap tuple overhead here even though the tuples will actually be
732  * stored as MinimalTuples; this provides some fudge factor for hashtable
733  * overhead.)
734  */
735  subquery_size = plan->plan_rows *
736  (MAXALIGN(plan->plan_width) + MAXALIGN(SizeofHeapTupleHeader));
737  if (subquery_size > get_hash_memory_limit())
738  return false;
739 
740  return true;
741 }
742 
743 /*
744  * subpath_is_hashable: can we implement an ANY subplan by hashing?
745  *
746  * Identical to subplan_is_hashable, but work from a Path for the subplan.
747  */
748 static bool
750 {
751  double subquery_size;
752 
753  /*
754  * The estimated size of the subquery result must fit in hash_mem. (Note:
755  * we use heap tuple overhead here even though the tuples will actually be
756  * stored as MinimalTuples; this provides some fudge factor for hashtable
757  * overhead.)
758  */
759  subquery_size = path->rows *
760  (MAXALIGN(path->pathtarget->width) + MAXALIGN(SizeofHeapTupleHeader));
761  if (subquery_size > get_hash_memory_limit())
762  return false;
763 
764  return true;
765 }
766 
767 /*
768  * testexpr_is_hashable: is an ANY SubLink's test expression hashable?
769  *
770  * To identify LHS vs RHS of the hash expression, we must be given the
771  * list of output Param IDs of the SubLink's subquery.
772  */
773 static bool
774 testexpr_is_hashable(Node *testexpr, List *param_ids)
775 {
776  /*
777  * The testexpr must be a single OpExpr, or an AND-clause containing only
778  * OpExprs, each of which satisfy test_opexpr_is_hashable().
779  */
780  if (testexpr && IsA(testexpr, OpExpr))
781  {
782  if (test_opexpr_is_hashable((OpExpr *) testexpr, param_ids))
783  return true;
784  }
785  else if (is_andclause(testexpr))
786  {
787  ListCell *l;
788 
789  foreach(l, ((BoolExpr *) testexpr)->args)
790  {
791  Node *andarg = (Node *) lfirst(l);
792 
793  if (!IsA(andarg, OpExpr))
794  return false;
795  if (!test_opexpr_is_hashable((OpExpr *) andarg, param_ids))
796  return false;
797  }
798  return true;
799  }
800 
801  return false;
802 }
803 
804 static bool
805 test_opexpr_is_hashable(OpExpr *testexpr, List *param_ids)
806 {
807  /*
808  * The combining operator must be hashable and strict. The need for
809  * hashability is obvious, since we want to use hashing. Without
810  * strictness, behavior in the presence of nulls is too unpredictable. We
811  * actually must assume even more than plain strictness: it can't yield
812  * NULL for non-null inputs, either (see nodeSubplan.c). However, hash
813  * indexes and hash joins assume that too.
814  */
815  if (!hash_ok_operator(testexpr))
816  return false;
817 
818  /*
819  * The left and right inputs must belong to the outer and inner queries
820  * respectively; hence Params that will be supplied by the subquery must
821  * not appear in the LHS, and Vars of the outer query must not appear in
822  * the RHS. (Ordinarily, this must be true because of the way that the
823  * parser builds an ANY SubLink's testexpr ... but inlining of functions
824  * could have changed the expression's structure, so we have to check.
825  * Such cases do not occur often enough to be worth trying to optimize, so
826  * we don't worry about trying to commute the clause or anything like
827  * that; we just need to be sure not to build an invalid plan.)
828  */
829  if (list_length(testexpr->args) != 2)
830  return false;
831  if (contain_exec_param((Node *) linitial(testexpr->args), param_ids))
832  return false;
833  if (contain_var_clause((Node *) lsecond(testexpr->args)))
834  return false;
835  return true;
836 }
837 
838 /*
839  * Check expression is hashable + strict
840  *
841  * We could use op_hashjoinable() and op_strict(), but do it like this to
842  * avoid a redundant cache lookup.
843  */
844 static bool
846 {
847  Oid opid = expr->opno;
848 
849  /* quick out if not a binary operator */
850  if (list_length(expr->args) != 2)
851  return false;
852  if (opid == ARRAY_EQ_OP ||
853  opid == RECORD_EQ_OP)
854  {
855  /* these are strict, but must check input type to ensure hashable */
856  Node *leftarg = linitial(expr->args);
857 
858  return op_hashjoinable(opid, exprType(leftarg));
859  }
860  else
861  {
862  /* else must look up the operator properties */
863  HeapTuple tup;
864  Form_pg_operator optup;
865 
867  if (!HeapTupleIsValid(tup))
868  elog(ERROR, "cache lookup failed for operator %u", opid);
869  optup = (Form_pg_operator) GETSTRUCT(tup);
870  if (!optup->oprcanhash || !func_strict(optup->oprcode))
871  {
872  ReleaseSysCache(tup);
873  return false;
874  }
875  ReleaseSysCache(tup);
876  return true;
877  }
878 }
879 
880 
881 /*
882  * SS_process_ctes: process a query's WITH list
883  *
884  * Consider each CTE in the WITH list and either ignore it (if it's an
885  * unreferenced SELECT), "inline" it to create a regular sub-SELECT-in-FROM,
886  * or convert it to an initplan.
887  *
888  * A side effect is to fill in root->cte_plan_ids with a list that
889  * parallels root->parse->cteList and provides the subplan ID for
890  * each CTE's initplan, or a dummy ID (-1) if we didn't make an initplan.
891  */
892 void
894 {
895  ListCell *lc;
896 
897  Assert(root->cte_plan_ids == NIL);
898 
899  foreach(lc, root->parse->cteList)
900  {
901  CommonTableExpr *cte = (CommonTableExpr *) lfirst(lc);
902  CmdType cmdType = ((Query *) cte->ctequery)->commandType;
903  Query *subquery;
904  PlannerInfo *subroot;
905  RelOptInfo *final_rel;
906  Path *best_path;
907  Plan *plan;
908  SubPlan *splan;
909  int paramid;
910 
911  /*
912  * Ignore SELECT CTEs that are not actually referenced anywhere.
913  */
914  if (cte->cterefcount == 0 && cmdType == CMD_SELECT)
915  {
916  /* Make a dummy entry in cte_plan_ids */
917  root->cte_plan_ids = lappend_int(root->cte_plan_ids, -1);
918  continue;
919  }
920 
921  /*
922  * Consider inlining the CTE (creating RTE_SUBQUERY RTE(s)) instead of
923  * implementing it as a separately-planned CTE.
924  *
925  * We cannot inline if any of these conditions hold:
926  *
927  * 1. The user said not to (the CTEMaterializeAlways option).
928  *
929  * 2. The CTE is recursive.
930  *
931  * 3. The CTE has side-effects; this includes either not being a plain
932  * SELECT, or containing volatile functions. Inlining might change
933  * the side-effects, which would be bad.
934  *
935  * 4. The CTE is multiply-referenced and contains a self-reference to
936  * a recursive CTE outside itself. Inlining would result in multiple
937  * recursive self-references, which we don't support.
938  *
939  * Otherwise, we have an option whether to inline or not. That should
940  * always be a win if there's just a single reference, but if the CTE
941  * is multiply-referenced then it's unclear: inlining adds duplicate
942  * computations, but the ability to absorb restrictions from the outer
943  * query level could outweigh that. We do not have nearly enough
944  * information at this point to tell whether that's true, so we let
945  * the user express a preference. Our default behavior is to inline
946  * only singly-referenced CTEs, but a CTE marked CTEMaterializeNever
947  * will be inlined even if multiply referenced.
948  *
949  * Note: we check for volatile functions last, because that's more
950  * expensive than the other tests needed.
951  */
952  if ((cte->ctematerialized == CTEMaterializeNever ||
954  cte->cterefcount == 1)) &&
955  !cte->cterecursive &&
956  cmdType == CMD_SELECT &&
957  !contain_dml(cte->ctequery) &&
958  (cte->cterefcount <= 1 ||
961  {
962  inline_cte(root, cte);
963  /* Make a dummy entry in cte_plan_ids */
964  root->cte_plan_ids = lappend_int(root->cte_plan_ids, -1);
965  continue;
966  }
967 
968  /*
969  * Copy the source Query node. Probably not necessary, but let's keep
970  * this similar to make_subplan.
971  */
972  subquery = (Query *) copyObject(cte->ctequery);
973 
974  /* plan_params should not be in use in current query level */
975  Assert(root->plan_params == NIL);
976 
977  /*
978  * Generate Paths for the CTE query. Always plan for full retrieval
979  * --- we don't have enough info to predict otherwise.
980  */
981  subroot = subquery_planner(root->glob, subquery,
982  root,
983  cte->cterecursive, 0.0);
984 
985  /*
986  * Since the current query level doesn't yet contain any RTEs, it
987  * should not be possible for the CTE to have requested parameters of
988  * this level.
989  */
990  if (root->plan_params)
991  elog(ERROR, "unexpected outer reference in CTE query");
992 
993  /*
994  * Select best Path and turn it into a Plan. At least for now, there
995  * seems no reason to postpone doing that.
996  */
997  final_rel = fetch_upper_rel(subroot, UPPERREL_FINAL, NULL);
998  best_path = final_rel->cheapest_total_path;
999 
1000  plan = create_plan(subroot, best_path);
1001 
1002  /*
1003  * Make a SubPlan node for it. This is just enough unlike
1004  * build_subplan that we can't share code.
1005  *
1006  * Note plan_id, plan_name, and cost fields are set further down.
1007  */
1008  splan = makeNode(SubPlan);
1009  splan->subLinkType = CTE_SUBLINK;
1010  splan->testexpr = NULL;
1011  splan->paramIds = NIL;
1012  get_first_col_type(plan, &splan->firstColType, &splan->firstColTypmod,
1013  &splan->firstColCollation);
1014  splan->useHashTable = false;
1015  splan->unknownEqFalse = false;
1016 
1017  /*
1018  * CTE scans are not considered for parallelism (cf
1019  * set_rel_consider_parallel), and even if they were, initPlans aren't
1020  * parallel-safe.
1021  */
1022  splan->parallel_safe = false;
1023  splan->setParam = NIL;
1024  splan->parParam = NIL;
1025  splan->args = NIL;
1026 
1027  /*
1028  * The node can't have any inputs (since it's an initplan), so the
1029  * parParam and args lists remain empty. (It could contain references
1030  * to earlier CTEs' output param IDs, but CTE outputs are not
1031  * propagated via the args list.)
1032  */
1033 
1034  /*
1035  * Assign a param ID to represent the CTE's output. No ordinary
1036  * "evaluation" of this param slot ever happens, but we use the param
1037  * ID for setParam/chgParam signaling just as if the CTE plan were
1038  * returning a simple scalar output. (Also, the executor abuses the
1039  * ParamExecData slot for this param ID for communication among
1040  * multiple CteScan nodes that might be scanning this CTE.)
1041  */
1042  paramid = assign_special_exec_param(root);
1043  splan->setParam = list_make1_int(paramid);
1044 
1045  /*
1046  * Add the subplan and its PlannerInfo to the global lists.
1047  */
1048  root->glob->subplans = lappend(root->glob->subplans, plan);
1049  root->glob->subroots = lappend(root->glob->subroots, subroot);
1050  splan->plan_id = list_length(root->glob->subplans);
1051 
1052  root->init_plans = lappend(root->init_plans, splan);
1053 
1054  root->cte_plan_ids = lappend_int(root->cte_plan_ids, splan->plan_id);
1055 
1056  /* Label the subplan for EXPLAIN purposes */
1057  splan->plan_name = psprintf("CTE %s", cte->ctename);
1058 
1059  /* Lastly, fill in the cost estimates for use later */
1060  cost_subplan(root, splan, plan);
1061  }
1062 }
1063 
1064 /*
1065  * contain_dml: is any subquery not a plain SELECT?
1066  *
1067  * We reject SELECT FOR UPDATE/SHARE as well as INSERT etc.
1068  */
1069 static bool
1071 {
1072  return contain_dml_walker(node, NULL);
1073 }
1074 
1075 static bool
1076 contain_dml_walker(Node *node, void *context)
1077 {
1078  if (node == NULL)
1079  return false;
1080  if (IsA(node, Query))
1081  {
1082  Query *query = (Query *) node;
1083 
1084  if (query->commandType != CMD_SELECT ||
1085  query->rowMarks != NIL)
1086  return true;
1087 
1088  return query_tree_walker(query, contain_dml_walker, context, 0);
1089  }
1090  return expression_tree_walker(node, contain_dml_walker, context);
1091 }
1092 
1093 /*
1094  * contain_outer_selfref: is there an external recursive self-reference?
1095  */
1096 static bool
1098 {
1099  Index depth = 0;
1100 
1101  /*
1102  * We should be starting with a Query, so that depth will be 1 while
1103  * examining its immediate contents.
1104  */
1105  Assert(IsA(node, Query));
1106 
1107  return contain_outer_selfref_walker(node, &depth);
1108 }
1109 
1110 static bool
1112 {
1113  if (node == NULL)
1114  return false;
1115  if (IsA(node, RangeTblEntry))
1116  {
1117  RangeTblEntry *rte = (RangeTblEntry *) node;
1118 
1119  /*
1120  * Check for a self-reference to a CTE that's above the Query that our
1121  * search started at.
1122  */
1123  if (rte->rtekind == RTE_CTE &&
1124  rte->self_reference &&
1125  rte->ctelevelsup >= *depth)
1126  return true;
1127  return false; /* allow range_table_walker to continue */
1128  }
1129  if (IsA(node, Query))
1130  {
1131  /* Recurse into subquery, tracking nesting depth properly */
1132  Query *query = (Query *) node;
1133  bool result;
1134 
1135  (*depth)++;
1136 
1138  (void *) depth, QTW_EXAMINE_RTES_BEFORE);
1139 
1140  (*depth)--;
1141 
1142  return result;
1143  }
1145  (void *) depth);
1146 }
1147 
1148 /*
1149  * inline_cte: convert RTE_CTE references to given CTE into RTE_SUBQUERYs
1150  */
1151 static void
1153 {
1154  struct inline_cte_walker_context context;
1155 
1156  context.ctename = cte->ctename;
1157  /* Start at levelsup = -1 because we'll immediately increment it */
1158  context.levelsup = -1;
1159  context.ctequery = castNode(Query, cte->ctequery);
1160 
1161  (void) inline_cte_walker((Node *) root->parse, &context);
1162 }
1163 
1164 static bool
1166 {
1167  if (node == NULL)
1168  return false;
1169  if (IsA(node, Query))
1170  {
1171  Query *query = (Query *) node;
1172 
1173  context->levelsup++;
1174 
1175  /*
1176  * Visit the query's RTE nodes after their contents; otherwise
1177  * query_tree_walker would descend into the newly inlined CTE query,
1178  * which we don't want.
1179  */
1180  (void) query_tree_walker(query, inline_cte_walker, context,
1182 
1183  context->levelsup--;
1184 
1185  return false;
1186  }
1187  else if (IsA(node, RangeTblEntry))
1188  {
1189  RangeTblEntry *rte = (RangeTblEntry *) node;
1190 
1191  if (rte->rtekind == RTE_CTE &&
1192  strcmp(rte->ctename, context->ctename) == 0 &&
1193  rte->ctelevelsup == context->levelsup)
1194  {
1195  /*
1196  * Found a reference to replace. Generate a copy of the CTE query
1197  * with appropriate level adjustment for outer references (e.g.,
1198  * to other CTEs).
1199  */
1200  Query *newquery = copyObject(context->ctequery);
1201 
1202  if (context->levelsup > 0)
1203  IncrementVarSublevelsUp((Node *) newquery, context->levelsup, 1);
1204 
1205  /*
1206  * Convert the RTE_CTE RTE into a RTE_SUBQUERY.
1207  *
1208  * Historically, a FOR UPDATE clause has been treated as extending
1209  * into views and subqueries, but not into CTEs. We preserve this
1210  * distinction by not trying to push rowmarks into the new
1211  * subquery.
1212  */
1213  rte->rtekind = RTE_SUBQUERY;
1214  rte->subquery = newquery;
1215  rte->security_barrier = false;
1216 
1217  /* Zero out CTE-specific fields */
1218  rte->ctename = NULL;
1219  rte->ctelevelsup = 0;
1220  rte->self_reference = false;
1221  rte->coltypes = NIL;
1222  rte->coltypmods = NIL;
1223  rte->colcollations = NIL;
1224  }
1225 
1226  return false;
1227  }
1228 
1229  return expression_tree_walker(node, inline_cte_walker, context);
1230 }
1231 
1232 
1233 /*
1234  * convert_ANY_sublink_to_join: try to convert an ANY SubLink to a join
1235  *
1236  * The caller has found an ANY SubLink at the top level of one of the query's
1237  * qual clauses, but has not checked the properties of the SubLink further.
1238  * Decide whether it is appropriate to process this SubLink in join style.
1239  * If so, form a JoinExpr and return it. Return NULL if the SubLink cannot
1240  * be converted to a join.
1241  *
1242  * The only non-obvious input parameter is available_rels: this is the set
1243  * of query rels that can safely be referenced in the sublink expression.
1244  * (We must restrict this to avoid changing the semantics when a sublink
1245  * is present in an outer join's ON qual.) The conversion must fail if
1246  * the converted qual would reference any but these parent-query relids.
1247  *
1248  * On success, the returned JoinExpr has larg = NULL and rarg = the jointree
1249  * item representing the pulled-up subquery. The caller must set larg to
1250  * represent the relation(s) on the lefthand side of the new join, and insert
1251  * the JoinExpr into the upper query's jointree at an appropriate place
1252  * (typically, where the lefthand relation(s) had been). Note that the
1253  * passed-in SubLink must also be removed from its original position in the
1254  * query quals, since the quals of the returned JoinExpr replace it.
1255  * (Notionally, we replace the SubLink with a constant TRUE, then elide the
1256  * redundant constant from the qual.)
1257  *
1258  * On success, the caller is also responsible for recursively applying
1259  * pull_up_sublinks processing to the rarg and quals of the returned JoinExpr.
1260  * (On failure, there is no need to do anything, since pull_up_sublinks will
1261  * be applied when we recursively plan the sub-select.)
1262  *
1263  * Side effects of a successful conversion include adding the SubLink's
1264  * subselect to the query's rangetable, so that it can be referenced in
1265  * the JoinExpr's rarg.
1266  */
1267 JoinExpr *
1269  Relids available_rels)
1270 {
1271  JoinExpr *result;
1272  Query *parse = root->parse;
1273  Query *subselect = (Query *) sublink->subselect;
1274  Relids upper_varnos;
1275  int rtindex;
1276  ParseNamespaceItem *nsitem;
1277  RangeTblEntry *rte;
1278  RangeTblRef *rtr;
1279  List *subquery_vars;
1280  Node *quals;
1281  ParseState *pstate;
1282 
1283  Assert(sublink->subLinkType == ANY_SUBLINK);
1284 
1285  /*
1286  * The sub-select must not refer to any Vars of the parent query. (Vars of
1287  * higher levels should be okay, though.)
1288  */
1289  if (contain_vars_of_level((Node *) subselect, 1))
1290  return NULL;
1291 
1292  /*
1293  * The test expression must contain some Vars of the parent query, else
1294  * it's not gonna be a join. (Note that it won't have Vars referring to
1295  * the subquery, rather Params.)
1296  */
1297  upper_varnos = pull_varnos(root, sublink->testexpr);
1298  if (bms_is_empty(upper_varnos))
1299  return NULL;
1300 
1301  /*
1302  * However, it can't refer to anything outside available_rels.
1303  */
1304  if (!bms_is_subset(upper_varnos, available_rels))
1305  return NULL;
1306 
1307  /*
1308  * The combining operators and left-hand expressions mustn't be volatile.
1309  */
1310  if (contain_volatile_functions(sublink->testexpr))
1311  return NULL;
1312 
1313  /* Create a dummy ParseState for addRangeTableEntryForSubquery */
1314  pstate = make_parsestate(NULL);
1315 
1316  /*
1317  * Okay, pull up the sub-select into upper range table.
1318  *
1319  * We rely here on the assumption that the outer query has no references
1320  * to the inner (necessarily true, other than the Vars that we build
1321  * below). Therefore this is a lot easier than what pull_up_subqueries has
1322  * to go through.
1323  */
1324  nsitem = addRangeTableEntryForSubquery(pstate,
1325  subselect,
1326  makeAlias("ANY_subquery", NIL),
1327  false,
1328  false);
1329  rte = nsitem->p_rte;
1330  parse->rtable = lappend(parse->rtable, rte);
1331  rtindex = list_length(parse->rtable);
1332 
1333  /*
1334  * Form a RangeTblRef for the pulled-up sub-select.
1335  */
1336  rtr = makeNode(RangeTblRef);
1337  rtr->rtindex = rtindex;
1338 
1339  /*
1340  * Build a list of Vars representing the subselect outputs.
1341  */
1342  subquery_vars = generate_subquery_vars(root,
1343  subselect->targetList,
1344  rtindex);
1345 
1346  /*
1347  * Build the new join's qual expression, replacing Params with these Vars.
1348  */
1349  quals = convert_testexpr(root, sublink->testexpr, subquery_vars);
1350 
1351  /*
1352  * And finally, build the JoinExpr node.
1353  */
1354  result = makeNode(JoinExpr);
1355  result->jointype = JOIN_SEMI;
1356  result->isNatural = false;
1357  result->larg = NULL; /* caller must fill this in */
1358  result->rarg = (Node *) rtr;
1359  result->usingClause = NIL;
1360  result->join_using_alias = NULL;
1361  result->quals = quals;
1362  result->alias = NULL;
1363  result->rtindex = 0; /* we don't need an RTE for it */
1364 
1365  return result;
1366 }
1367 
1368 /*
1369  * convert_EXISTS_sublink_to_join: try to convert an EXISTS SubLink to a join
1370  *
1371  * The API of this function is identical to convert_ANY_sublink_to_join's,
1372  * except that we also support the case where the caller has found NOT EXISTS,
1373  * so we need an additional input parameter "under_not".
1374  */
1375 JoinExpr *
1377  bool under_not, Relids available_rels)
1378 {
1379  JoinExpr *result;
1380  Query *parse = root->parse;
1381  Query *subselect = (Query *) sublink->subselect;
1382  Node *whereClause;
1383  int rtoffset;
1384  int varno;
1385  Relids clause_varnos;
1386  Relids upper_varnos;
1387 
1388  Assert(sublink->subLinkType == EXISTS_SUBLINK);
1389 
1390  /*
1391  * Can't flatten if it contains WITH. (We could arrange to pull up the
1392  * WITH into the parent query's cteList, but that risks changing the
1393  * semantics, since a WITH ought to be executed once per associated query
1394  * call.) Note that convert_ANY_sublink_to_join doesn't have to reject
1395  * this case, since it just produces a subquery RTE that doesn't have to
1396  * get flattened into the parent query.
1397  */
1398  if (subselect->cteList)
1399  return NULL;
1400 
1401  /*
1402  * Copy the subquery so we can modify it safely (see comments in
1403  * make_subplan).
1404  */
1405  subselect = copyObject(subselect);
1406 
1407  /*
1408  * See if the subquery can be simplified based on the knowledge that it's
1409  * being used in EXISTS(). If we aren't able to get rid of its
1410  * targetlist, we have to fail, because the pullup operation leaves us
1411  * with noplace to evaluate the targetlist.
1412  */
1413  if (!simplify_EXISTS_query(root, subselect))
1414  return NULL;
1415 
1416  /*
1417  * Separate out the WHERE clause. (We could theoretically also remove
1418  * top-level plain JOIN/ON clauses, but it's probably not worth the
1419  * trouble.)
1420  */
1421  whereClause = subselect->jointree->quals;
1422  subselect->jointree->quals = NULL;
1423 
1424  /*
1425  * The rest of the sub-select must not refer to any Vars of the parent
1426  * query. (Vars of higher levels should be okay, though.)
1427  */
1428  if (contain_vars_of_level((Node *) subselect, 1))
1429  return NULL;
1430 
1431  /*
1432  * On the other hand, the WHERE clause must contain some Vars of the
1433  * parent query, else it's not gonna be a join.
1434  */
1435  if (!contain_vars_of_level(whereClause, 1))
1436  return NULL;
1437 
1438  /*
1439  * We don't risk optimizing if the WHERE clause is volatile, either.
1440  */
1441  if (contain_volatile_functions(whereClause))
1442  return NULL;
1443 
1444  /*
1445  * The subquery must have a nonempty jointree, but we can make it so.
1446  */
1447  replace_empty_jointree(subselect);
1448 
1449  /*
1450  * Prepare to pull up the sub-select into top range table.
1451  *
1452  * We rely here on the assumption that the outer query has no references
1453  * to the inner (necessarily true). Therefore this is a lot easier than
1454  * what pull_up_subqueries has to go through.
1455  *
1456  * In fact, it's even easier than what convert_ANY_sublink_to_join has to
1457  * do. The machinations of simplify_EXISTS_query ensured that there is
1458  * nothing interesting in the subquery except an rtable and jointree, and
1459  * even the jointree FromExpr no longer has quals. So we can just append
1460  * the rtable to our own and use the FromExpr in our jointree. But first,
1461  * adjust all level-zero varnos in the subquery to account for the rtable
1462  * merger.
1463  */
1464  rtoffset = list_length(parse->rtable);
1465  OffsetVarNodes((Node *) subselect, rtoffset, 0);
1466  OffsetVarNodes(whereClause, rtoffset, 0);
1467 
1468  /*
1469  * Upper-level vars in subquery will now be one level closer to their
1470  * parent than before; in particular, anything that had been level 1
1471  * becomes level zero.
1472  */
1473  IncrementVarSublevelsUp((Node *) subselect, -1, 1);
1474  IncrementVarSublevelsUp(whereClause, -1, 1);
1475 
1476  /*
1477  * Now that the WHERE clause is adjusted to match the parent query
1478  * environment, we can easily identify all the level-zero rels it uses.
1479  * The ones <= rtoffset belong to the upper query; the ones > rtoffset do
1480  * not.
1481  */
1482  clause_varnos = pull_varnos(root, whereClause);
1483  upper_varnos = NULL;
1484  varno = -1;
1485  while ((varno = bms_next_member(clause_varnos, varno)) >= 0)
1486  {
1487  if (varno <= rtoffset)
1488  upper_varnos = bms_add_member(upper_varnos, varno);
1489  }
1490  bms_free(clause_varnos);
1491  Assert(!bms_is_empty(upper_varnos));
1492 
1493  /*
1494  * Now that we've got the set of upper-level varnos, we can make the last
1495  * check: only available_rels can be referenced.
1496  */
1497  if (!bms_is_subset(upper_varnos, available_rels))
1498  return NULL;
1499 
1500  /*
1501  * Now we can attach the modified subquery rtable to the parent. This also
1502  * adds subquery's RTEPermissionInfos into the upper query.
1503  */
1504  CombineRangeTables(&parse->rtable, &parse->rteperminfos,
1505  subselect->rtable, subselect->rteperminfos);
1506 
1507  /*
1508  * And finally, build the JoinExpr node.
1509  */
1510  result = makeNode(JoinExpr);
1511  result->jointype = under_not ? JOIN_ANTI : JOIN_SEMI;
1512  result->isNatural = false;
1513  result->larg = NULL; /* caller must fill this in */
1514  /* flatten out the FromExpr node if it's useless */
1515  if (list_length(subselect->jointree->fromlist) == 1)
1516  result->rarg = (Node *) linitial(subselect->jointree->fromlist);
1517  else
1518  result->rarg = (Node *) subselect->jointree;
1519  result->usingClause = NIL;
1520  result->join_using_alias = NULL;
1521  result->quals = whereClause;
1522  result->alias = NULL;
1523  result->rtindex = 0; /* we don't need an RTE for it */
1524 
1525  return result;
1526 }
1527 
1528 /*
1529  * simplify_EXISTS_query: remove any useless stuff in an EXISTS's subquery
1530  *
1531  * The only thing that matters about an EXISTS query is whether it returns
1532  * zero or more than zero rows. Therefore, we can remove certain SQL features
1533  * that won't affect that. The only part that is really likely to matter in
1534  * typical usage is simplifying the targetlist: it's a common habit to write
1535  * "SELECT * FROM" even though there is no need to evaluate any columns.
1536  *
1537  * Note: by suppressing the targetlist we could cause an observable behavioral
1538  * change, namely that any errors that might occur in evaluating the tlist
1539  * won't occur, nor will other side-effects of volatile functions. This seems
1540  * unlikely to bother anyone in practice.
1541  *
1542  * Returns true if was able to discard the targetlist, else false.
1543  */
1544 static bool
1546 {
1547  /*
1548  * We don't try to simplify at all if the query uses set operations,
1549  * aggregates, grouping sets, SRFs, modifying CTEs, HAVING, OFFSET, or FOR
1550  * UPDATE/SHARE; none of these seem likely in normal usage and their
1551  * possible effects are complex. (Note: we could ignore an "OFFSET 0"
1552  * clause, but that traditionally is used as an optimization fence, so we
1553  * don't.)
1554  */
1555  if (query->commandType != CMD_SELECT ||
1556  query->setOperations ||
1557  query->hasAggs ||
1558  query->groupingSets ||
1559  query->hasWindowFuncs ||
1560  query->hasTargetSRFs ||
1561  query->hasModifyingCTE ||
1562  query->havingQual ||
1563  query->limitOffset ||
1564  query->rowMarks)
1565  return false;
1566 
1567  /*
1568  * LIMIT with a constant positive (or NULL) value doesn't affect the
1569  * semantics of EXISTS, so let's ignore such clauses. This is worth doing
1570  * because people accustomed to certain other DBMSes may be in the habit
1571  * of writing EXISTS(SELECT ... LIMIT 1) as an optimization. If there's a
1572  * LIMIT with anything else as argument, though, we can't simplify.
1573  */
1574  if (query->limitCount)
1575  {
1576  /*
1577  * The LIMIT clause has not yet been through eval_const_expressions,
1578  * so we have to apply that here. It might seem like this is a waste
1579  * of cycles, since the only case plausibly worth worrying about is
1580  * "LIMIT 1" ... but what we'll actually see is "LIMIT int8(1::int4)",
1581  * so we have to fold constants or we're not going to recognize it.
1582  */
1583  Node *node = eval_const_expressions(root, query->limitCount);
1584  Const *limit;
1585 
1586  /* Might as well update the query if we simplified the clause. */
1587  query->limitCount = node;
1588 
1589  if (!IsA(node, Const))
1590  return false;
1591 
1592  limit = (Const *) node;
1593  Assert(limit->consttype == INT8OID);
1594  if (!limit->constisnull && DatumGetInt64(limit->constvalue) <= 0)
1595  return false;
1596 
1597  /* Whether or not the targetlist is safe, we can drop the LIMIT. */
1598  query->limitCount = NULL;
1599  }
1600 
1601  /*
1602  * Otherwise, we can throw away the targetlist, as well as any GROUP,
1603  * WINDOW, DISTINCT, and ORDER BY clauses; none of those clauses will
1604  * change a nonzero-rows result to zero rows or vice versa. (Furthermore,
1605  * since our parsetree representation of these clauses depends on the
1606  * targetlist, we'd better throw them away if we drop the targetlist.)
1607  */
1608  query->targetList = NIL;
1609  query->groupClause = NIL;
1610  query->windowClause = NIL;
1611  query->distinctClause = NIL;
1612  query->sortClause = NIL;
1613  query->hasDistinctOn = false;
1614 
1615  return true;
1616 }
1617 
1618 /*
1619  * convert_EXISTS_to_ANY: try to convert EXISTS to a hashable ANY sublink
1620  *
1621  * The subselect is expected to be a fresh copy that we can munge up,
1622  * and to have been successfully passed through simplify_EXISTS_query.
1623  *
1624  * On success, the modified subselect is returned, and we store a suitable
1625  * upper-level test expression at *testexpr, plus a list of the subselect's
1626  * output Params at *paramIds. (The test expression is already Param-ified
1627  * and hence need not go through convert_testexpr, which is why we have to
1628  * deal with the Param IDs specially.)
1629  *
1630  * On failure, returns NULL.
1631  */
1632 static Query *
1634  Node **testexpr, List **paramIds)
1635 {
1636  Node *whereClause;
1637  List *leftargs,
1638  *rightargs,
1639  *opids,
1640  *opcollations,
1641  *newWhere,
1642  *tlist,
1643  *testlist,
1644  *paramids;
1645  ListCell *lc,
1646  *rc,
1647  *oc,
1648  *cc;
1649  AttrNumber resno;
1650 
1651  /*
1652  * Query must not require a targetlist, since we have to insert a new one.
1653  * Caller should have dealt with the case already.
1654  */
1655  Assert(subselect->targetList == NIL);
1656 
1657  /*
1658  * Separate out the WHERE clause. (We could theoretically also remove
1659  * top-level plain JOIN/ON clauses, but it's probably not worth the
1660  * trouble.)
1661  */
1662  whereClause = subselect->jointree->quals;
1663  subselect->jointree->quals = NULL;
1664 
1665  /*
1666  * The rest of the sub-select must not refer to any Vars of the parent
1667  * query. (Vars of higher levels should be okay, though.)
1668  *
1669  * Note: we need not check for Aggrefs separately because we know the
1670  * sub-select is as yet unoptimized; any uplevel Aggref must therefore
1671  * contain an uplevel Var reference. This is not the case below ...
1672  */
1673  if (contain_vars_of_level((Node *) subselect, 1))
1674  return NULL;
1675 
1676  /*
1677  * We don't risk optimizing if the WHERE clause is volatile, either.
1678  */
1679  if (contain_volatile_functions(whereClause))
1680  return NULL;
1681 
1682  /*
1683  * Clean up the WHERE clause by doing const-simplification etc on it.
1684  * Aside from simplifying the processing we're about to do, this is
1685  * important for being able to pull chunks of the WHERE clause up into the
1686  * parent query. Since we are invoked partway through the parent's
1687  * preprocess_expression() work, earlier steps of preprocess_expression()
1688  * wouldn't get applied to the pulled-up stuff unless we do them here. For
1689  * the parts of the WHERE clause that get put back into the child query,
1690  * this work is partially duplicative, but it shouldn't hurt.
1691  *
1692  * Note: we do not run flatten_join_alias_vars. This is OK because any
1693  * parent aliases were flattened already, and we're not going to pull any
1694  * child Vars (of any description) into the parent.
1695  *
1696  * Note: passing the parent's root to eval_const_expressions is
1697  * technically wrong, but we can get away with it since only the
1698  * boundParams (if any) are used, and those would be the same in a
1699  * subroot.
1700  */
1701  whereClause = eval_const_expressions(root, whereClause);
1702  whereClause = (Node *) canonicalize_qual((Expr *) whereClause, false);
1703  whereClause = (Node *) make_ands_implicit((Expr *) whereClause);
1704 
1705  /*
1706  * We now have a flattened implicit-AND list of clauses, which we try to
1707  * break apart into "outervar = innervar" hash clauses. Anything that
1708  * can't be broken apart just goes back into the newWhere list. Note that
1709  * we aren't trying hard yet to ensure that we have only outer or only
1710  * inner on each side; we'll check that if we get to the end.
1711  */
1712  leftargs = rightargs = opids = opcollations = newWhere = NIL;
1713  foreach(lc, (List *) whereClause)
1714  {
1715  OpExpr *expr = (OpExpr *) lfirst(lc);
1716 
1717  if (IsA(expr, OpExpr) &&
1718  hash_ok_operator(expr))
1719  {
1720  Node *leftarg = (Node *) linitial(expr->args);
1721  Node *rightarg = (Node *) lsecond(expr->args);
1722 
1723  if (contain_vars_of_level(leftarg, 1))
1724  {
1725  leftargs = lappend(leftargs, leftarg);
1726  rightargs = lappend(rightargs, rightarg);
1727  opids = lappend_oid(opids, expr->opno);
1728  opcollations = lappend_oid(opcollations, expr->inputcollid);
1729  continue;
1730  }
1731  if (contain_vars_of_level(rightarg, 1))
1732  {
1733  /*
1734  * We must commute the clause to put the outer var on the
1735  * left, because the hashing code in nodeSubplan.c expects
1736  * that. This probably shouldn't ever fail, since hashable
1737  * operators ought to have commutators, but be paranoid.
1738  */
1739  expr->opno = get_commutator(expr->opno);
1740  if (OidIsValid(expr->opno) && hash_ok_operator(expr))
1741  {
1742  leftargs = lappend(leftargs, rightarg);
1743  rightargs = lappend(rightargs, leftarg);
1744  opids = lappend_oid(opids, expr->opno);
1745  opcollations = lappend_oid(opcollations, expr->inputcollid);
1746  continue;
1747  }
1748  /* If no commutator, no chance to optimize the WHERE clause */
1749  return NULL;
1750  }
1751  }
1752  /* Couldn't handle it as a hash clause */
1753  newWhere = lappend(newWhere, expr);
1754  }
1755 
1756  /*
1757  * If we didn't find anything we could convert, fail.
1758  */
1759  if (leftargs == NIL)
1760  return NULL;
1761 
1762  /*
1763  * There mustn't be any parent Vars or Aggs in the stuff that we intend to
1764  * put back into the child query. Note: you might think we don't need to
1765  * check for Aggs separately, because an uplevel Agg must contain an
1766  * uplevel Var in its argument. But it is possible that the uplevel Var
1767  * got optimized away by eval_const_expressions. Consider
1768  *
1769  * SUM(CASE WHEN false THEN uplevelvar ELSE 0 END)
1770  */
1771  if (contain_vars_of_level((Node *) newWhere, 1) ||
1772  contain_vars_of_level((Node *) rightargs, 1))
1773  return NULL;
1774  if (root->parse->hasAggs &&
1775  (contain_aggs_of_level((Node *) newWhere, 1) ||
1776  contain_aggs_of_level((Node *) rightargs, 1)))
1777  return NULL;
1778 
1779  /*
1780  * And there can't be any child Vars in the stuff we intend to pull up.
1781  * (Note: we'd need to check for child Aggs too, except we know the child
1782  * has no aggs at all because of simplify_EXISTS_query's check. The same
1783  * goes for window functions.)
1784  */
1785  if (contain_vars_of_level((Node *) leftargs, 0))
1786  return NULL;
1787 
1788  /*
1789  * Also reject sublinks in the stuff we intend to pull up. (It might be
1790  * possible to support this, but doesn't seem worth the complication.)
1791  */
1792  if (contain_subplans((Node *) leftargs))
1793  return NULL;
1794 
1795  /*
1796  * Okay, adjust the sublevelsup in the stuff we're pulling up.
1797  */
1798  IncrementVarSublevelsUp((Node *) leftargs, -1, 1);
1799 
1800  /*
1801  * Put back any child-level-only WHERE clauses.
1802  */
1803  if (newWhere)
1804  subselect->jointree->quals = (Node *) make_ands_explicit(newWhere);
1805 
1806  /*
1807  * Build a new targetlist for the child that emits the expressions we
1808  * need. Concurrently, build a testexpr for the parent using Params to
1809  * reference the child outputs. (Since we generate Params directly here,
1810  * there will be no need to convert the testexpr in build_subplan.)
1811  */
1812  tlist = testlist = paramids = NIL;
1813  resno = 1;
1814  forfour(lc, leftargs, rc, rightargs, oc, opids, cc, opcollations)
1815  {
1816  Node *leftarg = (Node *) lfirst(lc);
1817  Node *rightarg = (Node *) lfirst(rc);
1818  Oid opid = lfirst_oid(oc);
1819  Oid opcollation = lfirst_oid(cc);
1820  Param *param;
1821 
1822  param = generate_new_exec_param(root,
1823  exprType(rightarg),
1824  exprTypmod(rightarg),
1825  exprCollation(rightarg));
1826  tlist = lappend(tlist,
1827  makeTargetEntry((Expr *) rightarg,
1828  resno++,
1829  NULL,
1830  false));
1831  testlist = lappend(testlist,
1832  make_opclause(opid, BOOLOID, false,
1833  (Expr *) leftarg, (Expr *) param,
1834  InvalidOid, opcollation));
1835  paramids = lappend_int(paramids, param->paramid);
1836  }
1837 
1838  /* Put everything where it should go, and we're done */
1839  subselect->targetList = tlist;
1840  *testexpr = (Node *) make_ands_explicit(testlist);
1841  *paramIds = paramids;
1842 
1843  return subselect;
1844 }
1845 
1846 
1847 /*
1848  * Replace correlation vars (uplevel vars) with Params.
1849  *
1850  * Uplevel PlaceHolderVars and aggregates are replaced, too.
1851  *
1852  * Note: it is critical that this runs immediately after SS_process_sublinks.
1853  * Since we do not recurse into the arguments of uplevel PHVs and aggregates,
1854  * they will get copied to the appropriate subplan args list in the parent
1855  * query with uplevel vars not replaced by Params, but only adjusted in level
1856  * (see replace_outer_placeholdervar and replace_outer_agg). That's exactly
1857  * what we want for the vars of the parent level --- but if a PHV's or
1858  * aggregate's argument contains any further-up variables, they have to be
1859  * replaced with Params in their turn. That will happen when the parent level
1860  * runs SS_replace_correlation_vars. Therefore it must do so after expanding
1861  * its sublinks to subplans. And we don't want any steps in between, else
1862  * those steps would never get applied to the argument expressions, either in
1863  * the parent or the child level.
1864  *
1865  * Another fairly tricky thing going on here is the handling of SubLinks in
1866  * the arguments of uplevel PHVs/aggregates. Those are not touched inside the
1867  * intermediate query level, either. Instead, SS_process_sublinks recurses on
1868  * them after copying the PHV or Aggref expression into the parent plan level
1869  * (this is actually taken care of in build_subplan).
1870  */
1871 Node *
1873 {
1874  /* No setup needed for tree walk, so away we go */
1875  return replace_correlation_vars_mutator(expr, root);
1876 }
1877 
1878 static Node *
1880 {
1881  if (node == NULL)
1882  return NULL;
1883  if (IsA(node, Var))
1884  {
1885  if (((Var *) node)->varlevelsup > 0)
1886  return (Node *) replace_outer_var(root, (Var *) node);
1887  }
1888  if (IsA(node, PlaceHolderVar))
1889  {
1890  if (((PlaceHolderVar *) node)->phlevelsup > 0)
1891  return (Node *) replace_outer_placeholdervar(root,
1892  (PlaceHolderVar *) node);
1893  }
1894  if (IsA(node, Aggref))
1895  {
1896  if (((Aggref *) node)->agglevelsup > 0)
1897  return (Node *) replace_outer_agg(root, (Aggref *) node);
1898  }
1899  if (IsA(node, GroupingFunc))
1900  {
1901  if (((GroupingFunc *) node)->agglevelsup > 0)
1902  return (Node *) replace_outer_grouping(root, (GroupingFunc *) node);
1903  }
1904  return expression_tree_mutator(node,
1906  (void *) root);
1907 }
1908 
1909 /*
1910  * Expand SubLinks to SubPlans in the given expression.
1911  *
1912  * The isQual argument tells whether or not this expression is a WHERE/HAVING
1913  * qualifier expression. If it is, any sublinks appearing at top level need
1914  * not distinguish FALSE from UNKNOWN return values.
1915  */
1916 Node *
1917 SS_process_sublinks(PlannerInfo *root, Node *expr, bool isQual)
1918 {
1919  process_sublinks_context context;
1920 
1921  context.root = root;
1922  context.isTopQual = isQual;
1923  return process_sublinks_mutator(expr, &context);
1924 }
1925 
1926 static Node *
1928 {
1929  process_sublinks_context locContext;
1930 
1931  locContext.root = context->root;
1932 
1933  if (node == NULL)
1934  return NULL;
1935  if (IsA(node, SubLink))
1936  {
1937  SubLink *sublink = (SubLink *) node;
1938  Node *testexpr;
1939 
1940  /*
1941  * First, recursively process the lefthand-side expressions, if any.
1942  * They're not top-level anymore.
1943  */
1944  locContext.isTopQual = false;
1945  testexpr = process_sublinks_mutator(sublink->testexpr, &locContext);
1946 
1947  /*
1948  * Now build the SubPlan node and make the expr to return.
1949  */
1950  return make_subplan(context->root,
1951  (Query *) sublink->subselect,
1952  sublink->subLinkType,
1953  sublink->subLinkId,
1954  testexpr,
1955  context->isTopQual);
1956  }
1957 
1958  /*
1959  * Don't recurse into the arguments of an outer PHV, Aggref or
1960  * GroupingFunc here. Any SubLinks in the arguments have to be dealt with
1961  * at the outer query level; they'll be handled when build_subplan
1962  * collects the PHV, Aggref or GroupingFunc into the arguments to be
1963  * passed down to the current subplan.
1964  */
1965  if (IsA(node, PlaceHolderVar))
1966  {
1967  if (((PlaceHolderVar *) node)->phlevelsup > 0)
1968  return node;
1969  }
1970  else if (IsA(node, Aggref))
1971  {
1972  if (((Aggref *) node)->agglevelsup > 0)
1973  return node;
1974  }
1975  else if (IsA(node, GroupingFunc))
1976  {
1977  if (((GroupingFunc *) node)->agglevelsup > 0)
1978  return node;
1979  }
1980 
1981  /*
1982  * We should never see a SubPlan expression in the input (since this is
1983  * the very routine that creates 'em to begin with). We shouldn't find
1984  * ourselves invoked directly on a Query, either.
1985  */
1986  Assert(!IsA(node, SubPlan));
1987  Assert(!IsA(node, AlternativeSubPlan));
1988  Assert(!IsA(node, Query));
1989 
1990  /*
1991  * Because make_subplan() could return an AND or OR clause, we have to
1992  * take steps to preserve AND/OR flatness of a qual. We assume the input
1993  * has been AND/OR flattened and so we need no recursion here.
1994  *
1995  * (Due to the coding here, we will not get called on the List subnodes of
1996  * an AND; and the input is *not* yet in implicit-AND format. So no check
1997  * is needed for a bare List.)
1998  *
1999  * Anywhere within the top-level AND/OR clause structure, we can tell
2000  * make_subplan() that NULL and FALSE are interchangeable. So isTopQual
2001  * propagates down in both cases. (Note that this is unlike the meaning
2002  * of "top level qual" used in most other places in Postgres.)
2003  */
2004  if (is_andclause(node))
2005  {
2006  List *newargs = NIL;
2007  ListCell *l;
2008 
2009  /* Still at qual top-level */
2010  locContext.isTopQual = context->isTopQual;
2011 
2012  foreach(l, ((BoolExpr *) node)->args)
2013  {
2014  Node *newarg;
2015 
2016  newarg = process_sublinks_mutator(lfirst(l), &locContext);
2017  if (is_andclause(newarg))
2018  newargs = list_concat(newargs, ((BoolExpr *) newarg)->args);
2019  else
2020  newargs = lappend(newargs, newarg);
2021  }
2022  return (Node *) make_andclause(newargs);
2023  }
2024 
2025  if (is_orclause(node))
2026  {
2027  List *newargs = NIL;
2028  ListCell *l;
2029 
2030  /* Still at qual top-level */
2031  locContext.isTopQual = context->isTopQual;
2032 
2033  foreach(l, ((BoolExpr *) node)->args)
2034  {
2035  Node *newarg;
2036 
2037  newarg = process_sublinks_mutator(lfirst(l), &locContext);
2038  if (is_orclause(newarg))
2039  newargs = list_concat(newargs, ((BoolExpr *) newarg)->args);
2040  else
2041  newargs = lappend(newargs, newarg);
2042  }
2043  return (Node *) make_orclause(newargs);
2044  }
2045 
2046  /*
2047  * If we recurse down through anything other than an AND or OR node, we
2048  * are definitely not at top qual level anymore.
2049  */
2050  locContext.isTopQual = false;
2051 
2052  return expression_tree_mutator(node,
2054  (void *) &locContext);
2055 }
2056 
2057 /*
2058  * SS_identify_outer_params - identify the Params available from outer levels
2059  *
2060  * This must be run after SS_replace_correlation_vars and SS_process_sublinks
2061  * processing is complete in a given query level as well as all of its
2062  * descendant levels (which means it's most practical to do it at the end of
2063  * processing the query level). We compute the set of paramIds that outer
2064  * levels will make available to this level+descendants, and record it in
2065  * root->outer_params for use while computing extParam/allParam sets in final
2066  * plan cleanup. (We can't just compute it then, because the upper levels'
2067  * plan_params lists are transient and will be gone by then.)
2068  */
2069 void
2071 {
2072  Bitmapset *outer_params;
2073  PlannerInfo *proot;
2074  ListCell *l;
2075 
2076  /*
2077  * If no parameters have been assigned anywhere in the tree, we certainly
2078  * don't need to do anything here.
2079  */
2080  if (root->glob->paramExecTypes == NIL)
2081  return;
2082 
2083  /*
2084  * Scan all query levels above this one to see which parameters are due to
2085  * be available from them, either because lower query levels have
2086  * requested them (via plan_params) or because they will be available from
2087  * initPlans of those levels.
2088  */
2089  outer_params = NULL;
2090  for (proot = root->parent_root; proot != NULL; proot = proot->parent_root)
2091  {
2092  /* Include ordinary Var/PHV/Aggref/GroupingFunc params */
2093  foreach(l, proot->plan_params)
2094  {
2095  PlannerParamItem *pitem = (PlannerParamItem *) lfirst(l);
2096 
2097  outer_params = bms_add_member(outer_params, pitem->paramId);
2098  }
2099  /* Include any outputs of outer-level initPlans */
2100  foreach(l, proot->init_plans)
2101  {
2102  SubPlan *initsubplan = (SubPlan *) lfirst(l);
2103  ListCell *l2;
2104 
2105  foreach(l2, initsubplan->setParam)
2106  {
2107  outer_params = bms_add_member(outer_params, lfirst_int(l2));
2108  }
2109  }
2110  /* Include worktable ID, if a recursive query is being planned */
2111  if (proot->wt_param_id >= 0)
2112  outer_params = bms_add_member(outer_params, proot->wt_param_id);
2113  }
2114  root->outer_params = outer_params;
2115 }
2116 
2117 /*
2118  * SS_charge_for_initplans - account for initplans in Path costs & parallelism
2119  *
2120  * If any initPlans have been created in the current query level, they will
2121  * get attached to the Plan tree created from whichever Path we select from
2122  * the given rel. Increment all that rel's Paths' costs to account for them,
2123  * and make sure the paths get marked as parallel-unsafe, since we can't
2124  * currently transmit initPlans to parallel workers.
2125  *
2126  * This is separate from SS_attach_initplans because we might conditionally
2127  * create more initPlans during create_plan(), depending on which Path we
2128  * select. However, Paths that would generate such initPlans are expected
2129  * to have included their cost already.
2130  */
2131 void
2133 {
2134  Cost initplan_cost;
2135  ListCell *lc;
2136 
2137  /* Nothing to do if no initPlans */
2138  if (root->init_plans == NIL)
2139  return;
2140 
2141  /*
2142  * Compute the cost increment just once, since it will be the same for all
2143  * Paths. We assume each initPlan gets run once during top plan startup.
2144  * This is a conservative overestimate, since in fact an initPlan might be
2145  * executed later than plan startup, or even not at all.
2146  */
2147  initplan_cost = 0;
2148  foreach(lc, root->init_plans)
2149  {
2150  SubPlan *initsubplan = (SubPlan *) lfirst(lc);
2151 
2152  initplan_cost += initsubplan->startup_cost + initsubplan->per_call_cost;
2153  }
2154 
2155  /*
2156  * Now adjust the costs and parallel_safe flags.
2157  */
2158  foreach(lc, final_rel->pathlist)
2159  {
2160  Path *path = (Path *) lfirst(lc);
2161 
2162  path->startup_cost += initplan_cost;
2163  path->total_cost += initplan_cost;
2164  path->parallel_safe = false;
2165  }
2166 
2167  /*
2168  * Forget about any partial paths and clear consider_parallel, too;
2169  * they're not usable if we attached an initPlan.
2170  */
2171  final_rel->partial_pathlist = NIL;
2172  final_rel->consider_parallel = false;
2173 
2174  /* We needn't do set_cheapest() here, caller will do it */
2175 }
2176 
2177 /*
2178  * SS_attach_initplans - attach initplans to topmost plan node
2179  *
2180  * Attach any initplans created in the current query level to the specified
2181  * plan node, which should normally be the topmost node for the query level.
2182  * (In principle the initPlans could go in any node at or above where they're
2183  * referenced; but there seems no reason to put them any lower than the
2184  * topmost node, so we don't bother to track exactly where they came from.)
2185  * We do not touch the plan node's cost; the initplans should have been
2186  * accounted for in path costing.
2187  */
2188 void
2190 {
2191  plan->initPlan = root->init_plans;
2192 }
2193 
2194 /*
2195  * SS_finalize_plan - do final parameter processing for a completed Plan.
2196  *
2197  * This recursively computes the extParam and allParam sets for every Plan
2198  * node in the given plan tree. (Oh, and RangeTblFunction.funcparams too.)
2199  *
2200  * We assume that SS_finalize_plan has already been run on any initplans or
2201  * subplans the plan tree could reference.
2202  */
2203 void
2205 {
2206  /* No setup needed, just recurse through plan tree. */
2207  (void) finalize_plan(root, plan, -1, root->outer_params, NULL);
2208 }
2209 
2210 /*
2211  * Recursive processing of all nodes in the plan tree
2212  *
2213  * gather_param is the rescan_param of an ancestral Gather/GatherMerge,
2214  * or -1 if there is none.
2215  *
2216  * valid_params is the set of param IDs supplied by outer plan levels
2217  * that are valid to reference in this plan node or its children.
2218  *
2219  * scan_params is a set of param IDs to force scan plan nodes to reference.
2220  * This is for EvalPlanQual support, and is always NULL at the top of the
2221  * recursion.
2222  *
2223  * The return value is the computed allParam set for the given Plan node.
2224  * This is just an internal notational convenience: we can add a child
2225  * plan's allParams to the set of param IDs of interest to this level
2226  * in the same statement that recurses to that child.
2227  *
2228  * Do not scribble on caller's values of valid_params or scan_params!
2229  *
2230  * Note: although we attempt to deal with initPlans anywhere in the tree, the
2231  * logic is not really right. The problem is that a plan node might return an
2232  * output Param of its initPlan as a targetlist item, in which case it's valid
2233  * for the parent plan level to reference that same Param; the parent's usage
2234  * will be converted into a Var referencing the child plan node by setrefs.c.
2235  * But this function would see the parent's reference as out of scope and
2236  * complain about it. For now, this does not matter because the planner only
2237  * attaches initPlans to the topmost plan node in a query level, so the case
2238  * doesn't arise. If we ever merge this processing into setrefs.c, maybe it
2239  * can be handled more cleanly.
2240  */
2241 static Bitmapset *
2243  int gather_param,
2244  Bitmapset *valid_params,
2245  Bitmapset *scan_params)
2246 {
2247  finalize_primnode_context context;
2248  int locally_added_param;
2249  Bitmapset *nestloop_params;
2250  Bitmapset *initExtParam;
2251  Bitmapset *initSetParam;
2252  Bitmapset *child_params;
2253  ListCell *l;
2254 
2255  if (plan == NULL)
2256  return NULL;
2257 
2258  context.root = root;
2259  context.paramids = NULL; /* initialize set to empty */
2260  locally_added_param = -1; /* there isn't one */
2261  nestloop_params = NULL; /* there aren't any */
2262 
2263  /*
2264  * Examine any initPlans to determine the set of external params they
2265  * reference and the set of output params they supply. (We assume
2266  * SS_finalize_plan was run on them already.)
2267  */
2268  initExtParam = initSetParam = NULL;
2269  foreach(l, plan->initPlan)
2270  {
2271  SubPlan *initsubplan = (SubPlan *) lfirst(l);
2272  Plan *initplan = planner_subplan_get_plan(root, initsubplan);
2273  ListCell *l2;
2274 
2275  initExtParam = bms_add_members(initExtParam, initplan->extParam);
2276  foreach(l2, initsubplan->setParam)
2277  {
2278  initSetParam = bms_add_member(initSetParam, lfirst_int(l2));
2279  }
2280  }
2281 
2282  /* Any setParams are validly referenceable in this node and children */
2283  if (initSetParam)
2284  valid_params = bms_union(valid_params, initSetParam);
2285 
2286  /*
2287  * When we call finalize_primnode, context.paramids sets are automatically
2288  * merged together. But when recursing to self, we have to do it the hard
2289  * way. We want the paramids set to include params in subplans as well as
2290  * at this level.
2291  */
2292 
2293  /* Find params in targetlist and qual */
2294  finalize_primnode((Node *) plan->targetlist, &context);
2295  finalize_primnode((Node *) plan->qual, &context);
2296 
2297  /*
2298  * If it's a parallel-aware scan node, mark it as dependent on the parent
2299  * Gather/GatherMerge's rescan Param.
2300  */
2301  if (plan->parallel_aware)
2302  {
2303  if (gather_param < 0)
2304  elog(ERROR, "parallel-aware plan node is not below a Gather");
2305  context.paramids =
2306  bms_add_member(context.paramids, gather_param);
2307  }
2308 
2309  /* Check additional node-type-specific fields */
2310  switch (nodeTag(plan))
2311  {
2312  case T_Result:
2313  finalize_primnode(((Result *) plan)->resconstantqual,
2314  &context);
2315  break;
2316 
2317  case T_SeqScan:
2318  context.paramids = bms_add_members(context.paramids, scan_params);
2319  break;
2320 
2321  case T_SampleScan:
2322  finalize_primnode((Node *) ((SampleScan *) plan)->tablesample,
2323  &context);
2324  context.paramids = bms_add_members(context.paramids, scan_params);
2325  break;
2326 
2327  case T_IndexScan:
2328  finalize_primnode((Node *) ((IndexScan *) plan)->indexqual,
2329  &context);
2330  finalize_primnode((Node *) ((IndexScan *) plan)->indexorderby,
2331  &context);
2332 
2333  /*
2334  * we need not look at indexqualorig, since it will have the same
2335  * param references as indexqual. Likewise, we can ignore
2336  * indexorderbyorig.
2337  */
2338  context.paramids = bms_add_members(context.paramids, scan_params);
2339  break;
2340 
2341  case T_IndexOnlyScan:
2342  finalize_primnode((Node *) ((IndexOnlyScan *) plan)->indexqual,
2343  &context);
2344  finalize_primnode((Node *) ((IndexOnlyScan *) plan)->recheckqual,
2345  &context);
2346  finalize_primnode((Node *) ((IndexOnlyScan *) plan)->indexorderby,
2347  &context);
2348 
2349  /*
2350  * we need not look at indextlist, since it cannot contain Params.
2351  */
2352  context.paramids = bms_add_members(context.paramids, scan_params);
2353  break;
2354 
2355  case T_BitmapIndexScan:
2356  finalize_primnode((Node *) ((BitmapIndexScan *) plan)->indexqual,
2357  &context);
2358 
2359  /*
2360  * we need not look at indexqualorig, since it will have the same
2361  * param references as indexqual.
2362  */
2363  break;
2364 
2365  case T_BitmapHeapScan:
2366  finalize_primnode((Node *) ((BitmapHeapScan *) plan)->bitmapqualorig,
2367  &context);
2368  context.paramids = bms_add_members(context.paramids, scan_params);
2369  break;
2370 
2371  case T_TidScan:
2372  finalize_primnode((Node *) ((TidScan *) plan)->tidquals,
2373  &context);
2374  context.paramids = bms_add_members(context.paramids, scan_params);
2375  break;
2376 
2377  case T_TidRangeScan:
2378  finalize_primnode((Node *) ((TidRangeScan *) plan)->tidrangequals,
2379  &context);
2380  context.paramids = bms_add_members(context.paramids, scan_params);
2381  break;
2382 
2383  case T_SubqueryScan:
2384  {
2385  SubqueryScan *sscan = (SubqueryScan *) plan;
2386  RelOptInfo *rel;
2387  Bitmapset *subquery_params;
2388 
2389  /* We must run finalize_plan on the subquery */
2390  rel = find_base_rel(root, sscan->scan.scanrelid);
2391  subquery_params = rel->subroot->outer_params;
2392  if (gather_param >= 0)
2393  subquery_params = bms_add_member(bms_copy(subquery_params),
2394  gather_param);
2395  finalize_plan(rel->subroot, sscan->subplan, gather_param,
2396  subquery_params, NULL);
2397 
2398  /* Now we can add its extParams to the parent's params */
2399  context.paramids = bms_add_members(context.paramids,
2400  sscan->subplan->extParam);
2401  /* We need scan_params too, though */
2402  context.paramids = bms_add_members(context.paramids,
2403  scan_params);
2404  }
2405  break;
2406 
2407  case T_FunctionScan:
2408  {
2409  FunctionScan *fscan = (FunctionScan *) plan;
2410  ListCell *lc;
2411 
2412  /*
2413  * Call finalize_primnode independently on each function
2414  * expression, so that we can record which params are
2415  * referenced in each, in order to decide which need
2416  * re-evaluating during rescan.
2417  */
2418  foreach(lc, fscan->functions)
2419  {
2420  RangeTblFunction *rtfunc = (RangeTblFunction *) lfirst(lc);
2421  finalize_primnode_context funccontext;
2422 
2423  funccontext = context;
2424  funccontext.paramids = NULL;
2425 
2426  finalize_primnode(rtfunc->funcexpr, &funccontext);
2427 
2428  /* remember results for execution */
2429  rtfunc->funcparams = funccontext.paramids;
2430 
2431  /* add the function's params to the overall set */
2432  context.paramids = bms_add_members(context.paramids,
2433  funccontext.paramids);
2434  }
2435 
2436  context.paramids = bms_add_members(context.paramids,
2437  scan_params);
2438  }
2439  break;
2440 
2441  case T_TableFuncScan:
2442  finalize_primnode((Node *) ((TableFuncScan *) plan)->tablefunc,
2443  &context);
2444  context.paramids = bms_add_members(context.paramids, scan_params);
2445  break;
2446 
2447  case T_ValuesScan:
2448  finalize_primnode((Node *) ((ValuesScan *) plan)->values_lists,
2449  &context);
2450  context.paramids = bms_add_members(context.paramids, scan_params);
2451  break;
2452 
2453  case T_CteScan:
2454  {
2455  /*
2456  * You might think we should add the node's cteParam to
2457  * paramids, but we shouldn't because that param is just a
2458  * linkage mechanism for multiple CteScan nodes for the same
2459  * CTE; it is never used for changed-param signaling. What we
2460  * have to do instead is to find the referenced CTE plan and
2461  * incorporate its external paramids, so that the correct
2462  * things will happen if the CTE references outer-level
2463  * variables. See test cases for bug #4902. (We assume
2464  * SS_finalize_plan was run on the CTE plan already.)
2465  */
2466  int plan_id = ((CteScan *) plan)->ctePlanId;
2467  Plan *cteplan;
2468 
2469  /* so, do this ... */
2470  if (plan_id < 1 || plan_id > list_length(root->glob->subplans))
2471  elog(ERROR, "could not find plan for CteScan referencing plan ID %d",
2472  plan_id);
2473  cteplan = (Plan *) list_nth(root->glob->subplans, plan_id - 1);
2474  context.paramids =
2475  bms_add_members(context.paramids, cteplan->extParam);
2476 
2477 #ifdef NOT_USED
2478  /* ... but not this */
2479  context.paramids =
2480  bms_add_member(context.paramids,
2481  ((CteScan *) plan)->cteParam);
2482 #endif
2483 
2484  context.paramids = bms_add_members(context.paramids,
2485  scan_params);
2486  }
2487  break;
2488 
2489  case T_WorkTableScan:
2490  context.paramids =
2491  bms_add_member(context.paramids,
2492  ((WorkTableScan *) plan)->wtParam);
2493  context.paramids = bms_add_members(context.paramids, scan_params);
2494  break;
2495 
2496  case T_NamedTuplestoreScan:
2497  context.paramids = bms_add_members(context.paramids, scan_params);
2498  break;
2499 
2500  case T_ForeignScan:
2501  {
2502  ForeignScan *fscan = (ForeignScan *) plan;
2503 
2504  finalize_primnode((Node *) fscan->fdw_exprs,
2505  &context);
2507  &context);
2508 
2509  /* We assume fdw_scan_tlist cannot contain Params */
2510  context.paramids = bms_add_members(context.paramids,
2511  scan_params);
2512  }
2513  break;
2514 
2515  case T_CustomScan:
2516  {
2517  CustomScan *cscan = (CustomScan *) plan;
2518  ListCell *lc;
2519 
2520  finalize_primnode((Node *) cscan->custom_exprs,
2521  &context);
2522  /* We assume custom_scan_tlist cannot contain Params */
2523  context.paramids =
2524  bms_add_members(context.paramids, scan_params);
2525 
2526  /* child nodes if any */
2527  foreach(lc, cscan->custom_plans)
2528  {
2529  context.paramids =
2530  bms_add_members(context.paramids,
2531  finalize_plan(root,
2532  (Plan *) lfirst(lc),
2533  gather_param,
2534  valid_params,
2535  scan_params));
2536  }
2537  }
2538  break;
2539 
2540  case T_ModifyTable:
2541  {
2542  ModifyTable *mtplan = (ModifyTable *) plan;
2543 
2544  /* Force descendant scan nodes to reference epqParam */
2545  locally_added_param = mtplan->epqParam;
2546  valid_params = bms_add_member(bms_copy(valid_params),
2547  locally_added_param);
2548  scan_params = bms_add_member(bms_copy(scan_params),
2549  locally_added_param);
2551  &context);
2552  finalize_primnode((Node *) mtplan->onConflictSet,
2553  &context);
2555  &context);
2556  /* exclRelTlist contains only Vars, doesn't need examination */
2557  }
2558  break;
2559 
2560  case T_Append:
2561  {
2562  foreach(l, ((Append *) plan)->appendplans)
2563  {
2564  context.paramids =
2565  bms_add_members(context.paramids,
2566  finalize_plan(root,
2567  (Plan *) lfirst(l),
2568  gather_param,
2569  valid_params,
2570  scan_params));
2571  }
2572  }
2573  break;
2574 
2575  case T_MergeAppend:
2576  {
2577  foreach(l, ((MergeAppend *) plan)->mergeplans)
2578  {
2579  context.paramids =
2580  bms_add_members(context.paramids,
2581  finalize_plan(root,
2582  (Plan *) lfirst(l),
2583  gather_param,
2584  valid_params,
2585  scan_params));
2586  }
2587  }
2588  break;
2589 
2590  case T_BitmapAnd:
2591  {
2592  foreach(l, ((BitmapAnd *) plan)->bitmapplans)
2593  {
2594  context.paramids =
2595  bms_add_members(context.paramids,
2596  finalize_plan(root,
2597  (Plan *) lfirst(l),
2598  gather_param,
2599  valid_params,
2600  scan_params));
2601  }
2602  }
2603  break;
2604 
2605  case T_BitmapOr:
2606  {
2607  foreach(l, ((BitmapOr *) plan)->bitmapplans)
2608  {
2609  context.paramids =
2610  bms_add_members(context.paramids,
2611  finalize_plan(root,
2612  (Plan *) lfirst(l),
2613  gather_param,
2614  valid_params,
2615  scan_params));
2616  }
2617  }
2618  break;
2619 
2620  case T_NestLoop:
2621  {
2622  finalize_primnode((Node *) ((Join *) plan)->joinqual,
2623  &context);
2624  /* collect set of params that will be passed to right child */
2625  foreach(l, ((NestLoop *) plan)->nestParams)
2626  {
2627  NestLoopParam *nlp = (NestLoopParam *) lfirst(l);
2628 
2629  nestloop_params = bms_add_member(nestloop_params,
2630  nlp->paramno);
2631  }
2632  }
2633  break;
2634 
2635  case T_MergeJoin:
2636  finalize_primnode((Node *) ((Join *) plan)->joinqual,
2637  &context);
2638  finalize_primnode((Node *) ((MergeJoin *) plan)->mergeclauses,
2639  &context);
2640  break;
2641 
2642  case T_HashJoin:
2643  finalize_primnode((Node *) ((Join *) plan)->joinqual,
2644  &context);
2645  finalize_primnode((Node *) ((HashJoin *) plan)->hashclauses,
2646  &context);
2647  break;
2648 
2649  case T_Limit:
2650  finalize_primnode(((Limit *) plan)->limitOffset,
2651  &context);
2652  finalize_primnode(((Limit *) plan)->limitCount,
2653  &context);
2654  break;
2655 
2656  case T_RecursiveUnion:
2657  /* child nodes are allowed to reference wtParam */
2658  locally_added_param = ((RecursiveUnion *) plan)->wtParam;
2659  valid_params = bms_add_member(bms_copy(valid_params),
2660  locally_added_param);
2661  /* wtParam does *not* get added to scan_params */
2662  break;
2663 
2664  case T_LockRows:
2665  /* Force descendant scan nodes to reference epqParam */
2666  locally_added_param = ((LockRows *) plan)->epqParam;
2667  valid_params = bms_add_member(bms_copy(valid_params),
2668  locally_added_param);
2669  scan_params = bms_add_member(bms_copy(scan_params),
2670  locally_added_param);
2671  break;
2672 
2673  case T_Agg:
2674  {
2675  Agg *agg = (Agg *) plan;
2676 
2677  /*
2678  * AGG_HASHED plans need to know which Params are referenced
2679  * in aggregate calls. Do a separate scan to identify them.
2680  */
2681  if (agg->aggstrategy == AGG_HASHED)
2682  {
2683  finalize_primnode_context aggcontext;
2684 
2685  aggcontext.root = root;
2686  aggcontext.paramids = NULL;
2688  &aggcontext);
2690  &aggcontext);
2691  agg->aggParams = aggcontext.paramids;
2692  }
2693  }
2694  break;
2695 
2696  case T_WindowAgg:
2697  finalize_primnode(((WindowAgg *) plan)->startOffset,
2698  &context);
2699  finalize_primnode(((WindowAgg *) plan)->endOffset,
2700  &context);
2701  break;
2702 
2703  case T_Gather:
2704  /* child nodes are allowed to reference rescan_param, if any */
2705  locally_added_param = ((Gather *) plan)->rescan_param;
2706  if (locally_added_param >= 0)
2707  {
2708  valid_params = bms_add_member(bms_copy(valid_params),
2709  locally_added_param);
2710 
2711  /*
2712  * We currently don't support nested Gathers. The issue so
2713  * far as this function is concerned would be how to identify
2714  * which child nodes depend on which Gather.
2715  */
2716  Assert(gather_param < 0);
2717  /* Pass down rescan_param to child parallel-aware nodes */
2718  gather_param = locally_added_param;
2719  }
2720  /* rescan_param does *not* get added to scan_params */
2721  break;
2722 
2723  case T_GatherMerge:
2724  /* child nodes are allowed to reference rescan_param, if any */
2725  locally_added_param = ((GatherMerge *) plan)->rescan_param;
2726  if (locally_added_param >= 0)
2727  {
2728  valid_params = bms_add_member(bms_copy(valid_params),
2729  locally_added_param);
2730 
2731  /*
2732  * We currently don't support nested Gathers. The issue so
2733  * far as this function is concerned would be how to identify
2734  * which child nodes depend on which Gather.
2735  */
2736  Assert(gather_param < 0);
2737  /* Pass down rescan_param to child parallel-aware nodes */
2738  gather_param = locally_added_param;
2739  }
2740  /* rescan_param does *not* get added to scan_params */
2741  break;
2742 
2743  case T_Memoize:
2744  finalize_primnode((Node *) ((Memoize *) plan)->param_exprs,
2745  &context);
2746  break;
2747 
2748  case T_ProjectSet:
2749  case T_Hash:
2750  case T_Material:
2751  case T_Sort:
2752  case T_IncrementalSort:
2753  case T_Unique:
2754  case T_SetOp:
2755  case T_Group:
2756  /* no node-type-specific fields need fixing */
2757  break;
2758 
2759  default:
2760  elog(ERROR, "unrecognized node type: %d",
2761  (int) nodeTag(plan));
2762  }
2763 
2764  /* Process left and right child plans, if any */
2765  child_params = finalize_plan(root,
2766  plan->lefttree,
2767  gather_param,
2768  valid_params,
2769  scan_params);
2770  context.paramids = bms_add_members(context.paramids, child_params);
2771 
2772  if (nestloop_params)
2773  {
2774  /* right child can reference nestloop_params as well as valid_params */
2775  child_params = finalize_plan(root,
2776  plan->righttree,
2777  gather_param,
2778  bms_union(nestloop_params, valid_params),
2779  scan_params);
2780  /* ... and they don't count as parameters used at my level */
2781  child_params = bms_difference(child_params, nestloop_params);
2782  bms_free(nestloop_params);
2783  }
2784  else
2785  {
2786  /* easy case */
2787  child_params = finalize_plan(root,
2788  plan->righttree,
2789  gather_param,
2790  valid_params,
2791  scan_params);
2792  }
2793  context.paramids = bms_add_members(context.paramids, child_params);
2794 
2795  /*
2796  * Any locally generated parameter doesn't count towards its generating
2797  * plan node's external dependencies. (Note: if we changed valid_params
2798  * and/or scan_params, we leak those bitmapsets; not worth the notational
2799  * trouble to clean them up.)
2800  */
2801  if (locally_added_param >= 0)
2802  {
2803  context.paramids = bms_del_member(context.paramids,
2804  locally_added_param);
2805  }
2806 
2807  /* Now we have all the paramids referenced in this node and children */
2808 
2809  if (!bms_is_subset(context.paramids, valid_params))
2810  elog(ERROR, "plan should not reference subplan's variable");
2811 
2812  /*
2813  * The plan node's allParam and extParam fields should include all its
2814  * referenced paramids, plus contributions from any child initPlans.
2815  * However, any setParams of the initPlans should not be present in the
2816  * parent node's extParams, only in its allParams. (It's possible that
2817  * some initPlans have extParams that are setParams of other initPlans.)
2818  */
2819 
2820  /* allParam must include initplans' extParams and setParams */
2821  plan->allParam = bms_union(context.paramids, initExtParam);
2822  plan->allParam = bms_add_members(plan->allParam, initSetParam);
2823  /* extParam must include any initplan extParams */
2824  plan->extParam = bms_union(context.paramids, initExtParam);
2825  /* but not any initplan setParams */
2826  plan->extParam = bms_del_members(plan->extParam, initSetParam);
2827 
2828  return plan->allParam;
2829 }
2830 
2831 /*
2832  * finalize_primnode: add IDs of all PARAM_EXEC params appearing in the given
2833  * expression tree to the result set.
2834  */
2835 static bool
2837 {
2838  if (node == NULL)
2839  return false;
2840  if (IsA(node, Param))
2841  {
2842  if (((Param *) node)->paramkind == PARAM_EXEC)
2843  {
2844  int paramid = ((Param *) node)->paramid;
2845 
2846  context->paramids = bms_add_member(context->paramids, paramid);
2847  }
2848  return false; /* no more to do here */
2849  }
2850  if (IsA(node, SubPlan))
2851  {
2852  SubPlan *subplan = (SubPlan *) node;
2853  Plan *plan = planner_subplan_get_plan(context->root, subplan);
2854  ListCell *lc;
2855  Bitmapset *subparamids;
2856 
2857  /* Recurse into the testexpr, but not into the Plan */
2858  finalize_primnode(subplan->testexpr, context);
2859 
2860  /*
2861  * Remove any param IDs of output parameters of the subplan that were
2862  * referenced in the testexpr. These are not interesting for
2863  * parameter change signaling since we always re-evaluate the subplan.
2864  * Note that this wouldn't work too well if there might be uses of the
2865  * same param IDs elsewhere in the plan, but that can't happen because
2866  * generate_new_exec_param never tries to merge params.
2867  */
2868  foreach(lc, subplan->paramIds)
2869  {
2870  context->paramids = bms_del_member(context->paramids,
2871  lfirst_int(lc));
2872  }
2873 
2874  /* Also examine args list */
2875  finalize_primnode((Node *) subplan->args, context);
2876 
2877  /*
2878  * Add params needed by the subplan to paramids, but excluding those
2879  * we will pass down to it. (We assume SS_finalize_plan was run on
2880  * the subplan already.)
2881  */
2882  subparamids = bms_copy(plan->extParam);
2883  foreach(lc, subplan->parParam)
2884  {
2885  subparamids = bms_del_member(subparamids, lfirst_int(lc));
2886  }
2887  context->paramids = bms_join(context->paramids, subparamids);
2888 
2889  return false; /* no more to do here */
2890  }
2892  (void *) context);
2893 }
2894 
2895 /*
2896  * finalize_agg_primnode: find all Aggref nodes in the given expression tree,
2897  * and add IDs of all PARAM_EXEC params appearing within their aggregated
2898  * arguments to the result set.
2899  */
2900 static bool
2902 {
2903  if (node == NULL)
2904  return false;
2905  if (IsA(node, Aggref))
2906  {
2907  Aggref *agg = (Aggref *) node;
2908 
2909  /* we should not consider the direct arguments, if any */
2910  finalize_primnode((Node *) agg->args, context);
2911  finalize_primnode((Node *) agg->aggfilter, context);
2912  return false; /* there can't be any Aggrefs below here */
2913  }
2915  (void *) context);
2916 }
2917 
2918 /*
2919  * SS_make_initplan_output_param - make a Param for an initPlan's output
2920  *
2921  * The plan is expected to return a scalar value of the given type/collation.
2922  *
2923  * Note that in some cases the initplan may not ever appear in the finished
2924  * plan tree. If that happens, we'll have wasted a PARAM_EXEC slot, which
2925  * is no big deal.
2926  */
2927 Param *
2929  Oid resulttype, int32 resulttypmod,
2930  Oid resultcollation)
2931 {
2932  return generate_new_exec_param(root, resulttype,
2933  resulttypmod, resultcollation);
2934 }
2935 
2936 /*
2937  * SS_make_initplan_from_plan - given a plan tree, make it an InitPlan
2938  *
2939  * We build an EXPR_SUBLINK SubPlan node and put it into the initplan
2940  * list for the outer query level. A Param that represents the initplan's
2941  * output has already been assigned using SS_make_initplan_output_param.
2942  */
2943 void
2945  PlannerInfo *subroot, Plan *plan,
2946  Param *prm)
2947 {
2948  SubPlan *node;
2949 
2950  /*
2951  * Add the subplan and its PlannerInfo to the global lists.
2952  */
2953  root->glob->subplans = lappend(root->glob->subplans, plan);
2954  root->glob->subroots = lappend(root->glob->subroots, subroot);
2955 
2956  /*
2957  * Create a SubPlan node and add it to the outer list of InitPlans. Note
2958  * it has to appear after any other InitPlans it might depend on (see
2959  * comments in ExecReScan).
2960  */
2961  node = makeNode(SubPlan);
2962  node->subLinkType = EXPR_SUBLINK;
2963  node->plan_id = list_length(root->glob->subplans);
2964  node->plan_name = psprintf("InitPlan %d (returns $%d)",
2965  node->plan_id, prm->paramid);
2967  &node->firstColCollation);
2968  node->setParam = list_make1_int(prm->paramid);
2969 
2970  root->init_plans = lappend(root->init_plans, node);
2971 
2972  /*
2973  * The node can't have any inputs (since it's an initplan), so the
2974  * parParam and args lists remain empty.
2975  */
2976 
2977  /* Set costs of SubPlan using info from the plan tree */
2978  cost_subplan(subroot, node, plan);
2979 }
int16 AttrNumber
Definition: attnum.h:21
Bitmapset * bms_join(Bitmapset *a, Bitmapset *b)
Definition: bitmapset.c:987
int bms_next_member(const Bitmapset *a, int prevbit)
Definition: bitmapset.c:1039
bool bms_is_subset(const Bitmapset *a, const Bitmapset *b)
Definition: bitmapset.c:332
void bms_free(Bitmapset *a)
Definition: bitmapset.c:209
Bitmapset * bms_add_member(Bitmapset *a, int x)
Definition: bitmapset.c:755
Bitmapset * bms_union(const Bitmapset *a, const Bitmapset *b)
Definition: bitmapset.c:226
Bitmapset * bms_difference(const Bitmapset *a, const Bitmapset *b)
Definition: bitmapset.c:298
Bitmapset * bms_add_members(Bitmapset *a, const Bitmapset *b)
Definition: bitmapset.c:818
Bitmapset * bms_del_members(Bitmapset *a, const Bitmapset *b)
Definition: bitmapset.c:960
Bitmapset * bms_del_member(Bitmapset *a, int x)
Definition: bitmapset.c:792
Bitmapset * bms_copy(const Bitmapset *a)
Definition: bitmapset.c:74
#define bms_is_empty(a)
Definition: bitmapset.h:105
#define MAXALIGN(LEN)
Definition: c.h:795
signed int int32
Definition: c.h:478
unsigned int Index
Definition: c.h:598
#define OidIsValid(objectId)
Definition: c.h:759
Node * eval_const_expressions(PlannerInfo *root, Node *node)
Definition: clauses.c:2163
bool contain_subplans(Node *clause)
Definition: clauses.c:332
bool contain_volatile_functions(Node *clause)
Definition: clauses.c:477
bool contain_exec_param(Node *clause, List *param_ids)
Definition: clauses.c:1047
bool enable_material
Definition: costsize.c:144
void cost_subplan(PlannerInfo *root, SubPlan *subplan, Plan *plan)
Definition: costsize.c:4165
Plan * create_plan(PlannerInfo *root, Path *best_path)
Definition: createplan.c:335
Plan * materialize_finished_plan(Plan *subplan)
Definition: createplan.c:6487
#define ERROR
Definition: elog.h:39
bool ExecMaterializesOutput(NodeTag plantype)
Definition: execAmi.c:637
char * format_type_be(Oid type_oid)
Definition: format_type.c:339
#define HeapTupleIsValid(tuple)
Definition: htup.h:78
#define SizeofHeapTupleHeader
Definition: htup_details.h:185
#define GETSTRUCT(TUP)
Definition: htup_details.h:653
Assert(fmt[strlen(fmt) - 1] !='\n')
List * lappend(List *list, void *datum)
Definition: list.c:338
List * lappend_int(List *list, int datum)
Definition: list.c:356
List * lappend_oid(List *list, Oid datum)
Definition: list.c:374
List * list_copy(const List *oldlist)
Definition: list.c:1572
List * list_concat(List *list1, const List *list2)
Definition: list.c:560
bool op_hashjoinable(Oid opno, Oid inputtype)
Definition: lsyscache.c:1419
bool func_strict(Oid funcid)
Definition: lsyscache.c:1743
Oid get_promoted_array_type(Oid typid)
Definition: lsyscache.c:2769
Oid get_commutator(Oid opno)
Definition: lsyscache.c:1491
Expr * make_opclause(Oid opno, Oid opresulttype, bool opretset, Expr *leftop, Expr *rightop, Oid opcollid, Oid inputcollid)
Definition: makefuncs.c:613
Alias * makeAlias(const char *aliasname, List *colnames)
Definition: makefuncs.c:390
Var * makeVarFromTargetEntry(int varno, TargetEntry *tle)
Definition: makefuncs.c:106
List * make_ands_implicit(Expr *clause)
Definition: makefuncs.c:722
TargetEntry * makeTargetEntry(Expr *expr, AttrNumber resno, char *resname, bool resjunk)
Definition: makefuncs.c:241
Const * makeNullConst(Oid consttype, int32 consttypmod, Oid constcollid)
Definition: makefuncs.c:340
Expr * make_andclause(List *andclauses)
Definition: makefuncs.c:639
Expr * make_ands_explicit(List *andclauses)
Definition: makefuncs.c:711
Expr * make_orclause(List *orclauses)
Definition: makefuncs.c:655
void * palloc(Size size)
Definition: mcxt.c:1210
Oid exprType(const Node *expr)
Definition: nodeFuncs.c:43
int32 exprTypmod(const Node *expr)
Definition: nodeFuncs.c:278
Oid exprCollation(const Node *expr)
Definition: nodeFuncs.c:780
#define expression_tree_mutator(n, m, c)
Definition: nodeFuncs.h:153
static bool is_andclause(const void *clause)
Definition: nodeFuncs.h:105
static bool is_orclause(const void *clause)
Definition: nodeFuncs.h:114
#define query_tree_walker(q, w, c, f)
Definition: nodeFuncs.h:156
#define QTW_EXAMINE_RTES_AFTER
Definition: nodeFuncs.h:28
#define expression_tree_walker(n, w, c)
Definition: nodeFuncs.h:151
#define QTW_EXAMINE_RTES_BEFORE
Definition: nodeFuncs.h:27
size_t get_hash_memory_limit(void)
Definition: nodeHash.c:3572
#define IsA(nodeptr, _type_)
Definition: nodes.h:179
#define copyObject(obj)
Definition: nodes.h:244
double Cost
Definition: nodes.h:262
#define nodeTag(nodeptr)
Definition: nodes.h:133
CmdType
Definition: nodes.h:274
@ CMD_SELECT
Definition: nodes.h:276
@ AGG_HASHED
Definition: nodes.h:364
#define makeNode(_type_)
Definition: nodes.h:176
#define castNode(_type_, nodeptr)
Definition: nodes.h:197
@ JOIN_SEMI
Definition: nodes.h:318
@ JOIN_ANTI
Definition: nodes.h:319
Param * generate_new_exec_param(PlannerInfo *root, Oid paramtype, int32 paramtypmod, Oid paramcollation)
Definition: paramassign.c:553
Param * replace_outer_var(PlannerInfo *root, Var *var)
Definition: paramassign.c:119
Param * replace_outer_grouping(PlannerInfo *root, GroupingFunc *grp)
Definition: paramassign.c:269
Param * replace_outer_placeholdervar(PlannerInfo *root, PlaceHolderVar *phv)
Definition: paramassign.c:196
Param * replace_outer_agg(PlannerInfo *root, Aggref *agg)
Definition: paramassign.c:223
int assign_special_exec_param(PlannerInfo *root)
Definition: paramassign.c:580
ParseState * make_parsestate(ParseState *parentParseState)
Definition: parse_node.c:44
ParseNamespaceItem * addRangeTableEntryForSubquery(ParseState *pstate, Query *subquery, Alias *alias, bool lateral, bool inFromCl)
@ RTE_CTE
Definition: parsenodes.h:1020
@ RTE_SUBQUERY
Definition: parsenodes.h:1015
@ CTEMaterializeNever
Definition: parsenodes.h:1594
@ CTEMaterializeDefault
Definition: parsenodes.h:1592
#define planner_subplan_get_plan(root, subplan)
Definition: pathnodes.h:169
@ UPPERREL_FINAL
Definition: pathnodes.h:79
void * arg
#define lfirst(lc)
Definition: pg_list.h:172
static int list_length(const List *l)
Definition: pg_list.h:152
#define linitial_node(type, l)
Definition: pg_list.h:181
#define NIL
Definition: pg_list.h:68
#define lfirst_int(lc)
Definition: pg_list.h:173
static ListCell * list_nth_cell(const List *list, int n)
Definition: pg_list.h:277
#define linitial(l)
Definition: pg_list.h:178
#define lsecond(l)
Definition: pg_list.h:183
#define forfour(cell1, list1, cell2, list2, cell3, list3, cell4, list4)
Definition: pg_list.h:524
static void * list_nth(const List *list, int n)
Definition: pg_list.h:299
static ListCell * lnext(const List *l, const ListCell *c)
Definition: pg_list.h:343
#define list_make1_int(x1)
Definition: pg_list.h:227
#define lfirst_oid(lc)
Definition: pg_list.h:174
#define list_make2(x1, x2)
Definition: pg_list.h:214
FormData_pg_operator * Form_pg_operator
Definition: pg_operator.h:83
#define plan(x)
Definition: pg_regress.c:154
PlannerInfo * subquery_planner(PlannerGlobal *glob, Query *parse, PlannerInfo *parent_root, bool hasRecursion, double tuple_fraction)
Definition: planner.c:604
Path * get_cheapest_fractional_path(RelOptInfo *rel, double tuple_fraction)
Definition: planner.c:6275
#define sprintf
Definition: port.h:240
static int64 DatumGetInt64(Datum X)
Definition: postgres.h:385
static Datum ObjectIdGetDatum(Oid X)
Definition: postgres.h:252
#define InvalidOid
Definition: postgres_ext.h:36
unsigned int Oid
Definition: postgres_ext.h:31
void replace_empty_jointree(Query *parse)
Definition: prepjointree.c:235
Expr * canonicalize_qual(Expr *qual, bool is_check)
Definition: prepqual.c:294
SubLinkType
Definition: primnodes.h:923
@ ARRAY_SUBLINK
Definition: primnodes.h:930
@ ANY_SUBLINK
Definition: primnodes.h:926
@ MULTIEXPR_SUBLINK
Definition: primnodes.h:929
@ CTE_SUBLINK
Definition: primnodes.h:931
@ EXPR_SUBLINK
Definition: primnodes.h:928
@ ROWCOMPARE_SUBLINK
Definition: primnodes.h:927
@ ALL_SUBLINK
Definition: primnodes.h:925
@ EXISTS_SUBLINK
Definition: primnodes.h:924
@ PARAM_SUBLINK
Definition: primnodes.h:347
@ PARAM_EXEC
Definition: primnodes.h:346
char * psprintf(const char *fmt,...)
Definition: psprintf.c:46
static struct subre * parse(struct vars *v, int stopper, int type, struct state *init, struct state *final)
Definition: regcomp.c:717
static SPIPlanPtr splan
Definition: regress.c:270
RelOptInfo * find_base_rel(PlannerInfo *root, int relid)
Definition: relnode.c:404
RelOptInfo * fetch_upper_rel(PlannerInfo *root, UpperRelationKind kind, Relids relids)
Definition: relnode.c:1411
void OffsetVarNodes(Node *node, int offset, int sublevels_up)
Definition: rewriteManip.c:480
void CombineRangeTables(List **dst_rtable, List **dst_perminfos, List *src_rtable, List *src_perminfos)
Definition: rewriteManip.c:350
bool contain_aggs_of_level(Node *node, int levelsup)
Definition: rewriteManip.c:85
void IncrementVarSublevelsUp(Node *node, int delta_sublevels_up, int min_sublevels_up)
Definition: rewriteManip.c:836
Definition: plannodes.h:998
Bitmapset * aggParams
Definition: plannodes.h:1024
Plan plan
Definition: plannodes.h:999
AggStrategy aggstrategy
Definition: plannodes.h:1002
List * args
Definition: primnodes.h:446
Expr * aggfilter
Definition: primnodes.h:455
CTEMaterialize ctematerialized
Definition: parsenodes.h:1633
Oid consttype
Definition: primnodes.h:290
List * custom_exprs
Definition: plannodes.h:746
List * custom_plans
Definition: plannodes.h:745
List * fdw_exprs
Definition: plannodes.h:716
List * fdw_recheck_quals
Definition: plannodes.h:719
Node * quals
Definition: primnodes.h:1935
List * fromlist
Definition: primnodes.h:1934
List * functions
Definition: plannodes.h:613
Node * quals
Definition: primnodes.h:1915
JoinType jointype
Definition: primnodes.h:1906
int rtindex
Definition: primnodes.h:1919
Node * larg
Definition: primnodes.h:1908
bool isNatural
Definition: primnodes.h:1907
Node * rarg
Definition: primnodes.h:1909
Definition: pg_list.h:54
int epqParam
Definition: plannodes.h:247
List * onConflictSet
Definition: plannodes.h:250
List * returningLists
Definition: plannodes.h:243
Node * onConflictWhere
Definition: plannodes.h:252
Definition: nodes.h:129
Oid opno
Definition: primnodes.h:745
List * args
Definition: primnodes.h:763
int paramid
Definition: primnodes.h:355
ParamKind paramkind
Definition: primnodes.h:354
Cardinality rows
Definition: pathnodes.h:1634
Cost startup_cost
Definition: pathnodes.h:1635
Cost total_cost
Definition: pathnodes.h:1636
bool parallel_safe
Definition: pathnodes.h:1629
Bitmapset * extParam
Definition: plannodes.h:174
List * qual
Definition: plannodes.h:157
List * targetlist
Definition: plannodes.h:156
List * subplans
Definition: pathnodes.h:105
List * paramExecTypes
Definition: pathnodes.h:138
Bitmapset * rewindPlanIDs
Definition: pathnodes.h:111
List * cte_plan_ids
Definition: pathnodes.h:305
List * init_plans
Definition: pathnodes.h:299
List * multiexpr_params
Definition: pathnodes.h:308
Bitmapset * outer_params
Definition: pathnodes.h:221
PlannerGlobal * glob
Definition: pathnodes.h:205
int wt_param_id
Definition: pathnodes.h:524
List * plan_params
Definition: pathnodes.h:220
bool hasAlternativeSubPlans
Definition: pathnodes.h:500
Query * parse
Definition: pathnodes.h:202
List * rowMarks
Definition: parsenodes.h:215
Node * limitCount
Definition: parsenodes.h:212
FromExpr * jointree
Definition: parsenodes.h:182
Node * setOperations
Definition: parsenodes.h:217
List * cteList
Definition: parsenodes.h:173
List * groupClause
Definition: parsenodes.h:198
Node * havingQual
Definition: parsenodes.h:203
List * rtable
Definition: parsenodes.h:175
Node * limitOffset
Definition: parsenodes.h:211
CmdType commandType
Definition: parsenodes.h:128
List * windowClause
Definition: parsenodes.h:205
List * targetList
Definition: parsenodes.h:189
List * groupingSets
Definition: parsenodes.h:201
List * distinctClause
Definition: parsenodes.h:207
List * sortClause
Definition: parsenodes.h:209
List * colcollations
Definition: parsenodes.h:1188
char * ctename
Definition: parsenodes.h:1164
bool self_reference
Definition: parsenodes.h:1166
bool security_barrier
Definition: parsenodes.h:1082
Index ctelevelsup
Definition: parsenodes.h:1165
Query * subquery
Definition: parsenodes.h:1081
List * coltypes
Definition: parsenodes.h:1186
List * coltypmods
Definition: parsenodes.h:1187
RTEKind rtekind
Definition: parsenodes.h:1033
bool consider_parallel
Definition: pathnodes.h:878
List * pathlist
Definition: pathnodes.h:889
struct Path * cheapest_total_path
Definition: pathnodes.h:893
List * partial_pathlist
Definition: pathnodes.h:891
PlannerInfo * subroot
Definition: pathnodes.h:938
Index scanrelid
Definition: plannodes.h:390
int plan_id
Definition: primnodes.h:997
char * plan_name
Definition: primnodes.h:999
List * args
Definition: primnodes.h:1018
List * paramIds
Definition: primnodes.h:995
bool useHashTable
Definition: primnodes.h:1006
Node * testexpr
Definition: primnodes.h:994
int32 firstColTypmod
Definition: primnodes.h:1002
List * parParam
Definition: primnodes.h:1017
List * setParam
Definition: primnodes.h:1015
Cost startup_cost
Definition: primnodes.h:1020
Oid firstColCollation
Definition: primnodes.h:1003
Cost per_call_cost
Definition: primnodes.h:1021
SubLinkType subLinkType
Definition: primnodes.h:992
Oid firstColType
Definition: primnodes.h:1001
Plan * subplan
Definition: plannodes.h:602
Expr * expr
Definition: primnodes.h:1816
Definition: primnodes.h:226
PlannerInfo * root
Definition: subselect.c:44
PlannerInfo * root
Definition: subselect.c:56
const char * ctename
Definition: subselect.c:62
static bool contain_dml_walker(Node *node, void *context)
Definition: subselect.c:1076
static bool testexpr_is_hashable(Node *testexpr, List *param_ids)
Definition: subselect.c:774
static Node * build_subplan(PlannerInfo *root, Plan *plan, PlannerInfo *subroot, List *plan_params, SubLinkType subLinkType, int subLinkId, Node *testexpr, List *testexpr_paramids, bool unknownEqFalse)
Definition: subselect.c:320
void SS_process_ctes(PlannerInfo *root)
Definition: subselect.c:893
JoinExpr * convert_ANY_sublink_to_join(PlannerInfo *root, SubLink *sublink, Relids available_rels)
Definition: subselect.c:1268
void SS_identify_outer_params(PlannerInfo *root)
Definition: subselect.c:2070
static bool finalize_agg_primnode(Node *node, finalize_primnode_context *context)
Definition: subselect.c:2901
static bool contain_outer_selfref(Node *node)
Definition: subselect.c:1097
static List * generate_subquery_vars(PlannerInfo *root, List *tlist, Index varno)
Definition: subselect.c:626
static bool contain_dml(Node *node)
Definition: subselect.c:1070
void SS_finalize_plan(PlannerInfo *root, Plan *plan)
Definition: subselect.c:2204
static Query * convert_EXISTS_to_ANY(PlannerInfo *root, Query *subselect, Node **testexpr, List **paramIds)
Definition: subselect.c:1633
Node * SS_replace_correlation_vars(PlannerInfo *root, Node *expr)
Definition: subselect.c:1872
static Node * process_sublinks_mutator(Node *node, process_sublinks_context *context)
Definition: subselect.c:1927
Param * SS_make_initplan_output_param(PlannerInfo *root, Oid resulttype, int32 resulttypmod, Oid resultcollation)
Definition: subselect.c:2928
struct process_sublinks_context process_sublinks_context
static Node * replace_correlation_vars_mutator(Node *node, PlannerInfo *root)
Definition: subselect.c:1879
static bool test_opexpr_is_hashable(OpExpr *testexpr, List *param_ids)
Definition: subselect.c:805
static List * generate_subquery_params(PlannerInfo *root, List *tlist, List **paramIds)
Definition: subselect.c:593
static Node * convert_testexpr(PlannerInfo *root, Node *testexpr, List *subst_nodes)
Definition: subselect.c:655
static bool subpath_is_hashable(Path *path)
Definition: subselect.c:749
static Node * make_subplan(PlannerInfo *root, Query *orig_subquery, SubLinkType subLinkType, int subLinkId, Node *testexpr, bool isTopQual)
Definition: subselect.c:162
static bool contain_outer_selfref_walker(Node *node, Index *depth)
Definition: subselect.c:1111
struct convert_testexpr_context convert_testexpr_context
static bool hash_ok_operator(OpExpr *expr)
Definition: subselect.c:845
static void inline_cte(PlannerInfo *root, CommonTableExpr *cte)
Definition: subselect.c:1152
JoinExpr * convert_EXISTS_sublink_to_join(PlannerInfo *root, SubLink *sublink, bool under_not, Relids available_rels)
Definition: subselect.c:1376
static bool subplan_is_hashable(Plan *plan)
Definition: subselect.c:725
static bool simplify_EXISTS_query(PlannerInfo *root, Query *query)
Definition: subselect.c:1545
struct finalize_primnode_context finalize_primnode_context
static bool finalize_primnode(Node *node, finalize_primnode_context *context)
Definition: subselect.c:2836
static void get_first_col_type(Plan *plan, Oid *coltype, int32 *coltypmod, Oid *colcollation)
Definition: subselect.c:118
static bool inline_cte_walker(Node *node, inline_cte_walker_context *context)
Definition: subselect.c:1165
void SS_attach_initplans(PlannerInfo *root, Plan *plan)
Definition: subselect.c:2189
Node * SS_process_sublinks(PlannerInfo *root, Node *expr, bool isQual)
Definition: subselect.c:1917
void SS_charge_for_initplans(PlannerInfo *root, RelOptInfo *final_rel)
Definition: subselect.c:2132
static Node * convert_testexpr_mutator(Node *node, convert_testexpr_context *context)
Definition: subselect.c:667
struct inline_cte_walker_context inline_cte_walker_context
void SS_make_initplan_from_plan(PlannerInfo *root, PlannerInfo *subroot, Plan *plan, Param *prm)
Definition: subselect.c:2944
static Bitmapset * finalize_plan(PlannerInfo *root, Plan *plan, int gather_param, Bitmapset *valid_params, Bitmapset *scan_params)
Definition: subselect.c:2242
void ReleaseSysCache(HeapTuple tuple)
Definition: syscache.c:866
HeapTuple SearchSysCache1(int cacheId, Datum key1)
Definition: syscache.c:818
@ OPEROID
Definition: syscache.h:72
bool contain_vars_of_level(Node *node, int levelsup)
Definition: var.c:441
bool contain_var_clause(Node *node)
Definition: var.c:403
Relids pull_varnos(PlannerInfo *root, Node *node)
Definition: var.c:108