Skip to content

Commit

Permalink
Spelling fixes
Browse files Browse the repository at this point in the history
  • Loading branch information
gsjaardema committed Sep 21, 2023
1 parent c5ab8be commit ab80234
Show file tree
Hide file tree
Showing 63 changed files with 102 additions and 102 deletions.
4 changes: 2 additions & 2 deletions packages/seacas/applications/algebra/ag_eval.f
Original file line number Diff line number Diff line change
@@ -1,4 +1,4 @@
C Copyright(C) 1999-2020 National Technology & Engineering Solutions
C Copyright(C) 1999-2020, 2023 National Technology & Engineering Solutions
C of Sandia, LLC (NTESS). Under the terms of Contract DE-NA0003525 with
C NTESS, the U.S. Government retains certain rights in this software.
C
Expand All @@ -18,7 +18,7 @@ SUBROUTINE EVAL (STEP1, WSTEP1, MAXNE, MAXSTK,
C --
C --Parameters:
C -- STEP1 - IN - true iff evaluating the first selected time step
C -- WSTEP1 - IN - true iff evalutaing the first selected whole time step
C -- WSTEP1 - IN - true iff evaluating the first selected whole time step
C -- MAXNE - IN - the VARVAL and STACK dimension
C -- MAXSTK - IN - the maximum STACK size
C -- IXNODE - IN - the indices of the zoomed nodes (iff ISZOOM)
Expand Down
4 changes: 2 additions & 2 deletions packages/seacas/applications/algebra/ag_rweval.f
Original file line number Diff line number Diff line change
@@ -1,4 +1,4 @@
C Copyright(C) 1999-2020 National Technology & Engineering Solutions
C Copyright(C) 1999-2020, 2023 National Technology & Engineering Solutions
C of Sandia, LLC (NTESS). Under the terms of Contract DE-NA0003525 with
C NTESS, the U.S. Government retains certain rights in this software.
C
Expand Down Expand Up @@ -228,7 +228,7 @@ SUBROUTINE RWEVAL (NDBIN, NDBOUT, A, ia, C, NPTIMS, NUMSTO,
RETURN
END IF

C delete corrdinate arrays - no longer needed
C delete coordinate arrays - no longer needed
IF (ISZOOM) THEN
CALL MDDEL ('XN')
CALL MDDEL ('YN')
Expand Down
4 changes: 2 additions & 2 deletions packages/seacas/applications/blot/bl_rotate.f
Original file line number Diff line number Diff line change
@@ -1,4 +1,4 @@
C Copyright(C) 1999-2020 National Technology & Engineering Solutions
C Copyright(C) 1999-2020, 2023 National Technology & Engineering Solutions
C of Sandia, LLC (NTESS). Under the terms of Contract DE-NA0003525 with
C NTESS, the U.S. Government retains certain rights in this software.
C
Expand All @@ -13,7 +13,7 @@ SUBROUTINE BL_ROTATE (NUM, NPROT, ROTMAT, ROTCEN,
C -- Written by Amy Gilkey - revised 09/09/87
C --
C --ROTATE rotates the 3D coordinates by subtracting the rotation center
C --and multipling by the rotation matrix.
C --and multiplying by the rotation matrix.
C --
C --Parameters:
C -- NUM - IN - the number of nodes to rotate
Expand Down
4 changes: 2 additions & 2 deletions packages/seacas/applications/grepos/gp_comand.F
Original file line number Diff line number Diff line change
@@ -1,4 +1,4 @@
C Copyright(C) 1999-2022 National Technology & Engineering Solutions
C Copyright(C) 1999-2023 National Technology & Engineering Solutions
C of Sandia, LLC (NTESS). Under the terms of Contract DE-NA0003525 with
C NTESS, the U.S. Government retains certain rights in this software.
C
Expand Down Expand Up @@ -851,7 +851,7 @@ SUBROUTINE COMAND (NDBIN, EXECUT,
GO TO 320
END IF
ELSE
C ... Field is Attribute index -- first of ndim attributes involed in revolve. 1-based
C ... Field is Attribute index -- first of ndim attributes involved in revolve. 1-based
CALL FFINTG (IFLD, INTYP, IFIELD,
$ 'attribute index', 0, ATTIND, *420)
END IF
Expand Down
2 changes: 1 addition & 1 deletion packages/seacas/applications/nem_slice/elb_loadbal.C
Original file line number Diff line number Diff line change
Expand Up @@ -910,7 +910,7 @@ int generate_loadbal(Machine_Description *machine, Problem_Description *problem,
generate_graph(problem, mesh, graph, weight, sphere);

/*
* adjacancy graph sent to identify_mechanisms must be 1 based
* adjacency graph sent to identify_mechanisms must be 1 based
*
*/

Expand Down
4 changes: 2 additions & 2 deletions packages/seacas/applications/nem_slice/elb_util.C
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
/*
* Copyright(C) 1999-2022 National Technology & Engineering Solutions
* Copyright(C) 1999-2023 National Technology & Engineering Solutions
* of Sandia, LLC (NTESS). Under the terms of Contract DE-NA0003525 with
* NTESS, the U.S. Government retains certain rights in this software.
*
Expand Down Expand Up @@ -196,7 +196,7 @@ namespace {
/*
* The following 'qsort' routine is modified from Sedgewicks
* algorithm It selects the pivot based on the median of the left,
* right, and center values to try to avoid degenerate cases ocurring
* right, and center values to try to avoid degenerate cases occurring
* when a single value is chosen. It performs a quicksort on
* intervals down to the GDS_QSORT_CUTOFF size and then performs a final
* insertion sort on the almost sorted final array. Based on data in
Expand Down
2 changes: 1 addition & 1 deletion packages/seacas/applications/nem_spread/globals.h
Original file line number Diff line number Diff line change
Expand Up @@ -33,7 +33,7 @@ template <typename INT> struct NODE_COMM_MAP
};

/*---------------------------------------------------------------------------*/
/* GLOBAL QUANTITITES THAT ARE THE SAME ON ALL PROCESSORS */
/* GLOBAL QUANTITIES THAT ARE THE SAME ON ALL PROCESSORS */
/*---------------------------------------------------------------------------*/
template <typename T, typename INT> class Globals
{
Expand Down
2 changes: 1 addition & 1 deletion packages/seacas/applications/nem_spread/sort_utils.C
Original file line number Diff line number Diff line change
Expand Up @@ -19,7 +19,7 @@
/*
* The following 'indexed qsort' routine is modified from Sedgewicks
* algorithm It selects the pivot based on the median of the left,
* right, and center values to try to avoid degenerate cases ocurring
* right, and center values to try to avoid degenerate cases occurring
* when a single value is chosen. It performs a quicksort on
* intervals down to the GDS_QSORT_CUTOFF size and then performs a final
* insertion sort on the almost sorted final array. Based on data in
Expand Down
2 changes: 1 addition & 1 deletion packages/seacas/applications/slice/SL_SystemInterface.C
Original file line number Diff line number Diff line change
Expand Up @@ -298,7 +298,7 @@ bool SystemInterface::parse_options(int argc, char **argv)
}
else {
fmt::print(stderr,
"\nThe 'file' decompositon method was specified, but no element "
"\nThe 'file' decomposition method was specified, but no element "
"to processor mapping file was specified via the -decomposition_file option\n");
return false;
}
Expand Down
2 changes: 1 addition & 1 deletion packages/seacas/doc-source/aprepro/functions.tex
Original file line number Diff line number Diff line change
Expand Up @@ -70,7 +70,7 @@ \section{Mathematical Functions}
rand\_lognormal(m,s)& Random value with lognormal distribution with mean $m$ and stddev $s$.\\
rand\_normal(m,s) & Random value normally distributed with mean $m$ and stddev $s$.\\
rand\_weibull(a, b) & Random value with weibull distribution with $\alpha=a$ and $\beta=b$. \\
seconds() & Returns the number of seconds since the epoch. The value is usefult as the \var{seed} value in the function \cmd{srand}.\\
seconds() & Returns the number of seconds since the epoch. The value is useful as the \var{seed} value in the function \cmd{srand}.\\
sign(x,y) & $x * \text{sgn}(y)$\\
sin(x) & Sine of $x$, with $x$ in radians. \\
sind(x) & Sine of $x$, with $x$ in degrees. \\
Expand Down
2 changes: 1 addition & 1 deletion packages/seacas/doc-source/exo_utils/epu.tex
Original file line number Diff line number Diff line change
Expand Up @@ -201,7 +201,7 @@ \subsubsection{Additional Options}
\param{-steps <val>} & Specify a subset of timesteps to transfer to output file.\par
Format is begin:end:step. For example, -steps 1:10:2
would result in steps 1,3,5,7,9 being transferred to the output
databaes. Enter LAST to just transfer last step, for example, ``-steps LAST'' \\
database. Enter LAST to just transfer last step, for example, ``-steps LAST'' \\
\param{-Part\_count <val>} & How many pieces (files) of the model
should be joined. This option is typically used with either
the \param{-start\_part} or the \param{-subcycle} options in
Expand Down
2 changes: 1 addition & 1 deletion packages/seacas/libraries/aprepro_lib/apr_aprepro.cc
Original file line number Diff line number Diff line change
Expand Up @@ -418,7 +418,7 @@ namespace SEAMS {
// it returns the same type which means that the "parser_type" is
// the same. If we have a function, see if it has already been
// defined and if so, check that the parser_type matches and then
// retrn that pointer instead of creating a new symrec.
// return that pointer instead of creating a new symrec.

if (is_function) {
symrec *ptr = getsym(sym_name);
Expand Down
2 changes: 1 addition & 1 deletion packages/seacas/libraries/aprepro_lib/aprepro.h
Original file line number Diff line number Diff line change
Expand Up @@ -261,7 +261,7 @@ namespace SEAMS {
// needs to be sent through Aprepro again later.
bool doIncludeSubstitution{true};

// Flag to inidicate whether Aprepro is in the middle of collecting lines for a
// Flag to indicate whether Aprepro is in the middle of collecting lines for a
// loop.
bool isCollectingLoop{false};

Expand Down
2 changes: 1 addition & 1 deletion packages/seacas/libraries/aprepro_lib/aprepro.ll
Original file line number Diff line number Diff line change
Expand Up @@ -217,7 +217,7 @@ integer {D}+({E})?
BEGIN(LOOP);
aprepro.isCollectingLoop = true;
if (aprepro.ap_options.debugging) {
fmt::print(stderr, "DEBUG LOOP: iteration count = {}, loop_index variable = {}, intial value = {}, increment = {}\n",
fmt::print(stderr, "DEBUG LOOP: iteration count = {}, loop_index variable = {}, initial value = {}, increment = {}\n",
loop_iterations, sym_name, init, new_file.loop_increment);
}
}
Expand Down
2 changes: 1 addition & 1 deletion packages/seacas/libraries/chaco/connect/connect_enforce.c
Original file line number Diff line number Diff line change
Expand Up @@ -48,7 +48,7 @@ void connect_enforce(struct vtx_data **graph, /* data structure for graph
int *degree; /* number of neighbors of a vertex */
int *comp_flag; /* component number for each vtx */
double ewgt; /* edge weight */
int nbndy; /* number of sets adjecent to component */
int nbndy; /* number of sets adjacent to component */
int domain; /* which subdomain I'm working on */
int new_domain; /* subdomain to move some vertices to */
double max_bndy; /* max connectivity to other domain */
Expand Down
2 changes: 1 addition & 1 deletion packages/seacas/libraries/chaco/eigen/lanczos_FO.c
Original file line number Diff line number Diff line change
Expand Up @@ -27,7 +27,7 @@
/* Convergence check uses Paige bji estimate over the whole
spectrum of T. This is a lot of work, but we are trying to be
extra safe. Since we are orthogonalizing fully, we assume the
bji esitmates are very good and don't provide a contingency for
bji estimates are very good and don't provide a contingency for
when they don't match the residuals. */
/* A lot of the time in this routine (say half) is spent in ql finding
the evals of T on each iteration. This could be reduced by only using
Expand Down
4 changes: 2 additions & 2 deletions packages/seacas/libraries/chaco/main/chaco.h
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
/*
* Copyright(C) 1999-2020, 2022 National Technology & Engineering Solutions
* Copyright(C) 1999-2020, 2022, 2023 National Technology & Engineering Solutions
* of Sandia, LLC (NTESS). Under the terms of Contract DE-NA0003525 with
* NTESS, the U.S. Government retains certain rights in this software.
*
Expand Down Expand Up @@ -98,7 +98,7 @@
* argument 16 below, is set to 7. A description of what functionality can be used
* with an input assignment can be found in x4.4
* NOTE: This argument was a short in the original implementation and documentation.
* Since this limits the processor decompositon to < 32,768 processors, it needed
* Since this limits the processor decomposition to < 32,768 processors, it needed
* to be changed to an integer as were all other shorts in the library.
*
* D. Description of the target machine.
Expand Down
4 changes: 2 additions & 2 deletions packages/seacas/libraries/chaco/optimize/opt3d.c
Original file line number Diff line number Diff line change
Expand Up @@ -29,8 +29,8 @@ void opt3d(struct vtx_data **graph, /* data structure containing vertex weight
double coeffs[25]; /* various products of yvecs */
double vars[3]; /* angular variables */
double best[3]; /* best minimizer found so far */
double grad[3]; /* gradiant of the function */
double gradc[3]; /* gradiant of the constraint */
double grad[3]; /* gradient of the function */
double gradc[3]; /* gradient of the constraint */
double hess[3][3]; /* hessian of the function */
double hessc[3][3]; /* hessian of the constraint */
double step[3]; /* Newton step in optimization */
Expand Down
2 changes: 1 addition & 1 deletion packages/seacas/libraries/chaco/refine_map/refine_cube.c
Original file line number Diff line number Diff line change
Expand Up @@ -57,7 +57,7 @@ int refine_cube(struct vtx_data **comm_graph, /* graph for communication require

/* This is really just ndims_tot different 1-D problems. */

/* Allocate space for and inititalize the vertex data. */
/* Allocate space for and initialize the vertex data. */
vdata =
(struct refine_vdata *)smalloc_ret((ndims_tot * nsets_tot + 1) * sizeof(struct refine_vdata));
if (vdata == NULL) {
Expand Down
2 changes: 1 addition & 1 deletion packages/seacas/libraries/exodus/src/ex_err.c
Original file line number Diff line number Diff line change
Expand Up @@ -143,7 +143,7 @@ void ex_err(const char *module_name, const char *message, int err_num)
The function ex_err_fn() logs an error to stderr. It is intended
to provide explanatory messages for error codes returned from other
exodus routines. The main difference between ex_err_fn() and ex_err() is
that ex_err_fn() will print the name of the exodus file that the error occured on.
that ex_err_fn() will print the name of the exodus file that the error occurred on.
The passed in error codes and corresponding messages are listed in
\file{exodusII.h}. The programmer may supplement the error message printed
Expand Down
32 changes: 16 additions & 16 deletions packages/seacas/libraries/exodus/src/ex_utils.c
Original file line number Diff line number Diff line change
Expand Up @@ -1099,20 +1099,20 @@ void ex__rm_stat_ptr(int exoid, struct ex__obj_stats **obj_ptr)
struct ex__obj_stats *tmp_ptr = *obj_ptr;
struct ex__obj_stats *last_head_list_ptr = *obj_ptr; /* save last head pointer */

while (tmp_ptr) /* Walk linked list of file ids/vals */
while (tmp_ptr) /* Walk linked list of file ids/vals */
{
if (exoid == tmp_ptr->exoid) /* linear search for exodus file id */
if (exoid == tmp_ptr->exoid) /* linear search for exodus file id */
{
if (tmp_ptr == *obj_ptr) { /* Are we at the head of the list? */
*obj_ptr = (*obj_ptr)->next; /* yes, reset ptr to head of list */
if (tmp_ptr == *obj_ptr) { /* Are we at the head of the list? */
*obj_ptr = (*obj_ptr)->next; /* yes, reset ptr to head of list */
}
else { /* no, remove this record from chain*/
else { /* no, remove this record from chain*/
last_head_list_ptr->next = tmp_ptr->next;
}
free(tmp_ptr->id_vals); /* free up memory */
free(tmp_ptr->stat_vals);
free(tmp_ptr);
break; /* Quit if found */
break; /* Quit if found */
}
last_head_list_ptr = tmp_ptr; /* save last head pointer */
tmp_ptr = tmp_ptr->next; /* Loop back if not */
Expand Down Expand Up @@ -1199,12 +1199,12 @@ struct ex__list_item **ex__get_counter_list(ex_entity_type obj_type)
int ex__inc_file_item(int exoid, /* file id */
struct ex__list_item **list_ptr) /* ptr to ptr to list_item */
{
struct ex__list_item *tlist_ptr = *list_ptr; /* use temp list ptr to walk linked list */
while (tlist_ptr) { /* Walk linked list of file ids/vals */
if (exoid == tlist_ptr->exo_id) { /* linear search for exodus file id */
break; /* Quit if found */
struct ex__list_item *tlist_ptr = *list_ptr; /* use temp list ptr to walk linked list */
while (tlist_ptr) { /* Walk linked list of file ids/vals */
if (exoid == tlist_ptr->exo_id) { /* linear search for exodus file id */
break; /* Quit if found */
}
tlist_ptr = tlist_ptr->next; /* Loop back if not */
tlist_ptr = tlist_ptr->next; /* Loop back if not */
}

if (!tlist_ptr) { /* ptr NULL? */
Expand Down Expand Up @@ -1257,7 +1257,7 @@ int ex__get_file_item(int exoid, /* file id */
if (exoid == tlist_ptr->exo_id) { /* linear search for exodus file id */
break; /* Quit if found */
}
tlist_ptr = tlist_ptr->next; /* Loop back if not */
tlist_ptr = tlist_ptr->next; /* Loop back if not */
}

if (!tlist_ptr) { /* ptr NULL? */
Expand Down Expand Up @@ -1304,11 +1304,11 @@ void ex__rm_file_item(int exoid, /* file id */
if (tlist_ptr == *list_ptr) { /* Are we at the head of the list? */
*list_ptr = (*list_ptr)->next; /* yes, reset ptr to head of list */
}
else { /* no, remove this record from chain*/
else { /* no, remove this record from chain*/
last_head_list_ptr->next = tlist_ptr->next;
}
free(tlist_ptr); /* free up memory */
break; /* Quit if found */
free(tlist_ptr); /* free up memory */
break; /* Quit if found */
}
last_head_list_ptr = tlist_ptr; /* save last head pointer */
tlist_ptr = tlist_ptr->next; /* Loop back if not */
Expand Down Expand Up @@ -1569,7 +1569,7 @@ static void ex_int_iisort64(int64_t v[], int64_t iv[], int64_t N)
* \internal
* The following 'indexed qsort' routine is modified from Sedgewicks
* algorithm It selects the pivot based on the median of the left,
* right, and center values to try to avoid degenerate cases ocurring
* right, and center values to try to avoid degenerate cases occurring
* when a single value is chosen. It performs a quicksort on
* intervals down to the #EX_QSORT_CUTOFF size and then performs a final
* insertion sort on the almost sorted final array. Based on data in
Expand Down
4 changes: 2 additions & 2 deletions packages/seacas/libraries/exodus/test/testwt-results.c
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
/*
* Copyright(C) 1999-2020 National Technology & Engineering Solutions
* Copyright(C) 1999-2020, 2023 National Technology & Engineering Solutions
* of Sandia, LLC (NTESS). Under the terms of Contract DE-NA0003525 with
* NTESS, the U.S. Government retains certain rights in this software.
*
Expand All @@ -16,7 +16,7 @@
One of the ultimate goals is to make per-timestep output of results
data faster since do not need the mesh definition bulk data
(coordinates, connectivty, ...) for each step
(coordinates, connectivity, ...) for each step
EXPERIMENTAL -- DO NOT USE THIS CAPABILITY/CONCEPT FOR PRODUCTION WORK
*****************************************************************************/
Expand Down
2 changes: 1 addition & 1 deletion packages/seacas/libraries/ioss/src/Ioss_Assembly.h
Original file line number Diff line number Diff line change
Expand Up @@ -51,7 +51,7 @@ namespace Ioss {
void remove_members();
size_t member_count() const { return m_members.size(); }

// Handle implicit properties -- These are calcuated from data stored
// Handle implicit properties -- These are calculated from data stored
// in the grouping entity instead of having an explicit value assigned.
// An example would be 'element_block_count' for a region.
Property get_implicit_property(const std::string &my_name) const override;
Expand Down
2 changes: 1 addition & 1 deletion packages/seacas/libraries/ioss/src/Ioss_Blob.h
Original file line number Diff line number Diff line change
Expand Up @@ -39,7 +39,7 @@ namespace Ioss {
std::string contains_string() const override { return "Entries"; }
EntityType type() const override { return BLOB; }

// Handle implicit properties -- These are calcuated from data stored
// Handle implicit properties -- These are calculated from data stored
// in the grouping entity instead of having an explicit value assigned.
// An example would be 'element_block_count' for a region.
Property get_implicit_property(const std::string &my_name) const override;
Expand Down
2 changes: 1 addition & 1 deletion packages/seacas/libraries/ioss/src/Ioss_CommSet.h
Original file line number Diff line number Diff line change
Expand Up @@ -35,7 +35,7 @@ namespace Ioss {
std::string contains_string() const override { return "Entity/Processor pair"; }
EntityType type() const override { return COMMSET; }

// Handle implicit properties -- These are calcuated from data stored
// Handle implicit properties -- These are calculated from data stored
// in the grouping entity instead of having an explicit value assigned.
// An example would be 'element_block_count' for a region.
Property get_implicit_property(const std::string &my_name) const override;
Expand Down
2 changes: 1 addition & 1 deletion packages/seacas/libraries/ioss/src/Ioss_EdgeBlock.h
Original file line number Diff line number Diff line change
Expand Up @@ -39,7 +39,7 @@ namespace Ioss {
std::string contains_string() const override { return "Edge"; }
EntityType type() const override { return EDGEBLOCK; }

// Handle implicit properties -- These are calcuated from data stored
// Handle implicit properties -- These are calculated from data stored
// in the grouping entity instead of having an explicit value assigned.
// An example would be 'edge_block_count' for a region.
Property get_implicit_property(const std::string &my_name) const override;
Expand Down
2 changes: 1 addition & 1 deletion packages/seacas/libraries/ioss/src/Ioss_EdgeSet.h
Original file line number Diff line number Diff line change
Expand Up @@ -38,7 +38,7 @@ namespace Ioss {
std::string contains_string() const override { return "Edge"; }
EntityType type() const override { return EDGESET; }

// Handle implicit properties -- These are calcuated from data stored
// Handle implicit properties -- These are calculated from data stored
// in the grouping entity instead of having an explicit value assigned.
// An example would be 'element_block_count' for a region.
Property get_implicit_property(const std::string &my_name) const override;
Expand Down
2 changes: 1 addition & 1 deletion packages/seacas/libraries/ioss/src/Ioss_ElementBlock.h
Original file line number Diff line number Diff line change
Expand Up @@ -34,7 +34,7 @@ namespace Ioss {
std::string contains_string() const override { return "Element"; }
EntityType type() const override { return ELEMENTBLOCK; }

// Handle implicit properties -- These are calcuated from data stored
// Handle implicit properties -- These are calculated from data stored
// in the grouping entity instead of having an explicit value assigned.
// An example would be 'element_block_count' for a region.
Property get_implicit_property(const std::string &my_name) const override;
Expand Down
Loading

0 comments on commit ab80234

Please sign in to comment.